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:40:46.841] plan(): Setting new future strategy stack: [18:40:46.843] List of future strategies: [18:40:46.843] 1. sequential: [18:40:46.843] - args: function (..., envir = parent.frame(), workers = "") [18:40:46.843] - tweaked: FALSE [18:40:46.843] - call: future::plan("sequential") [18:40:46.855] plan(): nbrOfWorkers() = 1 > > message("*** future_apply() ...") *** future_apply() ... > > z0 <- NULL > > for (strategy in supportedStrategies()) { + message(sprintf("*** strategy = %s ...", sQuote(strategy))) + plan(strategy) + + message("- From example(apply) ...") + X <- matrix(c(1:4, 1, 6:8), nrow = 2L) + + Y0 <- apply(X, MARGIN = 1L, FUN = table) + Y1 <- future_apply(X, MARGIN = 1L, FUN = table) + print(Y1) + stopifnot(all.equal(Y1, Y0, check.attributes = FALSE)) ## FIXME + + Y2 <- future_apply(X, MARGIN = 1L, FUN = "table") + print(Y2) + stopifnot(identical(Y2, Y1)) + + Y0 <- apply(X, MARGIN = 1L, FUN = stats::quantile) + Y1 <- future_apply(X, MARGIN = 1L, FUN = stats::quantile) + print(Y1) + stopifnot(all.equal(Y1, Y0)) + + x <- cbind(x1 = 3, x2 = c(4:1, 2:5)) + names(dimnames(x)) <- c("row", "col") + x3 <- array(x, dim = c(dim(x), 3), + dimnames = c(dimnames(x), list(C = paste0("cop.", 1:3)))) + + y0 <- apply(x, MARGIN = 2L, FUN = identity) + stopifnot(identical(y0, x)) + y1 <- future_apply(x, MARGIN = 2L, FUN = identity) + print(y1) + stopifnot(identical(y1, y0)) + + y0 <- apply(x3, MARGIN = 2:3, FUN = identity) + stopifnot(identical(y0, x3)) + y1 <- future_apply(x3, MARGIN = 2:3, FUN = identity) + print(y1) + stopifnot(identical(y1, y0)) + + z <- array(1:24, dim = 2:4) + y0 <- apply(z, MARGIN = 1:2, FUN = function(x) seq_len(max(x))) + y1 <- future_apply(z, MARGIN = 1:2, FUN = function(x) seq_len(max(x))) + print(y1) + stopifnot(identical(y1, y0)) + + message("- apply(X, MARGIN = , ...) ...") + X <- matrix(1:2, nrow = 2L, ncol = 1L, dimnames = list(rows = c("a", "b"))) + y0 <- apply(X, MARGIN = "rows", FUN = identity) + y1 <- future_apply(X, MARGIN = "rows", FUN = identity) + print(y1) + stopifnot(identical(y1, y0)) + + message("- apply(X, ...) - dim(X) > 2 ...") + X <- array(1:12, dim = c(2, 2, 3)) + y0 <- apply(X, MARGIN = 1L, FUN = identity) + y1 <- future_apply(X, MARGIN = 1L, FUN = identity) + print(y1) + stopifnot(identical(y1, y0)) + + message("- apply(X, ...) - not all same names ...") + FUN <- function(x) { + if (x[1] == 1L) names(x) <- letters[seq_along(x)] + x + } + X <- matrix(1:4, nrow = 2L, ncol = 2L) + y0 <- apply(X, MARGIN = 1L, FUN = FUN) + y1 <- future_apply(X, MARGIN = 1L, FUN = FUN) + print(y1) + stopifnot(identical(y1, y0)) + + message("- example(future_apply) - reproducible RNG ...") + z1 <- future_apply(X, MARGIN = 1L, FUN = sample, + future.seed = 0xBEEF, + ## Test also all other 'future.*' arguments + future.stdout = TRUE, + future.conditions = NULL, + future.globals = TRUE, + future.packages = NULL, + future.scheduling = 1.0, + future.chunk.size = NULL, + future.label = "future_apply-%d" + ) + print(z1) + if (is.null(z0)) { + z0 <- z1 + } else { + stopifnot(identical(z1, z0)) + } + + plan(sequential) + message(sprintf("*** strategy = %s ... done", sQuote(strategy))) + } ## for (strategy in ...) *** strategy = 'sequential' ... [18:40:46.927] plan(): Setting new future strategy stack: [18:40:46.927] List of future strategies: [18:40:46.927] 1. sequential: [18:40:46.927] - args: function (..., envir = parent.frame(), workers = "") [18:40:46.927] - tweaked: FALSE [18:40:46.927] - call: plan(strategy) [18:40:46.940] plan(): nbrOfWorkers() = 1 - From example(apply) ... [18:40:46.941] getGlobalsAndPackagesXApply() ... [18:40:46.941] - future.globals: TRUE [18:40:46.942] getGlobalsAndPackages() ... [18:40:46.942] Searching for globals... [18:40:46.995] - globals found: [59] 'FUN', 'if', '==', 'c', 'list.names', '{', '<-', '[', 'as.list', 'substitute', '-', '&&', 'length', 'is.list', '!', 'is.null', 'names', 'return', 'seq_along', 'vapply', 'switch', '+', 'is.symbol', 'as.character', 'deparse', '[<-', 'missing', 'match', 'match.arg', '!=', 'warning', 'list', '[[', 'paste', 'stop', 'integer', 'for', 'is.factor', 'anyNA', 'options', 'on.exit', 'factor', '(', '||', 'levels', 'as.integer', 'which', 'is.na', 'is.na<-', '>', 'prod', '$', '.Machine', '*', 'names<-', 'array', 'tabulate', 'class', 'class<-' [18:40:46.995] Searching for globals ... DONE [18:40:46.995] Resolving globals: FALSE [18:40:46.999] The total size of the 1 globals is 31.30 KiB (32048 bytes) [18:40:47.000] The total size of the 1 globals exported for future expression ('FUN(X = structure(c(1, 2, 3, 4, 1, 6, 7, 8), dim = c(2L, 4L)))') is 31.30 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (31.30 KiB of class 'function') [18:40:47.000] - globals: [1] 'FUN' [18:40:47.000] [18:40:47.000] getGlobalsAndPackages() ... DONE [18:40:47.001] - globals found/used: [n=1] 'FUN' [18:40:47.001] - needed namespaces: [n=0] [18:40:47.001] Finding globals ... DONE [18:40:47.001] - use_args: TRUE [18:40:47.001] - Getting '...' globals ... [18:40:47.002] resolve() on list ... [18:40:47.002] recursive: 0 [18:40:47.003] length: 1 [18:40:47.003] elements: '...' [18:40:47.003] length: 0 (resolved future 1) [18:40:47.003] resolve() on list ... DONE [18:40:47.003] - '...' content: [n=0] [18:40:47.004] List of 1 [18:40:47.004] $ ...: list() [18:40:47.004] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:47.004] - attr(*, "where")=List of 1 [18:40:47.004] ..$ ...: [18:40:47.004] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:47.004] - attr(*, "resolved")= logi TRUE [18:40:47.004] - attr(*, "total_size")= num NA [18:40:47.009] - Getting '...' globals ... DONE [18:40:47.009] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:40:47.009] List of 2 [18:40:47.009] $ ...future.FUN:function (..., exclude = if (useNA == "no") c(NA, NaN), useNA = c("no", [18:40:47.009] "ifany", "always"), dnn = list.names(...), deparse.level = 1) [18:40:47.009] $ ... : list() [18:40:47.009] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:47.009] - attr(*, "where")=List of 2 [18:40:47.009] ..$ ...future.FUN: [18:40:47.009] ..$ ... : [18:40:47.009] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:47.009] - attr(*, "resolved")= logi FALSE [18:40:47.009] - attr(*, "total_size")= int 65963 [18:40:47.013] Packages to be attached in all futures: [n=0] [18:40:47.013] getGlobalsAndPackagesXApply() ... DONE [18:40:47.013] future_lapply() ... [18:40:47.058] Number of chunks: 1 [18:40:47.058] getGlobalsAndPackagesXApply() ... [18:40:47.058] - future.globals: with names 'list()' [18:40:47.058] - use_args: TRUE [18:40:47.058] Globals to be used in all futures (chunks): [n=2] '...', '...future.FUN' [18:40:47.059] List of 2 [18:40:47.059] $ ... : list() [18:40:47.059] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:47.059] $ ...future.FUN:function (..., exclude = if (useNA == "no") c(NA, NaN), useNA = c("no", [18:40:47.059] "ifany", "always"), dnn = list.names(...), deparse.level = 1) [18:40:47.059] - attr(*, "where")=List of 2 [18:40:47.059] ..$ ... : [18:40:47.059] ..$ ...future.FUN: [18:40:47.059] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:47.059] - attr(*, "resolved")= logi FALSE [18:40:47.059] - attr(*, "total_size")= num NA [18:40:47.063] Packages to be attached in all futures: [n=0] [18:40:47.063] getGlobalsAndPackagesXApply() ... DONE [18:40:47.063] Number of futures (= number of chunks): 1 [18:40:47.063] Launching 1 futures (chunks) ... [18:40:47.064] Chunk #1 of 1 ... [18:40:47.064] - seeds: [18:40:47.064] - All globals exported: [n=5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:47.064] getGlobalsAndPackages() ... [18:40:47.065] - globals passed as-is: [5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:47.065] Resolving globals: FALSE [18:40:47.065] Tweak future expression to call with '...' arguments ... [18:40:47.065] { [18:40:47.065] do.call(function(...) { [18:40:47.065] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:47.065] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:47.065] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:47.065] on.exit(options(oopts), add = TRUE) [18:40:47.065] } [18:40:47.065] { [18:40:47.065] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:47.065] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:47.065] ...future.FUN(...future.X_jj, ...) [18:40:47.065] }) [18:40:47.065] } [18:40:47.065] }, args = future.call.arguments) [18:40:47.065] } [18:40:47.066] Tweak future expression to call with '...' arguments ... DONE [18:40:47.066] - globals: [5] 'future.call.arguments', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:47.066] [18:40:47.066] getGlobalsAndPackages() ... DONE [18:40:47.068] run() for 'Future' ... [18:40:47.068] - state: 'created' [18:40:47.069] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:40:47.069] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:40:47.069] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:40:47.069] - Field: 'label' [18:40:47.070] - Field: 'local' [18:40:47.070] - Field: 'owner' [18:40:47.070] - Field: 'envir' [18:40:47.070] - Field: 'packages' [18:40:47.070] - Field: 'gc' [18:40:47.070] - Field: 'conditions' [18:40:47.071] - Field: 'expr' [18:40:47.071] - Field: 'uuid' [18:40:47.071] - Field: 'seed' [18:40:47.071] - Field: 'version' [18:40:47.071] - Field: 'result' [18:40:47.072] - Field: 'asynchronous' [18:40:47.072] - Field: 'calls' [18:40:47.072] - Field: 'globals' [18:40:47.072] - Field: 'stdout' [18:40:47.072] - Field: 'earlySignal' [18:40:47.072] - Field: 'lazy' [18:40:47.073] - Field: 'state' [18:40:47.073] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:40:47.073] - Launch lazy future ... [18:40:47.074] Packages needed by the future expression (n = 0): [18:40:47.074] Packages needed by future strategies (n = 0): [18:40:47.075] { [18:40:47.075] { [18:40:47.075] { [18:40:47.075] ...future.startTime <- base::Sys.time() [18:40:47.075] { [18:40:47.075] { [18:40:47.075] { [18:40:47.075] base::local({ [18:40:47.075] has_future <- base::requireNamespace("future", [18:40:47.075] quietly = TRUE) [18:40:47.075] if (has_future) { [18:40:47.075] ns <- base::getNamespace("future") [18:40:47.075] version <- ns[[".package"]][["version"]] [18:40:47.075] if (is.null(version)) [18:40:47.075] version <- utils::packageVersion("future") [18:40:47.075] } [18:40:47.075] else { [18:40:47.075] version <- NULL [18:40:47.075] } [18:40:47.075] if (!has_future || version < "1.8.0") { [18:40:47.075] info <- base::c(r_version = base::gsub("R version ", [18:40:47.075] "", base::R.version$version.string), [18:40:47.075] platform = base::sprintf("%s (%s-bit)", [18:40:47.075] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:40:47.075] os = base::paste(base::Sys.info()[base::c("sysname", [18:40:47.075] "release", "version")], collapse = " "), [18:40:47.075] hostname = base::Sys.info()[["nodename"]]) [18:40:47.075] info <- base::sprintf("%s: %s", base::names(info), [18:40:47.075] info) [18:40:47.075] info <- base::paste(info, collapse = "; ") [18:40:47.075] if (!has_future) { [18:40:47.075] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:40:47.075] info) [18:40:47.075] } [18:40:47.075] else { [18:40:47.075] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:40:47.075] info, version) [18:40:47.075] } [18:40:47.075] base::stop(msg) [18:40:47.075] } [18:40:47.075] }) [18:40:47.075] } [18:40:47.075] ...future.strategy.old <- future::plan("list") [18:40:47.075] options(future.plan = NULL) [18:40:47.075] Sys.unsetenv("R_FUTURE_PLAN") [18:40:47.075] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:40:47.075] } [18:40:47.075] ...future.workdir <- getwd() [18:40:47.075] } [18:40:47.075] ...future.oldOptions <- base::as.list(base::.Options) [18:40:47.075] ...future.oldEnvVars <- base::Sys.getenv() [18:40:47.075] } [18:40:47.075] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:40:47.075] future.globals.maxSize = Inf, future.globals.method = NULL, [18:40:47.075] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:40:47.075] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:40:47.075] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:40:47.075] future.stdout.windows.reencode = NULL, width = 80L) [18:40:47.075] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:40:47.075] base::names(...future.oldOptions)) [18:40:47.075] } [18:40:47.075] if (FALSE) { [18:40:47.075] } [18:40:47.075] else { [18:40:47.075] if (TRUE) { [18:40:47.075] ...future.stdout <- base::rawConnection(base::raw(0L), [18:40:47.075] open = "w") [18:40:47.075] } [18:40:47.075] else { [18:40:47.075] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:40:47.075] windows = "NUL", "/dev/null"), open = "w") [18:40:47.075] } [18:40:47.075] base::sink(...future.stdout, type = "output", split = FALSE) [18:40:47.075] base::on.exit(if (!base::is.null(...future.stdout)) { [18:40:47.075] base::sink(type = "output", split = FALSE) [18:40:47.075] base::close(...future.stdout) [18:40:47.075] }, add = TRUE) [18:40:47.075] } [18:40:47.075] ...future.frame <- base::sys.nframe() [18:40:47.075] ...future.conditions <- base::list() [18:40:47.075] ...future.rng <- base::globalenv()$.Random.seed [18:40:47.075] if (FALSE) { [18:40:47.075] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:40:47.075] "...future.value", "...future.globalenv.names", ".Random.seed") [18:40:47.075] } [18:40:47.075] ...future.result <- base::tryCatch({ [18:40:47.075] base::withCallingHandlers({ [18:40:47.075] ...future.value <- base::withVisible(base::local({ [18:40:47.075] do.call(function(...) { [18:40:47.075] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:47.075] if (!identical(...future.globals.maxSize.org, [18:40:47.075] ...future.globals.maxSize)) { [18:40:47.075] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:47.075] on.exit(options(oopts), add = TRUE) [18:40:47.075] } [18:40:47.075] { [18:40:47.075] lapply(seq_along(...future.elements_ii), [18:40:47.075] FUN = function(jj) { [18:40:47.075] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:47.075] ...future.FUN(...future.X_jj, ...) [18:40:47.075] }) [18:40:47.075] } [18:40:47.075] }, args = future.call.arguments) [18:40:47.075] })) [18:40:47.075] future::FutureResult(value = ...future.value$value, [18:40:47.075] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:40:47.075] ...future.rng), globalenv = if (FALSE) [18:40:47.075] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:40:47.075] ...future.globalenv.names)) [18:40:47.075] else NULL, started = ...future.startTime, version = "1.8") [18:40:47.075] }, condition = base::local({ [18:40:47.075] c <- base::c [18:40:47.075] inherits <- base::inherits [18:40:47.075] invokeRestart <- base::invokeRestart [18:40:47.075] length <- base::length [18:40:47.075] list <- base::list [18:40:47.075] seq.int <- base::seq.int [18:40:47.075] signalCondition <- base::signalCondition [18:40:47.075] sys.calls <- base::sys.calls [18:40:47.075] `[[` <- base::`[[` [18:40:47.075] `+` <- base::`+` [18:40:47.075] `<<-` <- base::`<<-` [18:40:47.075] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:40:47.075] calls[seq.int(from = from + 12L, to = length(calls) - [18:40:47.075] 3L)] [18:40:47.075] } [18:40:47.075] function(cond) { [18:40:47.075] is_error <- inherits(cond, "error") [18:40:47.075] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:40:47.075] NULL) [18:40:47.075] if (is_error) { [18:40:47.075] sessionInformation <- function() { [18:40:47.075] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:40:47.075] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:40:47.075] search = base::search(), system = base::Sys.info()) [18:40:47.075] } [18:40:47.075] ...future.conditions[[length(...future.conditions) + [18:40:47.075] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:40:47.075] cond$call), session = sessionInformation(), [18:40:47.075] timestamp = base::Sys.time(), signaled = 0L) [18:40:47.075] signalCondition(cond) [18:40:47.075] } [18:40:47.075] else if (!ignore && TRUE && inherits(cond, c("condition", [18:40:47.075] "immediateCondition"))) { [18:40:47.075] signal <- TRUE && inherits(cond, "immediateCondition") [18:40:47.075] ...future.conditions[[length(...future.conditions) + [18:40:47.075] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:40:47.075] if (TRUE && !signal) { [18:40:47.075] muffleCondition <- function (cond, pattern = "^muffle") [18:40:47.075] { [18:40:47.075] inherits <- base::inherits [18:40:47.075] invokeRestart <- base::invokeRestart [18:40:47.075] is.null <- base::is.null [18:40:47.075] muffled <- FALSE [18:40:47.075] if (inherits(cond, "message")) { [18:40:47.075] muffled <- grepl(pattern, "muffleMessage") [18:40:47.075] if (muffled) [18:40:47.075] invokeRestart("muffleMessage") [18:40:47.075] } [18:40:47.075] else if (inherits(cond, "warning")) { [18:40:47.075] muffled <- grepl(pattern, "muffleWarning") [18:40:47.075] if (muffled) [18:40:47.075] invokeRestart("muffleWarning") [18:40:47.075] } [18:40:47.075] else if (inherits(cond, "condition")) { [18:40:47.075] if (!is.null(pattern)) { [18:40:47.075] computeRestarts <- base::computeRestarts [18:40:47.075] grepl <- base::grepl [18:40:47.075] restarts <- computeRestarts(cond) [18:40:47.075] for (restart in restarts) { [18:40:47.075] name <- restart$name [18:40:47.075] if (is.null(name)) [18:40:47.075] next [18:40:47.075] if (!grepl(pattern, name)) [18:40:47.075] next [18:40:47.075] invokeRestart(restart) [18:40:47.075] muffled <- TRUE [18:40:47.075] break [18:40:47.075] } [18:40:47.075] } [18:40:47.075] } [18:40:47.075] invisible(muffled) [18:40:47.075] } [18:40:47.075] muffleCondition(cond, pattern = "^muffle") [18:40:47.075] } [18:40:47.075] } [18:40:47.075] else { [18:40:47.075] if (TRUE) { [18:40:47.075] muffleCondition <- function (cond, pattern = "^muffle") [18:40:47.075] { [18:40:47.075] inherits <- base::inherits [18:40:47.075] invokeRestart <- base::invokeRestart [18:40:47.075] is.null <- base::is.null [18:40:47.075] muffled <- FALSE [18:40:47.075] if (inherits(cond, "message")) { [18:40:47.075] muffled <- grepl(pattern, "muffleMessage") [18:40:47.075] if (muffled) [18:40:47.075] invokeRestart("muffleMessage") [18:40:47.075] } [18:40:47.075] else if (inherits(cond, "warning")) { [18:40:47.075] muffled <- grepl(pattern, "muffleWarning") [18:40:47.075] if (muffled) [18:40:47.075] invokeRestart("muffleWarning") [18:40:47.075] } [18:40:47.075] else if (inherits(cond, "condition")) { [18:40:47.075] if (!is.null(pattern)) { [18:40:47.075] computeRestarts <- base::computeRestarts [18:40:47.075] grepl <- base::grepl [18:40:47.075] restarts <- computeRestarts(cond) [18:40:47.075] for (restart in restarts) { [18:40:47.075] name <- restart$name [18:40:47.075] if (is.null(name)) [18:40:47.075] next [18:40:47.075] if (!grepl(pattern, name)) [18:40:47.075] next [18:40:47.075] invokeRestart(restart) [18:40:47.075] muffled <- TRUE [18:40:47.075] break [18:40:47.075] } [18:40:47.075] } [18:40:47.075] } [18:40:47.075] invisible(muffled) [18:40:47.075] } [18:40:47.075] muffleCondition(cond, pattern = "^muffle") [18:40:47.075] } [18:40:47.075] } [18:40:47.075] } [18:40:47.075] })) [18:40:47.075] }, error = function(ex) { [18:40:47.075] base::structure(base::list(value = NULL, visible = NULL, [18:40:47.075] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:40:47.075] ...future.rng), started = ...future.startTime, [18:40:47.075] finished = Sys.time(), session_uuid = NA_character_, [18:40:47.075] version = "1.8"), class = "FutureResult") [18:40:47.075] }, finally = { [18:40:47.075] if (!identical(...future.workdir, getwd())) [18:40:47.075] setwd(...future.workdir) [18:40:47.075] { [18:40:47.075] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:40:47.075] ...future.oldOptions$nwarnings <- NULL [18:40:47.075] } [18:40:47.075] base::options(...future.oldOptions) [18:40:47.075] if (.Platform$OS.type == "windows") { [18:40:47.075] old_names <- names(...future.oldEnvVars) [18:40:47.075] envs <- base::Sys.getenv() [18:40:47.075] names <- names(envs) [18:40:47.075] common <- intersect(names, old_names) [18:40:47.075] added <- setdiff(names, old_names) [18:40:47.075] removed <- setdiff(old_names, names) [18:40:47.075] changed <- common[...future.oldEnvVars[common] != [18:40:47.075] envs[common]] [18:40:47.075] NAMES <- toupper(changed) [18:40:47.075] args <- list() [18:40:47.075] for (kk in seq_along(NAMES)) { [18:40:47.075] name <- changed[[kk]] [18:40:47.075] NAME <- NAMES[[kk]] [18:40:47.075] if (name != NAME && is.element(NAME, old_names)) [18:40:47.075] next [18:40:47.075] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:47.075] } [18:40:47.075] NAMES <- toupper(added) [18:40:47.075] for (kk in seq_along(NAMES)) { [18:40:47.075] name <- added[[kk]] [18:40:47.075] NAME <- NAMES[[kk]] [18:40:47.075] if (name != NAME && is.element(NAME, old_names)) [18:40:47.075] next [18:40:47.075] args[[name]] <- "" [18:40:47.075] } [18:40:47.075] NAMES <- toupper(removed) [18:40:47.075] for (kk in seq_along(NAMES)) { [18:40:47.075] name <- removed[[kk]] [18:40:47.075] NAME <- NAMES[[kk]] [18:40:47.075] if (name != NAME && is.element(NAME, old_names)) [18:40:47.075] next [18:40:47.075] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:47.075] } [18:40:47.075] if (length(args) > 0) [18:40:47.075] base::do.call(base::Sys.setenv, args = args) [18:40:47.075] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:40:47.075] } [18:40:47.075] else { [18:40:47.075] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:40:47.075] } [18:40:47.075] { [18:40:47.075] if (base::length(...future.futureOptionsAdded) > [18:40:47.075] 0L) { [18:40:47.075] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:40:47.075] base::names(opts) <- ...future.futureOptionsAdded [18:40:47.075] base::options(opts) [18:40:47.075] } [18:40:47.075] { [18:40:47.075] { [18:40:47.075] NULL [18:40:47.075] RNGkind("Mersenne-Twister") [18:40:47.075] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:40:47.075] inherits = FALSE) [18:40:47.075] } [18:40:47.075] options(future.plan = NULL) [18:40:47.075] if (is.na(NA_character_)) [18:40:47.075] Sys.unsetenv("R_FUTURE_PLAN") [18:40:47.075] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:40:47.075] future::plan(...future.strategy.old, .cleanup = FALSE, [18:40:47.075] .init = FALSE) [18:40:47.075] } [18:40:47.075] } [18:40:47.075] } [18:40:47.075] }) [18:40:47.075] if (TRUE) { [18:40:47.075] base::sink(type = "output", split = FALSE) [18:40:47.075] if (TRUE) { [18:40:47.075] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:40:47.075] } [18:40:47.075] else { [18:40:47.075] ...future.result["stdout"] <- base::list(NULL) [18:40:47.075] } [18:40:47.075] base::close(...future.stdout) [18:40:47.075] ...future.stdout <- NULL [18:40:47.075] } [18:40:47.075] ...future.result$conditions <- ...future.conditions [18:40:47.075] ...future.result$finished <- base::Sys.time() [18:40:47.075] ...future.result [18:40:47.075] } [18:40:47.079] assign_globals() ... [18:40:47.079] List of 5 [18:40:47.079] $ future.call.arguments : list() [18:40:47.079] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:47.079] $ ...future.FUN :function (..., exclude = if (useNA == "no") c(NA, NaN), useNA = c("no", [18:40:47.079] "ifany", "always"), dnn = list.names(...), deparse.level = 1) [18:40:47.079] $ ...future.elements_ii :List of 2 [18:40:47.079] ..$ : num [1:4] 1 3 1 7 [18:40:47.079] ..$ : num [1:4] 2 4 6 8 [18:40:47.079] $ ...future.seeds_ii : NULL [18:40:47.079] $ ...future.globals.maxSize: num Inf [18:40:47.079] - attr(*, "resolved")= logi FALSE [18:40:47.079] - attr(*, "total_size")= num NA [18:40:47.079] - attr(*, "where")=List of 5 [18:40:47.079] ..$ future.call.arguments : [18:40:47.079] ..$ ...future.FUN : [18:40:47.079] ..$ ...future.elements_ii : [18:40:47.079] ..$ ...future.seeds_ii : [18:40:47.079] ..$ ...future.globals.maxSize: [18:40:47.079] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:47.079] - attr(*, "already-done")= logi TRUE [18:40:47.085] - copied 'future.call.arguments' to environment [18:40:47.085] - copied '...future.FUN' to environment [18:40:47.085] - copied '...future.elements_ii' to environment [18:40:47.086] - copied '...future.seeds_ii' to environment [18:40:47.086] - copied '...future.globals.maxSize' to environment [18:40:47.086] assign_globals() ... done [18:40:47.086] plan(): Setting new future strategy stack: [18:40:47.087] List of future strategies: [18:40:47.087] 1. sequential: [18:40:47.087] - args: function (..., envir = parent.frame(), workers = "") [18:40:47.087] - tweaked: FALSE [18:40:47.087] - call: NULL [18:40:47.087] plan(): nbrOfWorkers() = 1 [18:40:47.090] plan(): Setting new future strategy stack: [18:40:47.090] List of future strategies: [18:40:47.090] 1. sequential: [18:40:47.090] - args: function (..., envir = parent.frame(), workers = "") [18:40:47.090] - tweaked: FALSE [18:40:47.090] - call: plan(strategy) [18:40:47.091] plan(): nbrOfWorkers() = 1 [18:40:47.091] SequentialFuture started (and completed) [18:40:47.091] - Launch lazy future ... done [18:40:47.092] run() for 'SequentialFuture' ... done [18:40:47.092] Created future: [18:40:47.092] SequentialFuture: [18:40:47.092] Label: 'future_apply-1' [18:40:47.092] Expression: [18:40:47.092] { [18:40:47.092] do.call(function(...) { [18:40:47.092] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:47.092] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:47.092] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:47.092] on.exit(options(oopts), add = TRUE) [18:40:47.092] } [18:40:47.092] { [18:40:47.092] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:47.092] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:47.092] ...future.FUN(...future.X_jj, ...) [18:40:47.092] }) [18:40:47.092] } [18:40:47.092] }, args = future.call.arguments) [18:40:47.092] } [18:40:47.092] Lazy evaluation: FALSE [18:40:47.092] Asynchronous evaluation: FALSE [18:40:47.092] Local evaluation: TRUE [18:40:47.092] Environment: R_GlobalEnv [18:40:47.092] Capture standard output: TRUE [18:40:47.092] Capture condition classes: 'condition' (excluding 'nothing') [18:40:47.092] Globals: 5 objects totaling 31.56 KiB (DotDotDotList 'future.call.arguments' of 97 bytes, function '...future.FUN' of 31.30 KiB, list '...future.elements_ii' of 111 bytes, NULL '...future.seeds_ii' of 27 bytes, numeric '...future.globals.maxSize' of 39 bytes) [18:40:47.092] Packages: [18:40:47.092] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:40:47.092] Resolved: TRUE [18:40:47.092] Value: 429 bytes of class 'list' [18:40:47.092] Early signaling: FALSE [18:40:47.092] Owner process: 2171382a-9202-bc7d-80d6-248e0cb487f4 [18:40:47.092] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:40:47.094] Chunk #1 of 1 ... DONE [18:40:47.094] Launching 1 futures (chunks) ... DONE [18:40:47.094] Resolving 1 futures (chunks) ... [18:40:47.095] resolve() on list ... [18:40:47.095] recursive: 0 [18:40:47.095] length: 1 [18:40:47.095] [18:40:47.095] resolved() for 'SequentialFuture' ... [18:40:47.096] - state: 'finished' [18:40:47.096] - run: TRUE [18:40:47.096] - result: 'FutureResult' [18:40:47.096] resolved() for 'SequentialFuture' ... done [18:40:47.096] Future #1 [18:40:47.097] signalConditionsASAP(SequentialFuture, pos=1) ... [18:40:47.097] - nx: 1 [18:40:47.097] - relay: TRUE [18:40:47.097] - stdout: TRUE [18:40:47.097] - signal: TRUE [18:40:47.098] - resignal: FALSE [18:40:47.098] - force: TRUE [18:40:47.099] - relayed: [n=1] FALSE [18:40:47.099] - queued futures: [n=1] FALSE [18:40:47.099] - until=1 [18:40:47.099] - relaying element #1 [18:40:47.100] - relayed: [n=1] TRUE [18:40:47.100] - queued futures: [n=1] TRUE [18:40:47.100] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:40:47.100] length: 0 (resolved future 1) [18:40:47.101] Relaying remaining futures [18:40:47.101] signalConditionsASAP(NULL, pos=0) ... [18:40:47.101] - nx: 1 [18:40:47.101] - relay: TRUE [18:40:47.101] - stdout: TRUE [18:40:47.101] - signal: TRUE [18:40:47.101] - resignal: FALSE [18:40:47.102] - force: TRUE [18:40:47.102] - relayed: [n=1] TRUE [18:40:47.102] - queued futures: [n=1] TRUE - flush all [18:40:47.102] - relayed: [n=1] TRUE [18:40:47.102] - queued futures: [n=1] TRUE [18:40:47.102] signalConditionsASAP(NULL, pos=0) ... done [18:40:47.103] resolve() on list ... DONE [18:40:47.103] - Number of value chunks collected: 1 [18:40:47.103] Resolving 1 futures (chunks) ... DONE [18:40:47.103] Reducing values from 1 chunks ... [18:40:47.103] - Number of values collected after concatenation: 2 [18:40:47.103] - Number of values expected: 2 [18:40:47.104] Reducing values from 1 chunks ... DONE [18:40:47.104] future_lapply() ... DONE [[1]] ...future.X_jj 1 3 7 2 1 1 [[2]] ...future.X_jj 2 4 6 8 1 1 1 1 [18:40:47.105] getGlobalsAndPackagesXApply() ... [18:40:47.105] - future.globals: TRUE [18:40:47.105] getGlobalsAndPackages() ... [18:40:47.105] Searching for globals... [18:40:47.173] - globals found: [59] 'FUN', 'if', '==', 'c', 'list.names', '{', '<-', '[', 'as.list', 'substitute', '-', '&&', 'length', 'is.list', '!', 'is.null', 'names', 'return', 'seq_along', 'vapply', 'switch', '+', 'is.symbol', 'as.character', 'deparse', '[<-', 'missing', 'match', 'match.arg', '!=', 'warning', 'list', '[[', 'paste', 'stop', 'integer', 'for', 'is.factor', 'anyNA', 'options', 'on.exit', 'factor', '(', '||', 'levels', 'as.integer', 'which', 'is.na', 'is.na<-', '>', 'prod', '$', '.Machine', '*', 'names<-', 'array', 'tabulate', 'class', 'class<-' [18:40:47.173] Searching for globals ... DONE [18:40:47.174] Resolving globals: FALSE [18:40:47.176] The total size of the 1 globals is 31.30 KiB (32048 bytes) [18:40:47.176] The total size of the 1 globals exported for future expression ('FUN(X = structure(c(1, 2, 3, 4, 1, 6, 7, 8), dim = c(2L, 4L)))') is 31.30 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (31.30 KiB of class 'function') [18:40:47.177] - globals: [1] 'FUN' [18:40:47.177] [18:40:47.178] getGlobalsAndPackages() ... DONE [18:40:47.178] - globals found/used: [n=1] 'FUN' [18:40:47.178] - needed namespaces: [n=0] [18:40:47.178] Finding globals ... DONE [18:40:47.178] - use_args: TRUE [18:40:47.178] - Getting '...' globals ... [18:40:47.179] resolve() on list ... [18:40:47.179] recursive: 0 [18:40:47.179] length: 1 [18:40:47.179] elements: '...' [18:40:47.180] length: 0 (resolved future 1) [18:40:47.180] resolve() on list ... DONE [18:40:47.180] - '...' content: [n=0] [18:40:47.180] List of 1 [18:40:47.180] $ ...: list() [18:40:47.180] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:47.180] - attr(*, "where")=List of 1 [18:40:47.180] ..$ ...: [18:40:47.180] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:47.180] - attr(*, "resolved")= logi TRUE [18:40:47.180] - attr(*, "total_size")= num NA [18:40:47.183] - Getting '...' globals ... DONE [18:40:47.183] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:40:47.184] List of 2 [18:40:47.184] $ ...future.FUN:function (..., exclude = if (useNA == "no") c(NA, NaN), useNA = c("no", [18:40:47.184] "ifany", "always"), dnn = list.names(...), deparse.level = 1) [18:40:47.184] $ ... : list() [18:40:47.184] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:47.184] - attr(*, "where")=List of 2 [18:40:47.184] ..$ ...future.FUN: [18:40:47.184] ..$ ... : [18:40:47.184] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:47.184] - attr(*, "resolved")= logi FALSE [18:40:47.184] - attr(*, "total_size")= int 65967 [18:40:47.187] Packages to be attached in all futures: [n=0] [18:40:47.187] getGlobalsAndPackagesXApply() ... DONE [18:40:47.187] future_lapply() ... [18:40:47.229] Number of chunks: 1 [18:40:47.230] getGlobalsAndPackagesXApply() ... [18:40:47.230] - future.globals: with names 'list()' [18:40:47.230] - use_args: TRUE [18:40:47.230] Globals to be used in all futures (chunks): [n=2] '...', '...future.FUN' [18:40:47.231] List of 2 [18:40:47.231] $ ... : list() [18:40:47.231] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:47.231] $ ...future.FUN:function (..., exclude = if (useNA == "no") c(NA, NaN), useNA = c("no", [18:40:47.231] "ifany", "always"), dnn = list.names(...), deparse.level = 1) [18:40:47.231] - attr(*, "where")=List of 2 [18:40:47.231] ..$ ... : [18:40:47.231] ..$ ...future.FUN: [18:40:47.231] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:47.231] - attr(*, "resolved")= logi FALSE [18:40:47.231] - attr(*, "total_size")= num NA [18:40:47.235] Packages to be attached in all futures: [n=0] [18:40:47.235] getGlobalsAndPackagesXApply() ... DONE [18:40:47.235] Number of futures (= number of chunks): 1 [18:40:47.236] Launching 1 futures (chunks) ... [18:40:47.236] Chunk #1 of 1 ... [18:40:47.236] - seeds: [18:40:47.236] - All globals exported: [n=5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:47.236] getGlobalsAndPackages() ... [18:40:47.236] - globals passed as-is: [5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:47.237] Resolving globals: FALSE [18:40:47.237] Tweak future expression to call with '...' arguments ... [18:40:47.237] { [18:40:47.237] do.call(function(...) { [18:40:47.237] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:47.237] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:47.237] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:47.237] on.exit(options(oopts), add = TRUE) [18:40:47.237] } [18:40:47.237] { [18:40:47.237] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:47.237] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:47.237] ...future.FUN(...future.X_jj, ...) [18:40:47.237] }) [18:40:47.237] } [18:40:47.237] }, args = future.call.arguments) [18:40:47.237] } [18:40:47.237] Tweak future expression to call with '...' arguments ... DONE [18:40:47.238] - globals: [5] 'future.call.arguments', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:47.238] [18:40:47.238] getGlobalsAndPackages() ... DONE [18:40:47.239] run() for 'Future' ... [18:40:47.239] - state: 'created' [18:40:47.239] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:40:47.239] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:40:47.240] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:40:47.240] - Field: 'label' [18:40:47.240] - Field: 'local' [18:40:47.240] - Field: 'owner' [18:40:47.240] - Field: 'envir' [18:40:47.240] - Field: 'packages' [18:40:47.241] - Field: 'gc' [18:40:47.241] - Field: 'conditions' [18:40:47.241] - Field: 'expr' [18:40:47.241] - Field: 'uuid' [18:40:47.241] - Field: 'seed' [18:40:47.242] - Field: 'version' [18:40:47.242] - Field: 'result' [18:40:47.242] - Field: 'asynchronous' [18:40:47.242] - Field: 'calls' [18:40:47.242] - Field: 'globals' [18:40:47.243] - Field: 'stdout' [18:40:47.243] - Field: 'earlySignal' [18:40:47.243] - Field: 'lazy' [18:40:47.243] - Field: 'state' [18:40:47.243] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:40:47.243] - Launch lazy future ... [18:40:47.244] Packages needed by the future expression (n = 0): [18:40:47.244] Packages needed by future strategies (n = 0): [18:40:47.244] { [18:40:47.244] { [18:40:47.244] { [18:40:47.244] ...future.startTime <- base::Sys.time() [18:40:47.244] { [18:40:47.244] { [18:40:47.244] { [18:40:47.244] base::local({ [18:40:47.244] has_future <- base::requireNamespace("future", [18:40:47.244] quietly = TRUE) [18:40:47.244] if (has_future) { [18:40:47.244] ns <- base::getNamespace("future") [18:40:47.244] version <- ns[[".package"]][["version"]] [18:40:47.244] if (is.null(version)) [18:40:47.244] version <- utils::packageVersion("future") [18:40:47.244] } [18:40:47.244] else { [18:40:47.244] version <- NULL [18:40:47.244] } [18:40:47.244] if (!has_future || version < "1.8.0") { [18:40:47.244] info <- base::c(r_version = base::gsub("R version ", [18:40:47.244] "", base::R.version$version.string), [18:40:47.244] platform = base::sprintf("%s (%s-bit)", [18:40:47.244] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:40:47.244] os = base::paste(base::Sys.info()[base::c("sysname", [18:40:47.244] "release", "version")], collapse = " "), [18:40:47.244] hostname = base::Sys.info()[["nodename"]]) [18:40:47.244] info <- base::sprintf("%s: %s", base::names(info), [18:40:47.244] info) [18:40:47.244] info <- base::paste(info, collapse = "; ") [18:40:47.244] if (!has_future) { [18:40:47.244] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:40:47.244] info) [18:40:47.244] } [18:40:47.244] else { [18:40:47.244] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:40:47.244] info, version) [18:40:47.244] } [18:40:47.244] base::stop(msg) [18:40:47.244] } [18:40:47.244] }) [18:40:47.244] } [18:40:47.244] ...future.strategy.old <- future::plan("list") [18:40:47.244] options(future.plan = NULL) [18:40:47.244] Sys.unsetenv("R_FUTURE_PLAN") [18:40:47.244] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:40:47.244] } [18:40:47.244] ...future.workdir <- getwd() [18:40:47.244] } [18:40:47.244] ...future.oldOptions <- base::as.list(base::.Options) [18:40:47.244] ...future.oldEnvVars <- base::Sys.getenv() [18:40:47.244] } [18:40:47.244] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:40:47.244] future.globals.maxSize = Inf, future.globals.method = NULL, [18:40:47.244] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:40:47.244] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:40:47.244] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:40:47.244] future.stdout.windows.reencode = NULL, width = 80L) [18:40:47.244] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:40:47.244] base::names(...future.oldOptions)) [18:40:47.244] } [18:40:47.244] if (FALSE) { [18:40:47.244] } [18:40:47.244] else { [18:40:47.244] if (TRUE) { [18:40:47.244] ...future.stdout <- base::rawConnection(base::raw(0L), [18:40:47.244] open = "w") [18:40:47.244] } [18:40:47.244] else { [18:40:47.244] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:40:47.244] windows = "NUL", "/dev/null"), open = "w") [18:40:47.244] } [18:40:47.244] base::sink(...future.stdout, type = "output", split = FALSE) [18:40:47.244] base::on.exit(if (!base::is.null(...future.stdout)) { [18:40:47.244] base::sink(type = "output", split = FALSE) [18:40:47.244] base::close(...future.stdout) [18:40:47.244] }, add = TRUE) [18:40:47.244] } [18:40:47.244] ...future.frame <- base::sys.nframe() [18:40:47.244] ...future.conditions <- base::list() [18:40:47.244] ...future.rng <- base::globalenv()$.Random.seed [18:40:47.244] if (FALSE) { [18:40:47.244] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:40:47.244] "...future.value", "...future.globalenv.names", ".Random.seed") [18:40:47.244] } [18:40:47.244] ...future.result <- base::tryCatch({ [18:40:47.244] base::withCallingHandlers({ [18:40:47.244] ...future.value <- base::withVisible(base::local({ [18:40:47.244] do.call(function(...) { [18:40:47.244] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:47.244] if (!identical(...future.globals.maxSize.org, [18:40:47.244] ...future.globals.maxSize)) { [18:40:47.244] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:47.244] on.exit(options(oopts), add = TRUE) [18:40:47.244] } [18:40:47.244] { [18:40:47.244] lapply(seq_along(...future.elements_ii), [18:40:47.244] FUN = function(jj) { [18:40:47.244] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:47.244] ...future.FUN(...future.X_jj, ...) [18:40:47.244] }) [18:40:47.244] } [18:40:47.244] }, args = future.call.arguments) [18:40:47.244] })) [18:40:47.244] future::FutureResult(value = ...future.value$value, [18:40:47.244] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:40:47.244] ...future.rng), globalenv = if (FALSE) [18:40:47.244] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:40:47.244] ...future.globalenv.names)) [18:40:47.244] else NULL, started = ...future.startTime, version = "1.8") [18:40:47.244] }, condition = base::local({ [18:40:47.244] c <- base::c [18:40:47.244] inherits <- base::inherits [18:40:47.244] invokeRestart <- base::invokeRestart [18:40:47.244] length <- base::length [18:40:47.244] list <- base::list [18:40:47.244] seq.int <- base::seq.int [18:40:47.244] signalCondition <- base::signalCondition [18:40:47.244] sys.calls <- base::sys.calls [18:40:47.244] `[[` <- base::`[[` [18:40:47.244] `+` <- base::`+` [18:40:47.244] `<<-` <- base::`<<-` [18:40:47.244] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:40:47.244] calls[seq.int(from = from + 12L, to = length(calls) - [18:40:47.244] 3L)] [18:40:47.244] } [18:40:47.244] function(cond) { [18:40:47.244] is_error <- inherits(cond, "error") [18:40:47.244] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:40:47.244] NULL) [18:40:47.244] if (is_error) { [18:40:47.244] sessionInformation <- function() { [18:40:47.244] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:40:47.244] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:40:47.244] search = base::search(), system = base::Sys.info()) [18:40:47.244] } [18:40:47.244] ...future.conditions[[length(...future.conditions) + [18:40:47.244] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:40:47.244] cond$call), session = sessionInformation(), [18:40:47.244] timestamp = base::Sys.time(), signaled = 0L) [18:40:47.244] signalCondition(cond) [18:40:47.244] } [18:40:47.244] else if (!ignore && TRUE && inherits(cond, c("condition", [18:40:47.244] "immediateCondition"))) { [18:40:47.244] signal <- TRUE && inherits(cond, "immediateCondition") [18:40:47.244] ...future.conditions[[length(...future.conditions) + [18:40:47.244] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:40:47.244] if (TRUE && !signal) { [18:40:47.244] muffleCondition <- function (cond, pattern = "^muffle") [18:40:47.244] { [18:40:47.244] inherits <- base::inherits [18:40:47.244] invokeRestart <- base::invokeRestart [18:40:47.244] is.null <- base::is.null [18:40:47.244] muffled <- FALSE [18:40:47.244] if (inherits(cond, "message")) { [18:40:47.244] muffled <- grepl(pattern, "muffleMessage") [18:40:47.244] if (muffled) [18:40:47.244] invokeRestart("muffleMessage") [18:40:47.244] } [18:40:47.244] else if (inherits(cond, "warning")) { [18:40:47.244] muffled <- grepl(pattern, "muffleWarning") [18:40:47.244] if (muffled) [18:40:47.244] invokeRestart("muffleWarning") [18:40:47.244] } [18:40:47.244] else if (inherits(cond, "condition")) { [18:40:47.244] if (!is.null(pattern)) { [18:40:47.244] computeRestarts <- base::computeRestarts [18:40:47.244] grepl <- base::grepl [18:40:47.244] restarts <- computeRestarts(cond) [18:40:47.244] for (restart in restarts) { [18:40:47.244] name <- restart$name [18:40:47.244] if (is.null(name)) [18:40:47.244] next [18:40:47.244] if (!grepl(pattern, name)) [18:40:47.244] next [18:40:47.244] invokeRestart(restart) [18:40:47.244] muffled <- TRUE [18:40:47.244] break [18:40:47.244] } [18:40:47.244] } [18:40:47.244] } [18:40:47.244] invisible(muffled) [18:40:47.244] } [18:40:47.244] muffleCondition(cond, pattern = "^muffle") [18:40:47.244] } [18:40:47.244] } [18:40:47.244] else { [18:40:47.244] if (TRUE) { [18:40:47.244] muffleCondition <- function (cond, pattern = "^muffle") [18:40:47.244] { [18:40:47.244] inherits <- base::inherits [18:40:47.244] invokeRestart <- base::invokeRestart [18:40:47.244] is.null <- base::is.null [18:40:47.244] muffled <- FALSE [18:40:47.244] if (inherits(cond, "message")) { [18:40:47.244] muffled <- grepl(pattern, "muffleMessage") [18:40:47.244] if (muffled) [18:40:47.244] invokeRestart("muffleMessage") [18:40:47.244] } [18:40:47.244] else if (inherits(cond, "warning")) { [18:40:47.244] muffled <- grepl(pattern, "muffleWarning") [18:40:47.244] if (muffled) [18:40:47.244] invokeRestart("muffleWarning") [18:40:47.244] } [18:40:47.244] else if (inherits(cond, "condition")) { [18:40:47.244] if (!is.null(pattern)) { [18:40:47.244] computeRestarts <- base::computeRestarts [18:40:47.244] grepl <- base::grepl [18:40:47.244] restarts <- computeRestarts(cond) [18:40:47.244] for (restart in restarts) { [18:40:47.244] name <- restart$name [18:40:47.244] if (is.null(name)) [18:40:47.244] next [18:40:47.244] if (!grepl(pattern, name)) [18:40:47.244] next [18:40:47.244] invokeRestart(restart) [18:40:47.244] muffled <- TRUE [18:40:47.244] break [18:40:47.244] } [18:40:47.244] } [18:40:47.244] } [18:40:47.244] invisible(muffled) [18:40:47.244] } [18:40:47.244] muffleCondition(cond, pattern = "^muffle") [18:40:47.244] } [18:40:47.244] } [18:40:47.244] } [18:40:47.244] })) [18:40:47.244] }, error = function(ex) { [18:40:47.244] base::structure(base::list(value = NULL, visible = NULL, [18:40:47.244] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:40:47.244] ...future.rng), started = ...future.startTime, [18:40:47.244] finished = Sys.time(), session_uuid = NA_character_, [18:40:47.244] version = "1.8"), class = "FutureResult") [18:40:47.244] }, finally = { [18:40:47.244] if (!identical(...future.workdir, getwd())) [18:40:47.244] setwd(...future.workdir) [18:40:47.244] { [18:40:47.244] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:40:47.244] ...future.oldOptions$nwarnings <- NULL [18:40:47.244] } [18:40:47.244] base::options(...future.oldOptions) [18:40:47.244] if (.Platform$OS.type == "windows") { [18:40:47.244] old_names <- names(...future.oldEnvVars) [18:40:47.244] envs <- base::Sys.getenv() [18:40:47.244] names <- names(envs) [18:40:47.244] common <- intersect(names, old_names) [18:40:47.244] added <- setdiff(names, old_names) [18:40:47.244] removed <- setdiff(old_names, names) [18:40:47.244] changed <- common[...future.oldEnvVars[common] != [18:40:47.244] envs[common]] [18:40:47.244] NAMES <- toupper(changed) [18:40:47.244] args <- list() [18:40:47.244] for (kk in seq_along(NAMES)) { [18:40:47.244] name <- changed[[kk]] [18:40:47.244] NAME <- NAMES[[kk]] [18:40:47.244] if (name != NAME && is.element(NAME, old_names)) [18:40:47.244] next [18:40:47.244] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:47.244] } [18:40:47.244] NAMES <- toupper(added) [18:40:47.244] for (kk in seq_along(NAMES)) { [18:40:47.244] name <- added[[kk]] [18:40:47.244] NAME <- NAMES[[kk]] [18:40:47.244] if (name != NAME && is.element(NAME, old_names)) [18:40:47.244] next [18:40:47.244] args[[name]] <- "" [18:40:47.244] } [18:40:47.244] NAMES <- toupper(removed) [18:40:47.244] for (kk in seq_along(NAMES)) { [18:40:47.244] name <- removed[[kk]] [18:40:47.244] NAME <- NAMES[[kk]] [18:40:47.244] if (name != NAME && is.element(NAME, old_names)) [18:40:47.244] next [18:40:47.244] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:47.244] } [18:40:47.244] if (length(args) > 0) [18:40:47.244] base::do.call(base::Sys.setenv, args = args) [18:40:47.244] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:40:47.244] } [18:40:47.244] else { [18:40:47.244] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:40:47.244] } [18:40:47.244] { [18:40:47.244] if (base::length(...future.futureOptionsAdded) > [18:40:47.244] 0L) { [18:40:47.244] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:40:47.244] base::names(opts) <- ...future.futureOptionsAdded [18:40:47.244] base::options(opts) [18:40:47.244] } [18:40:47.244] { [18:40:47.244] { [18:40:47.244] NULL [18:40:47.244] RNGkind("Mersenne-Twister") [18:40:47.244] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:40:47.244] inherits = FALSE) [18:40:47.244] } [18:40:47.244] options(future.plan = NULL) [18:40:47.244] if (is.na(NA_character_)) [18:40:47.244] Sys.unsetenv("R_FUTURE_PLAN") [18:40:47.244] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:40:47.244] future::plan(...future.strategy.old, .cleanup = FALSE, [18:40:47.244] .init = FALSE) [18:40:47.244] } [18:40:47.244] } [18:40:47.244] } [18:40:47.244] }) [18:40:47.244] if (TRUE) { [18:40:47.244] base::sink(type = "output", split = FALSE) [18:40:47.244] if (TRUE) { [18:40:47.244] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:40:47.244] } [18:40:47.244] else { [18:40:47.244] ...future.result["stdout"] <- base::list(NULL) [18:40:47.244] } [18:40:47.244] base::close(...future.stdout) [18:40:47.244] ...future.stdout <- NULL [18:40:47.244] } [18:40:47.244] ...future.result$conditions <- ...future.conditions [18:40:47.244] ...future.result$finished <- base::Sys.time() [18:40:47.244] ...future.result [18:40:47.244] } [18:40:47.248] assign_globals() ... [18:40:47.249] List of 5 [18:40:47.249] $ future.call.arguments : list() [18:40:47.249] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:47.249] $ ...future.FUN :function (..., exclude = if (useNA == "no") c(NA, NaN), useNA = c("no", [18:40:47.249] "ifany", "always"), dnn = list.names(...), deparse.level = 1) [18:40:47.249] $ ...future.elements_ii :List of 2 [18:40:47.249] ..$ : num [1:4] 1 3 1 7 [18:40:47.249] ..$ : num [1:4] 2 4 6 8 [18:40:47.249] $ ...future.seeds_ii : NULL [18:40:47.249] $ ...future.globals.maxSize: num Inf [18:40:47.249] - attr(*, "resolved")= logi FALSE [18:40:47.249] - attr(*, "total_size")= num NA [18:40:47.249] - attr(*, "where")=List of 5 [18:40:47.249] ..$ future.call.arguments : [18:40:47.249] ..$ ...future.FUN : [18:40:47.249] ..$ ...future.elements_ii : [18:40:47.249] ..$ ...future.seeds_ii : [18:40:47.249] ..$ ...future.globals.maxSize: [18:40:47.249] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:47.249] - attr(*, "already-done")= logi TRUE [18:40:47.255] - copied 'future.call.arguments' to environment [18:40:47.255] - copied '...future.FUN' to environment [18:40:47.255] - copied '...future.elements_ii' to environment [18:40:47.255] - copied '...future.seeds_ii' to environment [18:40:47.255] - copied '...future.globals.maxSize' to environment [18:40:47.256] assign_globals() ... done [18:40:47.256] plan(): Setting new future strategy stack: [18:40:47.256] List of future strategies: [18:40:47.256] 1. sequential: [18:40:47.256] - args: function (..., envir = parent.frame(), workers = "") [18:40:47.256] - tweaked: FALSE [18:40:47.256] - call: NULL [18:40:47.257] plan(): nbrOfWorkers() = 1 [18:40:47.258] plan(): Setting new future strategy stack: [18:40:47.258] List of future strategies: [18:40:47.258] 1. sequential: [18:40:47.258] - args: function (..., envir = parent.frame(), workers = "") [18:40:47.258] - tweaked: FALSE [18:40:47.258] - call: plan(strategy) [18:40:47.259] plan(): nbrOfWorkers() = 1 [18:40:47.259] SequentialFuture started (and completed) [18:40:47.260] - Launch lazy future ... done [18:40:47.260] run() for 'SequentialFuture' ... done [18:40:47.260] Created future: [18:40:47.260] SequentialFuture: [18:40:47.260] Label: 'future_apply-1' [18:40:47.260] Expression: [18:40:47.260] { [18:40:47.260] do.call(function(...) { [18:40:47.260] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:47.260] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:47.260] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:47.260] on.exit(options(oopts), add = TRUE) [18:40:47.260] } [18:40:47.260] { [18:40:47.260] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:47.260] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:47.260] ...future.FUN(...future.X_jj, ...) [18:40:47.260] }) [18:40:47.260] } [18:40:47.260] }, args = future.call.arguments) [18:40:47.260] } [18:40:47.260] Lazy evaluation: FALSE [18:40:47.260] Asynchronous evaluation: FALSE [18:40:47.260] Local evaluation: TRUE [18:40:47.260] Environment: R_GlobalEnv [18:40:47.260] Capture standard output: TRUE [18:40:47.260] Capture condition classes: 'condition' (excluding 'nothing') [18:40:47.260] Globals: 5 objects totaling 31.56 KiB (DotDotDotList 'future.call.arguments' of 97 bytes, function '...future.FUN' of 31.30 KiB, list '...future.elements_ii' of 111 bytes, NULL '...future.seeds_ii' of 27 bytes, numeric '...future.globals.maxSize' of 39 bytes) [18:40:47.260] Packages: [18:40:47.260] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:40:47.260] Resolved: TRUE [18:40:47.260] Value: 429 bytes of class 'list' [18:40:47.260] Early signaling: FALSE [18:40:47.260] Owner process: 2171382a-9202-bc7d-80d6-248e0cb487f4 [18:40:47.260] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:40:47.262] Chunk #1 of 1 ... DONE [18:40:47.263] Launching 1 futures (chunks) ... DONE [18:40:47.263] Resolving 1 futures (chunks) ... [18:40:47.263] resolve() on list ... [18:40:47.263] recursive: 0 [18:40:47.263] length: 1 [18:40:47.263] [18:40:47.264] resolved() for 'SequentialFuture' ... [18:40:47.264] - state: 'finished' [18:40:47.264] - run: TRUE [18:40:47.264] - result: 'FutureResult' [18:40:47.264] resolved() for 'SequentialFuture' ... done [18:40:47.264] Future #1 [18:40:47.265] signalConditionsASAP(SequentialFuture, pos=1) ... [18:40:47.265] - nx: 1 [18:40:47.265] - relay: TRUE [18:40:47.265] - stdout: TRUE [18:40:47.265] - signal: TRUE [18:40:47.265] - resignal: FALSE [18:40:47.266] - force: TRUE [18:40:47.266] - relayed: [n=1] FALSE [18:40:47.266] - queued futures: [n=1] FALSE [18:40:47.266] - until=1 [18:40:47.266] - relaying element #1 [18:40:47.266] - relayed: [n=1] TRUE [18:40:47.267] - queued futures: [n=1] TRUE [18:40:47.267] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:40:47.267] length: 0 (resolved future 1) [18:40:47.267] Relaying remaining futures [18:40:47.267] signalConditionsASAP(NULL, pos=0) ... [18:40:47.267] - nx: 1 [18:40:47.268] - relay: TRUE [18:40:47.268] - stdout: TRUE [18:40:47.268] - signal: TRUE [18:40:47.268] - resignal: FALSE [18:40:47.268] - force: TRUE [18:40:47.268] - relayed: [n=1] TRUE [18:40:47.268] - queued futures: [n=1] TRUE - flush all [18:40:47.269] - relayed: [n=1] TRUE [18:40:47.269] - queued futures: [n=1] TRUE [18:40:47.269] signalConditionsASAP(NULL, pos=0) ... done [18:40:47.269] resolve() on list ... DONE [18:40:47.269] - Number of value chunks collected: 1 [18:40:47.269] Resolving 1 futures (chunks) ... DONE [18:40:47.270] Reducing values from 1 chunks ... [18:40:47.270] - Number of values collected after concatenation: 2 [18:40:47.270] - Number of values expected: 2 [18:40:47.270] Reducing values from 1 chunks ... DONE [18:40:47.270] future_lapply() ... DONE [[1]] ...future.X_jj 1 3 7 2 1 1 [[2]] ...future.X_jj 2 4 6 8 1 1 1 1 [18:40:47.272] getGlobalsAndPackagesXApply() ... [18:40:47.273] - future.globals: TRUE [18:40:47.273] getGlobalsAndPackages() ... [18:40:47.273] Searching for globals... [18:40:47.274] - globals found: [2] 'FUN', 'UseMethod' [18:40:47.274] Searching for globals ... DONE [18:40:47.275] Resolving globals: FALSE [18:40:47.275] The total size of the 1 globals is 311 bytes (311 bytes) [18:40:47.276] The total size of the 1 globals exported for future expression ('FUN(X = structure(c(1, 2, 3, 4, 1, 6, 7, 8), dim = c(2L, 4L)))') is 311 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (311 bytes of class 'function') [18:40:47.276] - globals: [1] 'FUN' [18:40:47.276] - packages: [1] 'stats' [18:40:47.276] getGlobalsAndPackages() ... DONE [18:40:47.276] - globals found/used: [n=1] 'FUN' [18:40:47.276] - needed namespaces: [n=1] 'stats' [18:40:47.277] Finding globals ... DONE [18:40:47.277] - use_args: TRUE [18:40:47.277] - Getting '...' globals ... [18:40:47.277] resolve() on list ... [18:40:47.278] recursive: 0 [18:40:47.278] length: 1 [18:40:47.278] elements: '...' [18:40:47.278] length: 0 (resolved future 1) [18:40:47.278] resolve() on list ... DONE [18:40:47.278] - '...' content: [n=0] [18:40:47.279] List of 1 [18:40:47.279] $ ...: list() [18:40:47.279] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:47.279] - attr(*, "where")=List of 1 [18:40:47.279] ..$ ...: [18:40:47.279] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:47.279] - attr(*, "resolved")= logi TRUE [18:40:47.279] - attr(*, "total_size")= num NA [18:40:47.281] - Getting '...' globals ... DONE [18:40:47.282] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:40:47.282] List of 2 [18:40:47.282] $ ...future.FUN:function (x, ...) [18:40:47.282] $ ... : list() [18:40:47.282] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:47.282] - attr(*, "where")=List of 2 [18:40:47.282] ..$ ...future.FUN: [18:40:47.282] ..$ ... : [18:40:47.282] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:47.282] - attr(*, "resolved")= logi FALSE [18:40:47.282] - attr(*, "total_size")= int 2586 [18:40:47.286] Packages to be attached in all futures: [n=1] 'stats' [18:40:47.286] getGlobalsAndPackagesXApply() ... DONE [18:40:47.286] future_lapply() ... [18:40:47.287] Number of chunks: 1 [18:40:47.287] getGlobalsAndPackagesXApply() ... [18:40:47.287] - future.globals: with names 'list()' [18:40:47.288] - use_args: TRUE [18:40:47.288] Globals to be used in all futures (chunks): [n=2] '...', '...future.FUN' [18:40:47.288] List of 2 [18:40:47.288] $ ... : list() [18:40:47.288] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:47.288] $ ...future.FUN:function (x, ...) [18:40:47.288] - attr(*, "where")=List of 2 [18:40:47.288] ..$ ... : [18:40:47.288] ..$ ...future.FUN: [18:40:47.288] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:47.288] - attr(*, "resolved")= logi FALSE [18:40:47.288] - attr(*, "total_size")= num NA [18:40:47.291] Packages to be attached in all futures: [n=1] 'stats' [18:40:47.291] getGlobalsAndPackagesXApply() ... DONE [18:40:47.292] Number of futures (= number of chunks): 1 [18:40:47.292] Launching 1 futures (chunks) ... [18:40:47.292] Chunk #1 of 1 ... [18:40:47.292] - seeds: [18:40:47.292] - All globals exported: [n=5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:47.293] getGlobalsAndPackages() ... [18:40:47.293] - globals passed as-is: [5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:47.293] Resolving globals: FALSE [18:40:47.293] Tweak future expression to call with '...' arguments ... [18:40:47.293] { [18:40:47.293] do.call(function(...) { [18:40:47.293] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:47.293] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:47.293] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:47.293] on.exit(options(oopts), add = TRUE) [18:40:47.293] } [18:40:47.293] { [18:40:47.293] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:47.293] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:47.293] ...future.FUN(...future.X_jj, ...) [18:40:47.293] }) [18:40:47.293] } [18:40:47.293] }, args = future.call.arguments) [18:40:47.293] } [18:40:47.294] Tweak future expression to call with '...' arguments ... DONE [18:40:47.294] - globals: [5] 'future.call.arguments', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:47.295] - packages: [1] 'stats' [18:40:47.295] getGlobalsAndPackages() ... DONE [18:40:47.295] run() for 'Future' ... [18:40:47.295] - state: 'created' [18:40:47.296] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:40:47.296] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:40:47.296] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:40:47.296] - Field: 'label' [18:40:47.297] - Field: 'local' [18:40:47.297] - Field: 'owner' [18:40:47.297] - Field: 'envir' [18:40:47.297] - Field: 'packages' [18:40:47.297] - Field: 'gc' [18:40:47.297] - Field: 'conditions' [18:40:47.298] - Field: 'expr' [18:40:47.298] - Field: 'uuid' [18:40:47.298] - Field: 'seed' [18:40:47.298] - Field: 'version' [18:40:47.298] - Field: 'result' [18:40:47.298] - Field: 'asynchronous' [18:40:47.299] - Field: 'calls' [18:40:47.299] - Field: 'globals' [18:40:47.299] - Field: 'stdout' [18:40:47.299] - Field: 'earlySignal' [18:40:47.299] - Field: 'lazy' [18:40:47.299] - Field: 'state' [18:40:47.300] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:40:47.300] - Launch lazy future ... [18:40:47.300] Packages needed by the future expression (n = 1): 'stats' [18:40:47.300] Packages needed by future strategies (n = 0): [18:40:47.301] { [18:40:47.301] { [18:40:47.301] { [18:40:47.301] ...future.startTime <- base::Sys.time() [18:40:47.301] { [18:40:47.301] { [18:40:47.301] { [18:40:47.301] { [18:40:47.301] base::local({ [18:40:47.301] has_future <- base::requireNamespace("future", [18:40:47.301] quietly = TRUE) [18:40:47.301] if (has_future) { [18:40:47.301] ns <- base::getNamespace("future") [18:40:47.301] version <- ns[[".package"]][["version"]] [18:40:47.301] if (is.null(version)) [18:40:47.301] version <- utils::packageVersion("future") [18:40:47.301] } [18:40:47.301] else { [18:40:47.301] version <- NULL [18:40:47.301] } [18:40:47.301] if (!has_future || version < "1.8.0") { [18:40:47.301] info <- base::c(r_version = base::gsub("R version ", [18:40:47.301] "", base::R.version$version.string), [18:40:47.301] platform = base::sprintf("%s (%s-bit)", [18:40:47.301] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:40:47.301] os = base::paste(base::Sys.info()[base::c("sysname", [18:40:47.301] "release", "version")], collapse = " "), [18:40:47.301] hostname = base::Sys.info()[["nodename"]]) [18:40:47.301] info <- base::sprintf("%s: %s", base::names(info), [18:40:47.301] info) [18:40:47.301] info <- base::paste(info, collapse = "; ") [18:40:47.301] if (!has_future) { [18:40:47.301] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:40:47.301] info) [18:40:47.301] } [18:40:47.301] else { [18:40:47.301] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:40:47.301] info, version) [18:40:47.301] } [18:40:47.301] base::stop(msg) [18:40:47.301] } [18:40:47.301] }) [18:40:47.301] } [18:40:47.301] base::local({ [18:40:47.301] for (pkg in "stats") { [18:40:47.301] base::loadNamespace(pkg) [18:40:47.301] base::library(pkg, character.only = TRUE) [18:40:47.301] } [18:40:47.301] }) [18:40:47.301] } [18:40:47.301] ...future.strategy.old <- future::plan("list") [18:40:47.301] options(future.plan = NULL) [18:40:47.301] Sys.unsetenv("R_FUTURE_PLAN") [18:40:47.301] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:40:47.301] } [18:40:47.301] ...future.workdir <- getwd() [18:40:47.301] } [18:40:47.301] ...future.oldOptions <- base::as.list(base::.Options) [18:40:47.301] ...future.oldEnvVars <- base::Sys.getenv() [18:40:47.301] } [18:40:47.301] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:40:47.301] future.globals.maxSize = Inf, future.globals.method = NULL, [18:40:47.301] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:40:47.301] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:40:47.301] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:40:47.301] future.stdout.windows.reencode = NULL, width = 80L) [18:40:47.301] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:40:47.301] base::names(...future.oldOptions)) [18:40:47.301] } [18:40:47.301] if (FALSE) { [18:40:47.301] } [18:40:47.301] else { [18:40:47.301] if (TRUE) { [18:40:47.301] ...future.stdout <- base::rawConnection(base::raw(0L), [18:40:47.301] open = "w") [18:40:47.301] } [18:40:47.301] else { [18:40:47.301] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:40:47.301] windows = "NUL", "/dev/null"), open = "w") [18:40:47.301] } [18:40:47.301] base::sink(...future.stdout, type = "output", split = FALSE) [18:40:47.301] base::on.exit(if (!base::is.null(...future.stdout)) { [18:40:47.301] base::sink(type = "output", split = FALSE) [18:40:47.301] base::close(...future.stdout) [18:40:47.301] }, add = TRUE) [18:40:47.301] } [18:40:47.301] ...future.frame <- base::sys.nframe() [18:40:47.301] ...future.conditions <- base::list() [18:40:47.301] ...future.rng <- base::globalenv()$.Random.seed [18:40:47.301] if (FALSE) { [18:40:47.301] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:40:47.301] "...future.value", "...future.globalenv.names", ".Random.seed") [18:40:47.301] } [18:40:47.301] ...future.result <- base::tryCatch({ [18:40:47.301] base::withCallingHandlers({ [18:40:47.301] ...future.value <- base::withVisible(base::local({ [18:40:47.301] do.call(function(...) { [18:40:47.301] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:47.301] if (!identical(...future.globals.maxSize.org, [18:40:47.301] ...future.globals.maxSize)) { [18:40:47.301] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:47.301] on.exit(options(oopts), add = TRUE) [18:40:47.301] } [18:40:47.301] { [18:40:47.301] lapply(seq_along(...future.elements_ii), [18:40:47.301] FUN = function(jj) { [18:40:47.301] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:47.301] ...future.FUN(...future.X_jj, ...) [18:40:47.301] }) [18:40:47.301] } [18:40:47.301] }, args = future.call.arguments) [18:40:47.301] })) [18:40:47.301] future::FutureResult(value = ...future.value$value, [18:40:47.301] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:40:47.301] ...future.rng), globalenv = if (FALSE) [18:40:47.301] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:40:47.301] ...future.globalenv.names)) [18:40:47.301] else NULL, started = ...future.startTime, version = "1.8") [18:40:47.301] }, condition = base::local({ [18:40:47.301] c <- base::c [18:40:47.301] inherits <- base::inherits [18:40:47.301] invokeRestart <- base::invokeRestart [18:40:47.301] length <- base::length [18:40:47.301] list <- base::list [18:40:47.301] seq.int <- base::seq.int [18:40:47.301] signalCondition <- base::signalCondition [18:40:47.301] sys.calls <- base::sys.calls [18:40:47.301] `[[` <- base::`[[` [18:40:47.301] `+` <- base::`+` [18:40:47.301] `<<-` <- base::`<<-` [18:40:47.301] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:40:47.301] calls[seq.int(from = from + 12L, to = length(calls) - [18:40:47.301] 3L)] [18:40:47.301] } [18:40:47.301] function(cond) { [18:40:47.301] is_error <- inherits(cond, "error") [18:40:47.301] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:40:47.301] NULL) [18:40:47.301] if (is_error) { [18:40:47.301] sessionInformation <- function() { [18:40:47.301] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:40:47.301] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:40:47.301] search = base::search(), system = base::Sys.info()) [18:40:47.301] } [18:40:47.301] ...future.conditions[[length(...future.conditions) + [18:40:47.301] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:40:47.301] cond$call), session = sessionInformation(), [18:40:47.301] timestamp = base::Sys.time(), signaled = 0L) [18:40:47.301] signalCondition(cond) [18:40:47.301] } [18:40:47.301] else if (!ignore && TRUE && inherits(cond, c("condition", [18:40:47.301] "immediateCondition"))) { [18:40:47.301] signal <- TRUE && inherits(cond, "immediateCondition") [18:40:47.301] ...future.conditions[[length(...future.conditions) + [18:40:47.301] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:40:47.301] if (TRUE && !signal) { [18:40:47.301] muffleCondition <- function (cond, pattern = "^muffle") [18:40:47.301] { [18:40:47.301] inherits <- base::inherits [18:40:47.301] invokeRestart <- base::invokeRestart [18:40:47.301] is.null <- base::is.null [18:40:47.301] muffled <- FALSE [18:40:47.301] if (inherits(cond, "message")) { [18:40:47.301] muffled <- grepl(pattern, "muffleMessage") [18:40:47.301] if (muffled) [18:40:47.301] invokeRestart("muffleMessage") [18:40:47.301] } [18:40:47.301] else if (inherits(cond, "warning")) { [18:40:47.301] muffled <- grepl(pattern, "muffleWarning") [18:40:47.301] if (muffled) [18:40:47.301] invokeRestart("muffleWarning") [18:40:47.301] } [18:40:47.301] else if (inherits(cond, "condition")) { [18:40:47.301] if (!is.null(pattern)) { [18:40:47.301] computeRestarts <- base::computeRestarts [18:40:47.301] grepl <- base::grepl [18:40:47.301] restarts <- computeRestarts(cond) [18:40:47.301] for (restart in restarts) { [18:40:47.301] name <- restart$name [18:40:47.301] if (is.null(name)) [18:40:47.301] next [18:40:47.301] if (!grepl(pattern, name)) [18:40:47.301] next [18:40:47.301] invokeRestart(restart) [18:40:47.301] muffled <- TRUE [18:40:47.301] break [18:40:47.301] } [18:40:47.301] } [18:40:47.301] } [18:40:47.301] invisible(muffled) [18:40:47.301] } [18:40:47.301] muffleCondition(cond, pattern = "^muffle") [18:40:47.301] } [18:40:47.301] } [18:40:47.301] else { [18:40:47.301] if (TRUE) { [18:40:47.301] muffleCondition <- function (cond, pattern = "^muffle") [18:40:47.301] { [18:40:47.301] inherits <- base::inherits [18:40:47.301] invokeRestart <- base::invokeRestart [18:40:47.301] is.null <- base::is.null [18:40:47.301] muffled <- FALSE [18:40:47.301] if (inherits(cond, "message")) { [18:40:47.301] muffled <- grepl(pattern, "muffleMessage") [18:40:47.301] if (muffled) [18:40:47.301] invokeRestart("muffleMessage") [18:40:47.301] } [18:40:47.301] else if (inherits(cond, "warning")) { [18:40:47.301] muffled <- grepl(pattern, "muffleWarning") [18:40:47.301] if (muffled) [18:40:47.301] invokeRestart("muffleWarning") [18:40:47.301] } [18:40:47.301] else if (inherits(cond, "condition")) { [18:40:47.301] if (!is.null(pattern)) { [18:40:47.301] computeRestarts <- base::computeRestarts [18:40:47.301] grepl <- base::grepl [18:40:47.301] restarts <- computeRestarts(cond) [18:40:47.301] for (restart in restarts) { [18:40:47.301] name <- restart$name [18:40:47.301] if (is.null(name)) [18:40:47.301] next [18:40:47.301] if (!grepl(pattern, name)) [18:40:47.301] next [18:40:47.301] invokeRestart(restart) [18:40:47.301] muffled <- TRUE [18:40:47.301] break [18:40:47.301] } [18:40:47.301] } [18:40:47.301] } [18:40:47.301] invisible(muffled) [18:40:47.301] } [18:40:47.301] muffleCondition(cond, pattern = "^muffle") [18:40:47.301] } [18:40:47.301] } [18:40:47.301] } [18:40:47.301] })) [18:40:47.301] }, error = function(ex) { [18:40:47.301] base::structure(base::list(value = NULL, visible = NULL, [18:40:47.301] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:40:47.301] ...future.rng), started = ...future.startTime, [18:40:47.301] finished = Sys.time(), session_uuid = NA_character_, [18:40:47.301] version = "1.8"), class = "FutureResult") [18:40:47.301] }, finally = { [18:40:47.301] if (!identical(...future.workdir, getwd())) [18:40:47.301] setwd(...future.workdir) [18:40:47.301] { [18:40:47.301] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:40:47.301] ...future.oldOptions$nwarnings <- NULL [18:40:47.301] } [18:40:47.301] base::options(...future.oldOptions) [18:40:47.301] if (.Platform$OS.type == "windows") { [18:40:47.301] old_names <- names(...future.oldEnvVars) [18:40:47.301] envs <- base::Sys.getenv() [18:40:47.301] names <- names(envs) [18:40:47.301] common <- intersect(names, old_names) [18:40:47.301] added <- setdiff(names, old_names) [18:40:47.301] removed <- setdiff(old_names, names) [18:40:47.301] changed <- common[...future.oldEnvVars[common] != [18:40:47.301] envs[common]] [18:40:47.301] NAMES <- toupper(changed) [18:40:47.301] args <- list() [18:40:47.301] for (kk in seq_along(NAMES)) { [18:40:47.301] name <- changed[[kk]] [18:40:47.301] NAME <- NAMES[[kk]] [18:40:47.301] if (name != NAME && is.element(NAME, old_names)) [18:40:47.301] next [18:40:47.301] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:47.301] } [18:40:47.301] NAMES <- toupper(added) [18:40:47.301] for (kk in seq_along(NAMES)) { [18:40:47.301] name <- added[[kk]] [18:40:47.301] NAME <- NAMES[[kk]] [18:40:47.301] if (name != NAME && is.element(NAME, old_names)) [18:40:47.301] next [18:40:47.301] args[[name]] <- "" [18:40:47.301] } [18:40:47.301] NAMES <- toupper(removed) [18:40:47.301] for (kk in seq_along(NAMES)) { [18:40:47.301] name <- removed[[kk]] [18:40:47.301] NAME <- NAMES[[kk]] [18:40:47.301] if (name != NAME && is.element(NAME, old_names)) [18:40:47.301] next [18:40:47.301] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:47.301] } [18:40:47.301] if (length(args) > 0) [18:40:47.301] base::do.call(base::Sys.setenv, args = args) [18:40:47.301] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:40:47.301] } [18:40:47.301] else { [18:40:47.301] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:40:47.301] } [18:40:47.301] { [18:40:47.301] if (base::length(...future.futureOptionsAdded) > [18:40:47.301] 0L) { [18:40:47.301] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:40:47.301] base::names(opts) <- ...future.futureOptionsAdded [18:40:47.301] base::options(opts) [18:40:47.301] } [18:40:47.301] { [18:40:47.301] { [18:40:47.301] NULL [18:40:47.301] RNGkind("Mersenne-Twister") [18:40:47.301] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:40:47.301] inherits = FALSE) [18:40:47.301] } [18:40:47.301] options(future.plan = NULL) [18:40:47.301] if (is.na(NA_character_)) [18:40:47.301] Sys.unsetenv("R_FUTURE_PLAN") [18:40:47.301] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:40:47.301] future::plan(...future.strategy.old, .cleanup = FALSE, [18:40:47.301] .init = FALSE) [18:40:47.301] } [18:40:47.301] } [18:40:47.301] } [18:40:47.301] }) [18:40:47.301] if (TRUE) { [18:40:47.301] base::sink(type = "output", split = FALSE) [18:40:47.301] if (TRUE) { [18:40:47.301] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:40:47.301] } [18:40:47.301] else { [18:40:47.301] ...future.result["stdout"] <- base::list(NULL) [18:40:47.301] } [18:40:47.301] base::close(...future.stdout) [18:40:47.301] ...future.stdout <- NULL [18:40:47.301] } [18:40:47.301] ...future.result$conditions <- ...future.conditions [18:40:47.301] ...future.result$finished <- base::Sys.time() [18:40:47.301] ...future.result [18:40:47.301] } [18:40:47.305] assign_globals() ... [18:40:47.305] List of 5 [18:40:47.305] $ future.call.arguments : list() [18:40:47.305] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:47.305] $ ...future.FUN :function (x, ...) [18:40:47.305] $ ...future.elements_ii :List of 2 [18:40:47.305] ..$ : num [1:4] 1 3 1 7 [18:40:47.305] ..$ : num [1:4] 2 4 6 8 [18:40:47.305] $ ...future.seeds_ii : NULL [18:40:47.305] $ ...future.globals.maxSize: num Inf [18:40:47.305] - attr(*, "resolved")= logi FALSE [18:40:47.305] - attr(*, "total_size")= num NA [18:40:47.305] - attr(*, "where")=List of 5 [18:40:47.305] ..$ future.call.arguments : [18:40:47.305] ..$ ...future.FUN : [18:40:47.305] ..$ ...future.elements_ii : [18:40:47.305] ..$ ...future.seeds_ii : [18:40:47.305] ..$ ...future.globals.maxSize: [18:40:47.305] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:47.305] - attr(*, "already-done")= logi TRUE [18:40:47.312] - copied 'future.call.arguments' to environment [18:40:47.313] - copied '...future.FUN' to environment [18:40:47.313] - copied '...future.elements_ii' to environment [18:40:47.313] - copied '...future.seeds_ii' to environment [18:40:47.313] - copied '...future.globals.maxSize' to environment [18:40:47.313] assign_globals() ... done [18:40:47.314] plan(): Setting new future strategy stack: [18:40:47.314] List of future strategies: [18:40:47.314] 1. sequential: [18:40:47.314] - args: function (..., envir = parent.frame(), workers = "") [18:40:47.314] - tweaked: FALSE [18:40:47.314] - call: NULL [18:40:47.315] plan(): nbrOfWorkers() = 1 [18:40:47.317] plan(): Setting new future strategy stack: [18:40:47.317] List of future strategies: [18:40:47.317] 1. sequential: [18:40:47.317] - args: function (..., envir = parent.frame(), workers = "") [18:40:47.317] - tweaked: FALSE [18:40:47.317] - call: plan(strategy) [18:40:47.317] plan(): nbrOfWorkers() = 1 [18:40:47.318] SequentialFuture started (and completed) [18:40:47.318] - Launch lazy future ... done [18:40:47.318] run() for 'SequentialFuture' ... done [18:40:47.318] Created future: [18:40:47.318] SequentialFuture: [18:40:47.318] Label: 'future_apply-1' [18:40:47.318] Expression: [18:40:47.318] { [18:40:47.318] do.call(function(...) { [18:40:47.318] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:47.318] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:47.318] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:47.318] on.exit(options(oopts), add = TRUE) [18:40:47.318] } [18:40:47.318] { [18:40:47.318] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:47.318] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:47.318] ...future.FUN(...future.X_jj, ...) [18:40:47.318] }) [18:40:47.318] } [18:40:47.318] }, args = future.call.arguments) [18:40:47.318] } [18:40:47.318] Lazy evaluation: FALSE [18:40:47.318] Asynchronous evaluation: FALSE [18:40:47.318] Local evaluation: TRUE [18:40:47.318] Environment: R_GlobalEnv [18:40:47.318] Capture standard output: TRUE [18:40:47.318] Capture condition classes: 'condition' (excluding 'nothing') [18:40:47.318] Globals: 5 objects totaling 585 bytes (DotDotDotList 'future.call.arguments' of 97 bytes, function '...future.FUN' of 311 bytes, list '...future.elements_ii' of 111 bytes, NULL '...future.seeds_ii' of 27 bytes, numeric '...future.globals.maxSize' of 39 bytes) [18:40:47.318] Packages: 1 packages ('stats') [18:40:47.318] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:40:47.318] Resolved: TRUE [18:40:47.318] Value: 290 bytes of class 'list' [18:40:47.318] Early signaling: FALSE [18:40:47.318] Owner process: 2171382a-9202-bc7d-80d6-248e0cb487f4 [18:40:47.318] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:40:47.319] Chunk #1 of 1 ... DONE [18:40:47.320] Launching 1 futures (chunks) ... DONE [18:40:47.320] Resolving 1 futures (chunks) ... [18:40:47.320] resolve() on list ... [18:40:47.320] recursive: 0 [18:40:47.320] length: 1 [18:40:47.320] [18:40:47.320] resolved() for 'SequentialFuture' ... [18:40:47.321] - state: 'finished' [18:40:47.321] - run: TRUE [18:40:47.321] - result: 'FutureResult' [18:40:47.321] resolved() for 'SequentialFuture' ... done [18:40:47.321] Future #1 [18:40:47.322] signalConditionsASAP(SequentialFuture, pos=1) ... [18:40:47.322] - nx: 1 [18:40:47.322] - relay: TRUE [18:40:47.322] - stdout: TRUE [18:40:47.322] - signal: TRUE [18:40:47.322] - resignal: FALSE [18:40:47.322] - force: TRUE [18:40:47.323] - relayed: [n=1] FALSE [18:40:47.323] - queued futures: [n=1] FALSE [18:40:47.323] - until=1 [18:40:47.323] - relaying element #1 [18:40:47.323] - relayed: [n=1] TRUE [18:40:47.324] - queued futures: [n=1] TRUE [18:40:47.324] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:40:47.324] length: 0 (resolved future 1) [18:40:47.324] Relaying remaining futures [18:40:47.324] signalConditionsASAP(NULL, pos=0) ... [18:40:47.324] - nx: 1 [18:40:47.324] - relay: TRUE [18:40:47.325] - stdout: TRUE [18:40:47.325] - signal: TRUE [18:40:47.325] - resignal: FALSE [18:40:47.325] - force: TRUE [18:40:47.325] - relayed: [n=1] TRUE [18:40:47.325] - queued futures: [n=1] TRUE - flush all [18:40:47.326] - relayed: [n=1] TRUE [18:40:47.326] - queued futures: [n=1] TRUE [18:40:47.326] signalConditionsASAP(NULL, pos=0) ... done [18:40:47.326] resolve() on list ... DONE [18:40:47.326] - Number of value chunks collected: 1 [18:40:47.326] Resolving 1 futures (chunks) ... DONE [18:40:47.327] Reducing values from 1 chunks ... [18:40:47.327] - Number of values collected after concatenation: 2 [18:40:47.327] - Number of values expected: 2 [18:40:47.327] Reducing values from 1 chunks ... DONE [18:40:47.327] future_lapply() ... DONE [,1] [,2] 0% 1 2.0 25% 1 3.5 50% 2 5.0 75% 4 6.5 100% 7 8.0 [18:40:47.328] getGlobalsAndPackagesXApply() ... [18:40:47.328] - future.globals: TRUE [18:40:47.328] getGlobalsAndPackages() ... [18:40:47.329] Searching for globals... [18:40:47.330] - globals found: [1] 'FUN' [18:40:47.330] Searching for globals ... DONE [18:40:47.330] Resolving globals: FALSE [18:40:47.330] The total size of the 1 globals is 185 bytes (185 bytes) [18:40:47.331] The total size of the 1 globals exported for future expression ('FUN(X = structure(c(3, 3, 3, 3, 3, 3, 3, 3, 4, 3, 2, 1, 2, 3,; 4, 5), dim = c(8L, 2L), dimnames = list(row = NULL, col = c("x1",; "x2"))))') 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:40:47.331] - globals: [1] 'FUN' [18:40:47.331] [18:40:47.332] getGlobalsAndPackages() ... DONE [18:40:47.332] - globals found/used: [n=1] 'FUN' [18:40:47.332] - needed namespaces: [n=0] [18:40:47.332] Finding globals ... DONE [18:40:47.332] - use_args: TRUE [18:40:47.332] - Getting '...' globals ... [18:40:47.333] resolve() on list ... [18:40:47.333] recursive: 0 [18:40:47.333] length: 1 [18:40:47.333] elements: '...' [18:40:47.333] length: 0 (resolved future 1) [18:40:47.334] resolve() on list ... DONE [18:40:47.334] - '...' content: [n=0] [18:40:47.334] List of 1 [18:40:47.334] $ ...: list() [18:40:47.334] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:47.334] - attr(*, "where")=List of 1 [18:40:47.334] ..$ ...: [18:40:47.334] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:47.334] - attr(*, "resolved")= logi TRUE [18:40:47.334] - attr(*, "total_size")= num NA [18:40:47.364] - Getting '...' globals ... DONE [18:40:47.364] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:40:47.364] List of 2 [18:40:47.364] $ ...future.FUN:function (x) [18:40:47.364] $ ... : list() [18:40:47.364] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:47.364] - attr(*, "where")=List of 2 [18:40:47.364] ..$ ...future.FUN: [18:40:47.364] ..$ ... : [18:40:47.364] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:47.364] - attr(*, "resolved")= logi FALSE [18:40:47.364] - attr(*, "total_size")= int 2624 [18:40:47.367] Packages to be attached in all futures: [n=0] [18:40:47.368] getGlobalsAndPackagesXApply() ... DONE [18:40:47.368] future_lapply() ... [18:40:47.368] Number of chunks: 1 [18:40:47.369] getGlobalsAndPackagesXApply() ... [18:40:47.369] - future.globals: with names 'list()' [18:40:47.369] - use_args: TRUE [18:40:47.369] Globals to be used in all futures (chunks): [n=2] '...', '...future.FUN' [18:40:47.370] List of 2 [18:40:47.370] $ ... : list() [18:40:47.370] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:47.370] $ ...future.FUN:function (x) [18:40:47.370] - attr(*, "where")=List of 2 [18:40:47.370] ..$ ... : [18:40:47.370] ..$ ...future.FUN: [18:40:47.370] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:47.370] - attr(*, "resolved")= logi FALSE [18:40:47.370] - attr(*, "total_size")= num NA [18:40:47.373] Packages to be attached in all futures: [n=0] [18:40:47.373] getGlobalsAndPackagesXApply() ... DONE [18:40:47.374] Number of futures (= number of chunks): 1 [18:40:47.374] Launching 1 futures (chunks) ... [18:40:47.374] Chunk #1 of 1 ... [18:40:47.374] - seeds: [18:40:47.374] - All globals exported: [n=5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:47.375] getGlobalsAndPackages() ... [18:40:47.375] - globals passed as-is: [5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:47.375] Resolving globals: FALSE [18:40:47.375] Tweak future expression to call with '...' arguments ... [18:40:47.375] { [18:40:47.375] do.call(function(...) { [18:40:47.375] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:47.375] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:47.375] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:47.375] on.exit(options(oopts), add = TRUE) [18:40:47.375] } [18:40:47.375] { [18:40:47.375] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:47.375] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:47.375] ...future.FUN(...future.X_jj, ...) [18:40:47.375] }) [18:40:47.375] } [18:40:47.375] }, args = future.call.arguments) [18:40:47.375] } [18:40:47.376] Tweak future expression to call with '...' arguments ... DONE [18:40:47.376] - globals: [5] 'future.call.arguments', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:47.376] [18:40:47.377] getGlobalsAndPackages() ... DONE [18:40:47.377] run() for 'Future' ... [18:40:47.377] - state: 'created' [18:40:47.377] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:40:47.378] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:40:47.378] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:40:47.378] - Field: 'label' [18:40:47.378] - Field: 'local' [18:40:47.378] - Field: 'owner' [18:40:47.379] - Field: 'envir' [18:40:47.379] - Field: 'packages' [18:40:47.379] - Field: 'gc' [18:40:47.379] - Field: 'conditions' [18:40:47.379] - Field: 'expr' [18:40:47.379] - Field: 'uuid' [18:40:47.380] - Field: 'seed' [18:40:47.380] - Field: 'version' [18:40:47.380] - Field: 'result' [18:40:47.380] - Field: 'asynchronous' [18:40:47.380] - Field: 'calls' [18:40:47.380] - Field: 'globals' [18:40:47.381] - Field: 'stdout' [18:40:47.381] - Field: 'earlySignal' [18:40:47.381] - Field: 'lazy' [18:40:47.381] - Field: 'state' [18:40:47.381] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:40:47.382] - Launch lazy future ... [18:40:47.382] Packages needed by the future expression (n = 0): [18:40:47.382] Packages needed by future strategies (n = 0): [18:40:47.382] { [18:40:47.382] { [18:40:47.382] { [18:40:47.382] ...future.startTime <- base::Sys.time() [18:40:47.382] { [18:40:47.382] { [18:40:47.382] { [18:40:47.382] base::local({ [18:40:47.382] has_future <- base::requireNamespace("future", [18:40:47.382] quietly = TRUE) [18:40:47.382] if (has_future) { [18:40:47.382] ns <- base::getNamespace("future") [18:40:47.382] version <- ns[[".package"]][["version"]] [18:40:47.382] if (is.null(version)) [18:40:47.382] version <- utils::packageVersion("future") [18:40:47.382] } [18:40:47.382] else { [18:40:47.382] version <- NULL [18:40:47.382] } [18:40:47.382] if (!has_future || version < "1.8.0") { [18:40:47.382] info <- base::c(r_version = base::gsub("R version ", [18:40:47.382] "", base::R.version$version.string), [18:40:47.382] platform = base::sprintf("%s (%s-bit)", [18:40:47.382] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:40:47.382] os = base::paste(base::Sys.info()[base::c("sysname", [18:40:47.382] "release", "version")], collapse = " "), [18:40:47.382] hostname = base::Sys.info()[["nodename"]]) [18:40:47.382] info <- base::sprintf("%s: %s", base::names(info), [18:40:47.382] info) [18:40:47.382] info <- base::paste(info, collapse = "; ") [18:40:47.382] if (!has_future) { [18:40:47.382] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:40:47.382] info) [18:40:47.382] } [18:40:47.382] else { [18:40:47.382] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:40:47.382] info, version) [18:40:47.382] } [18:40:47.382] base::stop(msg) [18:40:47.382] } [18:40:47.382] }) [18:40:47.382] } [18:40:47.382] ...future.strategy.old <- future::plan("list") [18:40:47.382] options(future.plan = NULL) [18:40:47.382] Sys.unsetenv("R_FUTURE_PLAN") [18:40:47.382] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:40:47.382] } [18:40:47.382] ...future.workdir <- getwd() [18:40:47.382] } [18:40:47.382] ...future.oldOptions <- base::as.list(base::.Options) [18:40:47.382] ...future.oldEnvVars <- base::Sys.getenv() [18:40:47.382] } [18:40:47.382] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:40:47.382] future.globals.maxSize = Inf, future.globals.method = NULL, [18:40:47.382] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:40:47.382] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:40:47.382] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:40:47.382] future.stdout.windows.reencode = NULL, width = 80L) [18:40:47.382] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:40:47.382] base::names(...future.oldOptions)) [18:40:47.382] } [18:40:47.382] if (FALSE) { [18:40:47.382] } [18:40:47.382] else { [18:40:47.382] if (TRUE) { [18:40:47.382] ...future.stdout <- base::rawConnection(base::raw(0L), [18:40:47.382] open = "w") [18:40:47.382] } [18:40:47.382] else { [18:40:47.382] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:40:47.382] windows = "NUL", "/dev/null"), open = "w") [18:40:47.382] } [18:40:47.382] base::sink(...future.stdout, type = "output", split = FALSE) [18:40:47.382] base::on.exit(if (!base::is.null(...future.stdout)) { [18:40:47.382] base::sink(type = "output", split = FALSE) [18:40:47.382] base::close(...future.stdout) [18:40:47.382] }, add = TRUE) [18:40:47.382] } [18:40:47.382] ...future.frame <- base::sys.nframe() [18:40:47.382] ...future.conditions <- base::list() [18:40:47.382] ...future.rng <- base::globalenv()$.Random.seed [18:40:47.382] if (FALSE) { [18:40:47.382] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:40:47.382] "...future.value", "...future.globalenv.names", ".Random.seed") [18:40:47.382] } [18:40:47.382] ...future.result <- base::tryCatch({ [18:40:47.382] base::withCallingHandlers({ [18:40:47.382] ...future.value <- base::withVisible(base::local({ [18:40:47.382] do.call(function(...) { [18:40:47.382] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:47.382] if (!identical(...future.globals.maxSize.org, [18:40:47.382] ...future.globals.maxSize)) { [18:40:47.382] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:47.382] on.exit(options(oopts), add = TRUE) [18:40:47.382] } [18:40:47.382] { [18:40:47.382] lapply(seq_along(...future.elements_ii), [18:40:47.382] FUN = function(jj) { [18:40:47.382] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:47.382] ...future.FUN(...future.X_jj, ...) [18:40:47.382] }) [18:40:47.382] } [18:40:47.382] }, args = future.call.arguments) [18:40:47.382] })) [18:40:47.382] future::FutureResult(value = ...future.value$value, [18:40:47.382] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:40:47.382] ...future.rng), globalenv = if (FALSE) [18:40:47.382] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:40:47.382] ...future.globalenv.names)) [18:40:47.382] else NULL, started = ...future.startTime, version = "1.8") [18:40:47.382] }, condition = base::local({ [18:40:47.382] c <- base::c [18:40:47.382] inherits <- base::inherits [18:40:47.382] invokeRestart <- base::invokeRestart [18:40:47.382] length <- base::length [18:40:47.382] list <- base::list [18:40:47.382] seq.int <- base::seq.int [18:40:47.382] signalCondition <- base::signalCondition [18:40:47.382] sys.calls <- base::sys.calls [18:40:47.382] `[[` <- base::`[[` [18:40:47.382] `+` <- base::`+` [18:40:47.382] `<<-` <- base::`<<-` [18:40:47.382] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:40:47.382] calls[seq.int(from = from + 12L, to = length(calls) - [18:40:47.382] 3L)] [18:40:47.382] } [18:40:47.382] function(cond) { [18:40:47.382] is_error <- inherits(cond, "error") [18:40:47.382] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:40:47.382] NULL) [18:40:47.382] if (is_error) { [18:40:47.382] sessionInformation <- function() { [18:40:47.382] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:40:47.382] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:40:47.382] search = base::search(), system = base::Sys.info()) [18:40:47.382] } [18:40:47.382] ...future.conditions[[length(...future.conditions) + [18:40:47.382] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:40:47.382] cond$call), session = sessionInformation(), [18:40:47.382] timestamp = base::Sys.time(), signaled = 0L) [18:40:47.382] signalCondition(cond) [18:40:47.382] } [18:40:47.382] else if (!ignore && TRUE && inherits(cond, c("condition", [18:40:47.382] "immediateCondition"))) { [18:40:47.382] signal <- TRUE && inherits(cond, "immediateCondition") [18:40:47.382] ...future.conditions[[length(...future.conditions) + [18:40:47.382] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:40:47.382] if (TRUE && !signal) { [18:40:47.382] muffleCondition <- function (cond, pattern = "^muffle") [18:40:47.382] { [18:40:47.382] inherits <- base::inherits [18:40:47.382] invokeRestart <- base::invokeRestart [18:40:47.382] is.null <- base::is.null [18:40:47.382] muffled <- FALSE [18:40:47.382] if (inherits(cond, "message")) { [18:40:47.382] muffled <- grepl(pattern, "muffleMessage") [18:40:47.382] if (muffled) [18:40:47.382] invokeRestart("muffleMessage") [18:40:47.382] } [18:40:47.382] else if (inherits(cond, "warning")) { [18:40:47.382] muffled <- grepl(pattern, "muffleWarning") [18:40:47.382] if (muffled) [18:40:47.382] invokeRestart("muffleWarning") [18:40:47.382] } [18:40:47.382] else if (inherits(cond, "condition")) { [18:40:47.382] if (!is.null(pattern)) { [18:40:47.382] computeRestarts <- base::computeRestarts [18:40:47.382] grepl <- base::grepl [18:40:47.382] restarts <- computeRestarts(cond) [18:40:47.382] for (restart in restarts) { [18:40:47.382] name <- restart$name [18:40:47.382] if (is.null(name)) [18:40:47.382] next [18:40:47.382] if (!grepl(pattern, name)) [18:40:47.382] next [18:40:47.382] invokeRestart(restart) [18:40:47.382] muffled <- TRUE [18:40:47.382] break [18:40:47.382] } [18:40:47.382] } [18:40:47.382] } [18:40:47.382] invisible(muffled) [18:40:47.382] } [18:40:47.382] muffleCondition(cond, pattern = "^muffle") [18:40:47.382] } [18:40:47.382] } [18:40:47.382] else { [18:40:47.382] if (TRUE) { [18:40:47.382] muffleCondition <- function (cond, pattern = "^muffle") [18:40:47.382] { [18:40:47.382] inherits <- base::inherits [18:40:47.382] invokeRestart <- base::invokeRestart [18:40:47.382] is.null <- base::is.null [18:40:47.382] muffled <- FALSE [18:40:47.382] if (inherits(cond, "message")) { [18:40:47.382] muffled <- grepl(pattern, "muffleMessage") [18:40:47.382] if (muffled) [18:40:47.382] invokeRestart("muffleMessage") [18:40:47.382] } [18:40:47.382] else if (inherits(cond, "warning")) { [18:40:47.382] muffled <- grepl(pattern, "muffleWarning") [18:40:47.382] if (muffled) [18:40:47.382] invokeRestart("muffleWarning") [18:40:47.382] } [18:40:47.382] else if (inherits(cond, "condition")) { [18:40:47.382] if (!is.null(pattern)) { [18:40:47.382] computeRestarts <- base::computeRestarts [18:40:47.382] grepl <- base::grepl [18:40:47.382] restarts <- computeRestarts(cond) [18:40:47.382] for (restart in restarts) { [18:40:47.382] name <- restart$name [18:40:47.382] if (is.null(name)) [18:40:47.382] next [18:40:47.382] if (!grepl(pattern, name)) [18:40:47.382] next [18:40:47.382] invokeRestart(restart) [18:40:47.382] muffled <- TRUE [18:40:47.382] break [18:40:47.382] } [18:40:47.382] } [18:40:47.382] } [18:40:47.382] invisible(muffled) [18:40:47.382] } [18:40:47.382] muffleCondition(cond, pattern = "^muffle") [18:40:47.382] } [18:40:47.382] } [18:40:47.382] } [18:40:47.382] })) [18:40:47.382] }, error = function(ex) { [18:40:47.382] base::structure(base::list(value = NULL, visible = NULL, [18:40:47.382] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:40:47.382] ...future.rng), started = ...future.startTime, [18:40:47.382] finished = Sys.time(), session_uuid = NA_character_, [18:40:47.382] version = "1.8"), class = "FutureResult") [18:40:47.382] }, finally = { [18:40:47.382] if (!identical(...future.workdir, getwd())) [18:40:47.382] setwd(...future.workdir) [18:40:47.382] { [18:40:47.382] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:40:47.382] ...future.oldOptions$nwarnings <- NULL [18:40:47.382] } [18:40:47.382] base::options(...future.oldOptions) [18:40:47.382] if (.Platform$OS.type == "windows") { [18:40:47.382] old_names <- names(...future.oldEnvVars) [18:40:47.382] envs <- base::Sys.getenv() [18:40:47.382] names <- names(envs) [18:40:47.382] common <- intersect(names, old_names) [18:40:47.382] added <- setdiff(names, old_names) [18:40:47.382] removed <- setdiff(old_names, names) [18:40:47.382] changed <- common[...future.oldEnvVars[common] != [18:40:47.382] envs[common]] [18:40:47.382] NAMES <- toupper(changed) [18:40:47.382] args <- list() [18:40:47.382] for (kk in seq_along(NAMES)) { [18:40:47.382] name <- changed[[kk]] [18:40:47.382] NAME <- NAMES[[kk]] [18:40:47.382] if (name != NAME && is.element(NAME, old_names)) [18:40:47.382] next [18:40:47.382] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:47.382] } [18:40:47.382] NAMES <- toupper(added) [18:40:47.382] for (kk in seq_along(NAMES)) { [18:40:47.382] name <- added[[kk]] [18:40:47.382] NAME <- NAMES[[kk]] [18:40:47.382] if (name != NAME && is.element(NAME, old_names)) [18:40:47.382] next [18:40:47.382] args[[name]] <- "" [18:40:47.382] } [18:40:47.382] NAMES <- toupper(removed) [18:40:47.382] for (kk in seq_along(NAMES)) { [18:40:47.382] name <- removed[[kk]] [18:40:47.382] NAME <- NAMES[[kk]] [18:40:47.382] if (name != NAME && is.element(NAME, old_names)) [18:40:47.382] next [18:40:47.382] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:47.382] } [18:40:47.382] if (length(args) > 0) [18:40:47.382] base::do.call(base::Sys.setenv, args = args) [18:40:47.382] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:40:47.382] } [18:40:47.382] else { [18:40:47.382] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:40:47.382] } [18:40:47.382] { [18:40:47.382] if (base::length(...future.futureOptionsAdded) > [18:40:47.382] 0L) { [18:40:47.382] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:40:47.382] base::names(opts) <- ...future.futureOptionsAdded [18:40:47.382] base::options(opts) [18:40:47.382] } [18:40:47.382] { [18:40:47.382] { [18:40:47.382] NULL [18:40:47.382] RNGkind("Mersenne-Twister") [18:40:47.382] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:40:47.382] inherits = FALSE) [18:40:47.382] } [18:40:47.382] options(future.plan = NULL) [18:40:47.382] if (is.na(NA_character_)) [18:40:47.382] Sys.unsetenv("R_FUTURE_PLAN") [18:40:47.382] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:40:47.382] future::plan(...future.strategy.old, .cleanup = FALSE, [18:40:47.382] .init = FALSE) [18:40:47.382] } [18:40:47.382] } [18:40:47.382] } [18:40:47.382] }) [18:40:47.382] if (TRUE) { [18:40:47.382] base::sink(type = "output", split = FALSE) [18:40:47.382] if (TRUE) { [18:40:47.382] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:40:47.382] } [18:40:47.382] else { [18:40:47.382] ...future.result["stdout"] <- base::list(NULL) [18:40:47.382] } [18:40:47.382] base::close(...future.stdout) [18:40:47.382] ...future.stdout <- NULL [18:40:47.382] } [18:40:47.382] ...future.result$conditions <- ...future.conditions [18:40:47.382] ...future.result$finished <- base::Sys.time() [18:40:47.382] ...future.result [18:40:47.382] } [18:40:47.386] assign_globals() ... [18:40:47.386] List of 5 [18:40:47.386] $ future.call.arguments : list() [18:40:47.386] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:47.386] $ ...future.FUN :function (x) [18:40:47.386] $ ...future.elements_ii :List of 2 [18:40:47.386] ..$ : num [1:8] 3 3 3 3 3 3 3 3 [18:40:47.386] ..$ : num [1:8] 4 3 2 1 2 3 4 5 [18:40:47.386] $ ...future.seeds_ii : NULL [18:40:47.386] $ ...future.globals.maxSize: num Inf [18:40:47.386] - attr(*, "resolved")= logi FALSE [18:40:47.386] - attr(*, "total_size")= num NA [18:40:47.386] - attr(*, "where")=List of 5 [18:40:47.386] ..$ future.call.arguments : [18:40:47.386] ..$ ...future.FUN : [18:40:47.386] ..$ ...future.elements_ii : [18:40:47.386] ..$ ...future.seeds_ii : [18:40:47.386] ..$ ...future.globals.maxSize: [18:40:47.386] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:47.386] - attr(*, "already-done")= logi TRUE [18:40:47.393] - copied 'future.call.arguments' to environment [18:40:47.394] - copied '...future.FUN' to environment [18:40:47.394] - copied '...future.elements_ii' to environment [18:40:47.394] - copied '...future.seeds_ii' to environment [18:40:47.394] - copied '...future.globals.maxSize' to environment [18:40:47.394] assign_globals() ... done [18:40:47.395] plan(): Setting new future strategy stack: [18:40:47.395] List of future strategies: [18:40:47.395] 1. sequential: [18:40:47.395] - args: function (..., envir = parent.frame(), workers = "") [18:40:47.395] - tweaked: FALSE [18:40:47.395] - call: NULL [18:40:47.396] plan(): nbrOfWorkers() = 1 [18:40:47.397] plan(): Setting new future strategy stack: [18:40:47.397] List of future strategies: [18:40:47.397] 1. sequential: [18:40:47.397] - args: function (..., envir = parent.frame(), workers = "") [18:40:47.397] - tweaked: FALSE [18:40:47.397] - call: plan(strategy) [18:40:47.398] plan(): nbrOfWorkers() = 1 [18:40:47.398] SequentialFuture started (and completed) [18:40:47.398] - Launch lazy future ... done [18:40:47.399] run() for 'SequentialFuture' ... done [18:40:47.399] Created future: [18:40:47.399] SequentialFuture: [18:40:47.399] Label: 'future_apply-1' [18:40:47.399] Expression: [18:40:47.399] { [18:40:47.399] do.call(function(...) { [18:40:47.399] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:47.399] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:47.399] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:47.399] on.exit(options(oopts), add = TRUE) [18:40:47.399] } [18:40:47.399] { [18:40:47.399] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:47.399] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:47.399] ...future.FUN(...future.X_jj, ...) [18:40:47.399] }) [18:40:47.399] } [18:40:47.399] }, args = future.call.arguments) [18:40:47.399] } [18:40:47.399] Lazy evaluation: FALSE [18:40:47.399] Asynchronous evaluation: FALSE [18:40:47.399] Local evaluation: TRUE [18:40:47.399] Environment: R_GlobalEnv [18:40:47.399] Capture standard output: TRUE [18:40:47.399] Capture condition classes: 'condition' (excluding 'nothing') [18:40:47.399] Globals: 5 objects totaling 523 bytes (DotDotDotList 'future.call.arguments' of 97 bytes, function '...future.FUN' of 185 bytes, list '...future.elements_ii' of 175 bytes, NULL '...future.seeds_ii' of 27 bytes, numeric '...future.globals.maxSize' of 39 bytes) [18:40:47.399] Packages: [18:40:47.399] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:40:47.399] Resolved: TRUE [18:40:47.399] Value: 175 bytes of class 'list' [18:40:47.399] Early signaling: FALSE [18:40:47.399] Owner process: 2171382a-9202-bc7d-80d6-248e0cb487f4 [18:40:47.399] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:40:47.400] Chunk #1 of 1 ... DONE [18:40:47.400] Launching 1 futures (chunks) ... DONE [18:40:47.401] Resolving 1 futures (chunks) ... [18:40:47.401] resolve() on list ... [18:40:47.401] recursive: 0 [18:40:47.401] length: 1 [18:40:47.401] [18:40:47.402] resolved() for 'SequentialFuture' ... [18:40:47.402] - state: 'finished' [18:40:47.402] - run: TRUE [18:40:47.402] - result: 'FutureResult' [18:40:47.402] resolved() for 'SequentialFuture' ... done [18:40:47.403] Future #1 [18:40:47.403] signalConditionsASAP(SequentialFuture, pos=1) ... [18:40:47.403] - nx: 1 [18:40:47.403] - relay: TRUE [18:40:47.403] - stdout: TRUE [18:40:47.403] - signal: TRUE [18:40:47.404] - resignal: FALSE [18:40:47.404] - force: TRUE [18:40:47.404] - relayed: [n=1] FALSE [18:40:47.404] - queued futures: [n=1] FALSE [18:40:47.404] - until=1 [18:40:47.404] - relaying element #1 [18:40:47.405] - relayed: [n=1] TRUE [18:40:47.405] - queued futures: [n=1] TRUE [18:40:47.405] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:40:47.405] length: 0 (resolved future 1) [18:40:47.406] Relaying remaining futures [18:40:47.406] signalConditionsASAP(NULL, pos=0) ... [18:40:47.406] - nx: 1 [18:40:47.406] - relay: TRUE [18:40:47.406] - stdout: TRUE [18:40:47.406] - signal: TRUE [18:40:47.407] - resignal: FALSE [18:40:47.407] - force: TRUE [18:40:47.407] - relayed: [n=1] TRUE [18:40:47.407] - queued futures: [n=1] TRUE - flush all [18:40:47.407] - relayed: [n=1] TRUE [18:40:47.408] - queued futures: [n=1] TRUE [18:40:47.408] signalConditionsASAP(NULL, pos=0) ... done [18:40:47.408] resolve() on list ... DONE [18:40:47.408] - Number of value chunks collected: 1 [18:40:47.408] Resolving 1 futures (chunks) ... DONE [18:40:47.408] Reducing values from 1 chunks ... [18:40:47.409] - Number of values collected after concatenation: 2 [18:40:47.409] - Number of values expected: 2 [18:40:47.409] Reducing values from 1 chunks ... DONE [18:40:47.409] future_lapply() ... DONE col row x1 x2 [1,] 3 4 [2,] 3 3 [3,] 3 2 [4,] 3 1 [5,] 3 2 [6,] 3 3 [7,] 3 4 [8,] 3 5 [18:40:47.410] getGlobalsAndPackagesXApply() ... [18:40:47.410] - future.globals: TRUE [18:40:47.410] getGlobalsAndPackages() ... [18:40:47.410] Searching for globals... [18:40:47.411] - globals found: [1] 'FUN' [18:40:47.412] Searching for globals ... DONE [18:40:47.412] Resolving globals: FALSE [18:40:47.412] The total size of the 1 globals is 185 bytes (185 bytes) [18:40:47.413] The total size of the 1 globals exported for future expression ('FUN(X = structure(c(3, 3, 3, 3, 3, 3, 3, 3, 4, 3, 2, 1, 2, 3,; 4, 5, 3, 3, 3, 3, 3, 3, 3, 3, 4, 3, 2, 1, 2, 3, 4, 5, 3, 3, 3,; 3, 3, 3, 3, 3, 4, 3, 2, 1, 2, 3, 4, 5), dim = c(8L, 2L, 3L), dimnames = list(; row = NULL, col = c("x1", "x2"), C = c("cop.1", "cop.2",; "cop.3"))))') 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:40:47.413] - globals: [1] 'FUN' [18:40:47.413] [18:40:47.414] getGlobalsAndPackages() ... DONE [18:40:47.414] - globals found/used: [n=1] 'FUN' [18:40:47.414] - needed namespaces: [n=0] [18:40:47.414] Finding globals ... DONE [18:40:47.414] - use_args: TRUE [18:40:47.414] - Getting '...' globals ... [18:40:47.415] resolve() on list ... [18:40:47.415] recursive: 0 [18:40:47.415] length: 1 [18:40:47.415] elements: '...' [18:40:47.416] length: 0 (resolved future 1) [18:40:47.416] resolve() on list ... DONE [18:40:47.416] - '...' content: [n=0] [18:40:47.416] List of 1 [18:40:47.416] $ ...: list() [18:40:47.416] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:47.416] - attr(*, "where")=List of 1 [18:40:47.416] ..$ ...: [18:40:47.416] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:47.416] - attr(*, "resolved")= logi TRUE [18:40:47.416] - attr(*, "total_size")= num NA [18:40:47.419] - Getting '...' globals ... DONE [18:40:47.420] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:40:47.420] List of 2 [18:40:47.420] $ ...future.FUN:function (x) [18:40:47.420] $ ... : list() [18:40:47.420] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:47.420] - attr(*, "where")=List of 2 [18:40:47.420] ..$ ...future.FUN: [18:40:47.420] ..$ ... : [18:40:47.420] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:47.420] - attr(*, "resolved")= logi FALSE [18:40:47.420] - attr(*, "total_size")= int 3563 [18:40:47.424] Packages to be attached in all futures: [n=0] [18:40:47.424] getGlobalsAndPackagesXApply() ... DONE [18:40:47.424] future_lapply() ... [18:40:47.425] Number of chunks: 1 [18:40:47.425] getGlobalsAndPackagesXApply() ... [18:40:47.425] - future.globals: with names 'list()' [18:40:47.426] - use_args: TRUE [18:40:47.426] Globals to be used in all futures (chunks): [n=2] '...', '...future.FUN' [18:40:47.426] List of 2 [18:40:47.426] $ ... : list() [18:40:47.426] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:47.426] $ ...future.FUN:function (x) [18:40:47.426] - attr(*, "where")=List of 2 [18:40:47.426] ..$ ... : [18:40:47.426] ..$ ...future.FUN: [18:40:47.426] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:47.426] - attr(*, "resolved")= logi FALSE [18:40:47.426] - attr(*, "total_size")= num NA [18:40:47.430] Packages to be attached in all futures: [n=0] [18:40:47.431] getGlobalsAndPackagesXApply() ... DONE [18:40:47.431] Number of futures (= number of chunks): 1 [18:40:47.431] Launching 1 futures (chunks) ... [18:40:47.431] Chunk #1 of 1 ... [18:40:47.432] - seeds: [18:40:47.432] - All globals exported: [n=5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:47.432] getGlobalsAndPackages() ... [18:40:47.432] - globals passed as-is: [5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:47.432] Resolving globals: FALSE [18:40:47.433] Tweak future expression to call with '...' arguments ... [18:40:47.433] { [18:40:47.433] do.call(function(...) { [18:40:47.433] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:47.433] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:47.433] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:47.433] on.exit(options(oopts), add = TRUE) [18:40:47.433] } [18:40:47.433] { [18:40:47.433] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:47.433] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:47.433] ...future.FUN(...future.X_jj, ...) [18:40:47.433] }) [18:40:47.433] } [18:40:47.433] }, args = future.call.arguments) [18:40:47.433] } [18:40:47.433] Tweak future expression to call with '...' arguments ... DONE [18:40:47.434] - globals: [5] 'future.call.arguments', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:47.434] [18:40:47.434] getGlobalsAndPackages() ... DONE [18:40:47.435] run() for 'Future' ... [18:40:47.435] - state: 'created' [18:40:47.435] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:40:47.436] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:40:47.436] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:40:47.436] - Field: 'label' [18:40:47.436] - Field: 'local' [18:40:47.437] - Field: 'owner' [18:40:47.437] - Field: 'envir' [18:40:47.437] - Field: 'packages' [18:40:47.437] - Field: 'gc' [18:40:47.437] - Field: 'conditions' [18:40:47.438] - Field: 'expr' [18:40:47.438] - Field: 'uuid' [18:40:47.438] - Field: 'seed' [18:40:47.438] - Field: 'version' [18:40:47.439] - Field: 'result' [18:40:47.439] - Field: 'asynchronous' [18:40:47.439] - Field: 'calls' [18:40:47.439] - Field: 'globals' [18:40:47.439] - Field: 'stdout' [18:40:47.439] - Field: 'earlySignal' [18:40:47.440] - Field: 'lazy' [18:40:47.440] - Field: 'state' [18:40:47.440] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:40:47.440] - Launch lazy future ... [18:40:47.441] Packages needed by the future expression (n = 0): [18:40:47.441] Packages needed by future strategies (n = 0): [18:40:47.441] { [18:40:47.441] { [18:40:47.441] { [18:40:47.441] ...future.startTime <- base::Sys.time() [18:40:47.441] { [18:40:47.441] { [18:40:47.441] { [18:40:47.441] base::local({ [18:40:47.441] has_future <- base::requireNamespace("future", [18:40:47.441] quietly = TRUE) [18:40:47.441] if (has_future) { [18:40:47.441] ns <- base::getNamespace("future") [18:40:47.441] version <- ns[[".package"]][["version"]] [18:40:47.441] if (is.null(version)) [18:40:47.441] version <- utils::packageVersion("future") [18:40:47.441] } [18:40:47.441] else { [18:40:47.441] version <- NULL [18:40:47.441] } [18:40:47.441] if (!has_future || version < "1.8.0") { [18:40:47.441] info <- base::c(r_version = base::gsub("R version ", [18:40:47.441] "", base::R.version$version.string), [18:40:47.441] platform = base::sprintf("%s (%s-bit)", [18:40:47.441] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:40:47.441] os = base::paste(base::Sys.info()[base::c("sysname", [18:40:47.441] "release", "version")], collapse = " "), [18:40:47.441] hostname = base::Sys.info()[["nodename"]]) [18:40:47.441] info <- base::sprintf("%s: %s", base::names(info), [18:40:47.441] info) [18:40:47.441] info <- base::paste(info, collapse = "; ") [18:40:47.441] if (!has_future) { [18:40:47.441] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:40:47.441] info) [18:40:47.441] } [18:40:47.441] else { [18:40:47.441] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:40:47.441] info, version) [18:40:47.441] } [18:40:47.441] base::stop(msg) [18:40:47.441] } [18:40:47.441] }) [18:40:47.441] } [18:40:47.441] ...future.strategy.old <- future::plan("list") [18:40:47.441] options(future.plan = NULL) [18:40:47.441] Sys.unsetenv("R_FUTURE_PLAN") [18:40:47.441] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:40:47.441] } [18:40:47.441] ...future.workdir <- getwd() [18:40:47.441] } [18:40:47.441] ...future.oldOptions <- base::as.list(base::.Options) [18:40:47.441] ...future.oldEnvVars <- base::Sys.getenv() [18:40:47.441] } [18:40:47.441] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:40:47.441] future.globals.maxSize = Inf, future.globals.method = NULL, [18:40:47.441] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:40:47.441] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:40:47.441] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:40:47.441] future.stdout.windows.reencode = NULL, width = 80L) [18:40:47.441] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:40:47.441] base::names(...future.oldOptions)) [18:40:47.441] } [18:40:47.441] if (FALSE) { [18:40:47.441] } [18:40:47.441] else { [18:40:47.441] if (TRUE) { [18:40:47.441] ...future.stdout <- base::rawConnection(base::raw(0L), [18:40:47.441] open = "w") [18:40:47.441] } [18:40:47.441] else { [18:40:47.441] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:40:47.441] windows = "NUL", "/dev/null"), open = "w") [18:40:47.441] } [18:40:47.441] base::sink(...future.stdout, type = "output", split = FALSE) [18:40:47.441] base::on.exit(if (!base::is.null(...future.stdout)) { [18:40:47.441] base::sink(type = "output", split = FALSE) [18:40:47.441] base::close(...future.stdout) [18:40:47.441] }, add = TRUE) [18:40:47.441] } [18:40:47.441] ...future.frame <- base::sys.nframe() [18:40:47.441] ...future.conditions <- base::list() [18:40:47.441] ...future.rng <- base::globalenv()$.Random.seed [18:40:47.441] if (FALSE) { [18:40:47.441] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:40:47.441] "...future.value", "...future.globalenv.names", ".Random.seed") [18:40:47.441] } [18:40:47.441] ...future.result <- base::tryCatch({ [18:40:47.441] base::withCallingHandlers({ [18:40:47.441] ...future.value <- base::withVisible(base::local({ [18:40:47.441] do.call(function(...) { [18:40:47.441] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:47.441] if (!identical(...future.globals.maxSize.org, [18:40:47.441] ...future.globals.maxSize)) { [18:40:47.441] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:47.441] on.exit(options(oopts), add = TRUE) [18:40:47.441] } [18:40:47.441] { [18:40:47.441] lapply(seq_along(...future.elements_ii), [18:40:47.441] FUN = function(jj) { [18:40:47.441] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:47.441] ...future.FUN(...future.X_jj, ...) [18:40:47.441] }) [18:40:47.441] } [18:40:47.441] }, args = future.call.arguments) [18:40:47.441] })) [18:40:47.441] future::FutureResult(value = ...future.value$value, [18:40:47.441] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:40:47.441] ...future.rng), globalenv = if (FALSE) [18:40:47.441] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:40:47.441] ...future.globalenv.names)) [18:40:47.441] else NULL, started = ...future.startTime, version = "1.8") [18:40:47.441] }, condition = base::local({ [18:40:47.441] c <- base::c [18:40:47.441] inherits <- base::inherits [18:40:47.441] invokeRestart <- base::invokeRestart [18:40:47.441] length <- base::length [18:40:47.441] list <- base::list [18:40:47.441] seq.int <- base::seq.int [18:40:47.441] signalCondition <- base::signalCondition [18:40:47.441] sys.calls <- base::sys.calls [18:40:47.441] `[[` <- base::`[[` [18:40:47.441] `+` <- base::`+` [18:40:47.441] `<<-` <- base::`<<-` [18:40:47.441] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:40:47.441] calls[seq.int(from = from + 12L, to = length(calls) - [18:40:47.441] 3L)] [18:40:47.441] } [18:40:47.441] function(cond) { [18:40:47.441] is_error <- inherits(cond, "error") [18:40:47.441] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:40:47.441] NULL) [18:40:47.441] if (is_error) { [18:40:47.441] sessionInformation <- function() { [18:40:47.441] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:40:47.441] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:40:47.441] search = base::search(), system = base::Sys.info()) [18:40:47.441] } [18:40:47.441] ...future.conditions[[length(...future.conditions) + [18:40:47.441] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:40:47.441] cond$call), session = sessionInformation(), [18:40:47.441] timestamp = base::Sys.time(), signaled = 0L) [18:40:47.441] signalCondition(cond) [18:40:47.441] } [18:40:47.441] else if (!ignore && TRUE && inherits(cond, c("condition", [18:40:47.441] "immediateCondition"))) { [18:40:47.441] signal <- TRUE && inherits(cond, "immediateCondition") [18:40:47.441] ...future.conditions[[length(...future.conditions) + [18:40:47.441] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:40:47.441] if (TRUE && !signal) { [18:40:47.441] muffleCondition <- function (cond, pattern = "^muffle") [18:40:47.441] { [18:40:47.441] inherits <- base::inherits [18:40:47.441] invokeRestart <- base::invokeRestart [18:40:47.441] is.null <- base::is.null [18:40:47.441] muffled <- FALSE [18:40:47.441] if (inherits(cond, "message")) { [18:40:47.441] muffled <- grepl(pattern, "muffleMessage") [18:40:47.441] if (muffled) [18:40:47.441] invokeRestart("muffleMessage") [18:40:47.441] } [18:40:47.441] else if (inherits(cond, "warning")) { [18:40:47.441] muffled <- grepl(pattern, "muffleWarning") [18:40:47.441] if (muffled) [18:40:47.441] invokeRestart("muffleWarning") [18:40:47.441] } [18:40:47.441] else if (inherits(cond, "condition")) { [18:40:47.441] if (!is.null(pattern)) { [18:40:47.441] computeRestarts <- base::computeRestarts [18:40:47.441] grepl <- base::grepl [18:40:47.441] restarts <- computeRestarts(cond) [18:40:47.441] for (restart in restarts) { [18:40:47.441] name <- restart$name [18:40:47.441] if (is.null(name)) [18:40:47.441] next [18:40:47.441] if (!grepl(pattern, name)) [18:40:47.441] next [18:40:47.441] invokeRestart(restart) [18:40:47.441] muffled <- TRUE [18:40:47.441] break [18:40:47.441] } [18:40:47.441] } [18:40:47.441] } [18:40:47.441] invisible(muffled) [18:40:47.441] } [18:40:47.441] muffleCondition(cond, pattern = "^muffle") [18:40:47.441] } [18:40:47.441] } [18:40:47.441] else { [18:40:47.441] if (TRUE) { [18:40:47.441] muffleCondition <- function (cond, pattern = "^muffle") [18:40:47.441] { [18:40:47.441] inherits <- base::inherits [18:40:47.441] invokeRestart <- base::invokeRestart [18:40:47.441] is.null <- base::is.null [18:40:47.441] muffled <- FALSE [18:40:47.441] if (inherits(cond, "message")) { [18:40:47.441] muffled <- grepl(pattern, "muffleMessage") [18:40:47.441] if (muffled) [18:40:47.441] invokeRestart("muffleMessage") [18:40:47.441] } [18:40:47.441] else if (inherits(cond, "warning")) { [18:40:47.441] muffled <- grepl(pattern, "muffleWarning") [18:40:47.441] if (muffled) [18:40:47.441] invokeRestart("muffleWarning") [18:40:47.441] } [18:40:47.441] else if (inherits(cond, "condition")) { [18:40:47.441] if (!is.null(pattern)) { [18:40:47.441] computeRestarts <- base::computeRestarts [18:40:47.441] grepl <- base::grepl [18:40:47.441] restarts <- computeRestarts(cond) [18:40:47.441] for (restart in restarts) { [18:40:47.441] name <- restart$name [18:40:47.441] if (is.null(name)) [18:40:47.441] next [18:40:47.441] if (!grepl(pattern, name)) [18:40:47.441] next [18:40:47.441] invokeRestart(restart) [18:40:47.441] muffled <- TRUE [18:40:47.441] break [18:40:47.441] } [18:40:47.441] } [18:40:47.441] } [18:40:47.441] invisible(muffled) [18:40:47.441] } [18:40:47.441] muffleCondition(cond, pattern = "^muffle") [18:40:47.441] } [18:40:47.441] } [18:40:47.441] } [18:40:47.441] })) [18:40:47.441] }, error = function(ex) { [18:40:47.441] base::structure(base::list(value = NULL, visible = NULL, [18:40:47.441] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:40:47.441] ...future.rng), started = ...future.startTime, [18:40:47.441] finished = Sys.time(), session_uuid = NA_character_, [18:40:47.441] version = "1.8"), class = "FutureResult") [18:40:47.441] }, finally = { [18:40:47.441] if (!identical(...future.workdir, getwd())) [18:40:47.441] setwd(...future.workdir) [18:40:47.441] { [18:40:47.441] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:40:47.441] ...future.oldOptions$nwarnings <- NULL [18:40:47.441] } [18:40:47.441] base::options(...future.oldOptions) [18:40:47.441] if (.Platform$OS.type == "windows") { [18:40:47.441] old_names <- names(...future.oldEnvVars) [18:40:47.441] envs <- base::Sys.getenv() [18:40:47.441] names <- names(envs) [18:40:47.441] common <- intersect(names, old_names) [18:40:47.441] added <- setdiff(names, old_names) [18:40:47.441] removed <- setdiff(old_names, names) [18:40:47.441] changed <- common[...future.oldEnvVars[common] != [18:40:47.441] envs[common]] [18:40:47.441] NAMES <- toupper(changed) [18:40:47.441] args <- list() [18:40:47.441] for (kk in seq_along(NAMES)) { [18:40:47.441] name <- changed[[kk]] [18:40:47.441] NAME <- NAMES[[kk]] [18:40:47.441] if (name != NAME && is.element(NAME, old_names)) [18:40:47.441] next [18:40:47.441] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:47.441] } [18:40:47.441] NAMES <- toupper(added) [18:40:47.441] for (kk in seq_along(NAMES)) { [18:40:47.441] name <- added[[kk]] [18:40:47.441] NAME <- NAMES[[kk]] [18:40:47.441] if (name != NAME && is.element(NAME, old_names)) [18:40:47.441] next [18:40:47.441] args[[name]] <- "" [18:40:47.441] } [18:40:47.441] NAMES <- toupper(removed) [18:40:47.441] for (kk in seq_along(NAMES)) { [18:40:47.441] name <- removed[[kk]] [18:40:47.441] NAME <- NAMES[[kk]] [18:40:47.441] if (name != NAME && is.element(NAME, old_names)) [18:40:47.441] next [18:40:47.441] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:47.441] } [18:40:47.441] if (length(args) > 0) [18:40:47.441] base::do.call(base::Sys.setenv, args = args) [18:40:47.441] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:40:47.441] } [18:40:47.441] else { [18:40:47.441] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:40:47.441] } [18:40:47.441] { [18:40:47.441] if (base::length(...future.futureOptionsAdded) > [18:40:47.441] 0L) { [18:40:47.441] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:40:47.441] base::names(opts) <- ...future.futureOptionsAdded [18:40:47.441] base::options(opts) [18:40:47.441] } [18:40:47.441] { [18:40:47.441] { [18:40:47.441] NULL [18:40:47.441] RNGkind("Mersenne-Twister") [18:40:47.441] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:40:47.441] inherits = FALSE) [18:40:47.441] } [18:40:47.441] options(future.plan = NULL) [18:40:47.441] if (is.na(NA_character_)) [18:40:47.441] Sys.unsetenv("R_FUTURE_PLAN") [18:40:47.441] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:40:47.441] future::plan(...future.strategy.old, .cleanup = FALSE, [18:40:47.441] .init = FALSE) [18:40:47.441] } [18:40:47.441] } [18:40:47.441] } [18:40:47.441] }) [18:40:47.441] if (TRUE) { [18:40:47.441] base::sink(type = "output", split = FALSE) [18:40:47.441] if (TRUE) { [18:40:47.441] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:40:47.441] } [18:40:47.441] else { [18:40:47.441] ...future.result["stdout"] <- base::list(NULL) [18:40:47.441] } [18:40:47.441] base::close(...future.stdout) [18:40:47.441] ...future.stdout <- NULL [18:40:47.441] } [18:40:47.441] ...future.result$conditions <- ...future.conditions [18:40:47.441] ...future.result$finished <- base::Sys.time() [18:40:47.441] ...future.result [18:40:47.441] } [18:40:47.446] assign_globals() ... [18:40:47.446] List of 5 [18:40:47.446] $ future.call.arguments : list() [18:40:47.446] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:47.446] $ ...future.FUN :function (x) [18:40:47.446] $ ...future.elements_ii :List of 6 [18:40:47.446] ..$ : num [1:8] 3 3 3 3 3 3 3 3 [18:40:47.446] ..$ : num [1:8] 4 3 2 1 2 3 4 5 [18:40:47.446] ..$ : num [1:8] 3 3 3 3 3 3 3 3 [18:40:47.446] ..$ : num [1:8] 4 3 2 1 2 3 4 5 [18:40:47.446] ..$ : num [1:8] 3 3 3 3 3 3 3 3 [18:40:47.446] ..$ : num [1:8] 4 3 2 1 2 3 4 5 [18:40:47.446] $ ...future.seeds_ii : NULL [18:40:47.446] $ ...future.globals.maxSize: num Inf [18:40:47.446] - attr(*, "resolved")= logi FALSE [18:40:47.446] - attr(*, "total_size")= num NA [18:40:47.446] - attr(*, "where")=List of 5 [18:40:47.446] ..$ future.call.arguments : [18:40:47.446] ..$ ...future.FUN : [18:40:47.446] ..$ ...future.elements_ii : [18:40:47.446] ..$ ...future.seeds_ii : [18:40:47.446] ..$ ...future.globals.maxSize: [18:40:47.446] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:47.446] - attr(*, "already-done")= logi TRUE [18:40:47.455] - copied 'future.call.arguments' to environment [18:40:47.455] - copied '...future.FUN' to environment [18:40:47.456] - copied '...future.elements_ii' to environment [18:40:47.456] - copied '...future.seeds_ii' to environment [18:40:47.456] - copied '...future.globals.maxSize' to environment [18:40:47.456] assign_globals() ... done [18:40:47.457] plan(): Setting new future strategy stack: [18:40:47.457] List of future strategies: [18:40:47.457] 1. sequential: [18:40:47.457] - args: function (..., envir = parent.frame(), workers = "") [18:40:47.457] - tweaked: FALSE [18:40:47.457] - call: NULL [18:40:47.457] plan(): nbrOfWorkers() = 1 [18:40:47.459] plan(): Setting new future strategy stack: [18:40:47.459] List of future strategies: [18:40:47.459] 1. sequential: [18:40:47.459] - args: function (..., envir = parent.frame(), workers = "") [18:40:47.459] - tweaked: FALSE [18:40:47.459] - call: plan(strategy) [18:40:47.460] plan(): nbrOfWorkers() = 1 [18:40:47.460] SequentialFuture started (and completed) [18:40:47.460] - Launch lazy future ... done [18:40:47.460] run() for 'SequentialFuture' ... done [18:40:47.461] Created future: [18:40:47.461] SequentialFuture: [18:40:47.461] Label: 'future_apply-1' [18:40:47.461] Expression: [18:40:47.461] { [18:40:47.461] do.call(function(...) { [18:40:47.461] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:47.461] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:47.461] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:47.461] on.exit(options(oopts), add = TRUE) [18:40:47.461] } [18:40:47.461] { [18:40:47.461] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:47.461] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:47.461] ...future.FUN(...future.X_jj, ...) [18:40:47.461] }) [18:40:47.461] } [18:40:47.461] }, args = future.call.arguments) [18:40:47.461] } [18:40:47.461] Lazy evaluation: FALSE [18:40:47.461] Asynchronous evaluation: FALSE [18:40:47.461] Local evaluation: TRUE [18:40:47.461] Environment: R_GlobalEnv [18:40:47.461] Capture standard output: TRUE [18:40:47.461] Capture condition classes: 'condition' (excluding 'nothing') [18:40:47.461] Globals: 5 objects totaling 811 bytes (DotDotDotList 'future.call.arguments' of 97 bytes, function '...future.FUN' of 185 bytes, list '...future.elements_ii' of 463 bytes, NULL '...future.seeds_ii' of 27 bytes, numeric '...future.globals.maxSize' of 39 bytes) [18:40:47.461] Packages: [18:40:47.461] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:40:47.461] Resolved: TRUE [18:40:47.461] Value: 463 bytes of class 'list' [18:40:47.461] Early signaling: FALSE [18:40:47.461] Owner process: 2171382a-9202-bc7d-80d6-248e0cb487f4 [18:40:47.461] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:40:47.462] Chunk #1 of 1 ... DONE [18:40:47.462] Launching 1 futures (chunks) ... DONE [18:40:47.463] Resolving 1 futures (chunks) ... [18:40:47.463] resolve() on list ... [18:40:47.463] recursive: 0 [18:40:47.463] length: 1 [18:40:47.463] [18:40:47.463] resolved() for 'SequentialFuture' ... [18:40:47.464] - state: 'finished' [18:40:47.464] - run: TRUE [18:40:47.464] - result: 'FutureResult' [18:40:47.464] resolved() for 'SequentialFuture' ... done [18:40:47.464] Future #1 [18:40:47.465] signalConditionsASAP(SequentialFuture, pos=1) ... [18:40:47.465] - nx: 1 [18:40:47.465] - relay: TRUE [18:40:47.465] - stdout: TRUE [18:40:47.465] - signal: TRUE [18:40:47.466] - resignal: FALSE [18:40:47.466] - force: TRUE [18:40:47.466] - relayed: [n=1] FALSE [18:40:47.466] - queued futures: [n=1] FALSE [18:40:47.466] - until=1 [18:40:47.467] - relaying element #1 [18:40:47.467] - relayed: [n=1] TRUE [18:40:47.467] - queued futures: [n=1] TRUE [18:40:47.467] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:40:47.467] length: 0 (resolved future 1) [18:40:47.468] Relaying remaining futures [18:40:47.468] signalConditionsASAP(NULL, pos=0) ... [18:40:47.468] - nx: 1 [18:40:47.468] - relay: TRUE [18:40:47.468] - stdout: TRUE [18:40:47.468] - signal: TRUE [18:40:47.469] - resignal: FALSE [18:40:47.469] - force: TRUE [18:40:47.469] - relayed: [n=1] TRUE [18:40:47.469] - queued futures: [n=1] TRUE - flush all [18:40:47.469] - relayed: [n=1] TRUE [18:40:47.470] - queued futures: [n=1] TRUE [18:40:47.470] signalConditionsASAP(NULL, pos=0) ... done [18:40:47.470] resolve() on list ... DONE [18:40:47.470] - Number of value chunks collected: 1 [18:40:47.470] Resolving 1 futures (chunks) ... DONE [18:40:47.471] Reducing values from 1 chunks ... [18:40:47.471] - Number of values collected after concatenation: 6 [18:40:47.471] - Number of values expected: 6 [18:40:47.471] Reducing values from 1 chunks ... DONE [18:40:47.471] future_lapply() ... DONE , , C = cop.1 col row x1 x2 [1,] 3 4 [2,] 3 3 [3,] 3 2 [4,] 3 1 [5,] 3 2 [6,] 3 3 [7,] 3 4 [8,] 3 5 , , C = cop.2 col row x1 x2 [1,] 3 4 [2,] 3 3 [3,] 3 2 [4,] 3 1 [5,] 3 2 [6,] 3 3 [7,] 3 4 [8,] 3 5 , , C = cop.3 col row x1 x2 [1,] 3 4 [2,] 3 3 [3,] 3 2 [4,] 3 1 [5,] 3 2 [6,] 3 3 [7,] 3 4 [8,] 3 5 [18:40:47.472] getGlobalsAndPackagesXApply() ... [18:40:47.472] - future.globals: TRUE [18:40:47.472] getGlobalsAndPackages() ... [18:40:47.472] Searching for globals... [18:40:47.474] - globals found: [3] 'FUN', 'seq_len', 'max' [18:40:47.474] Searching for globals ... DONE [18:40:47.475] Resolving globals: FALSE [18:40:47.475] The total size of the 1 globals is 411 bytes (411 bytes) [18:40:47.476] The total size of the 1 globals exported for future expression ('FUN(X = structure(1:24, dim = 2:4))') is 411 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (411 bytes of class 'function') [18:40:47.476] - globals: [1] 'FUN' [18:40:47.476] [18:40:47.476] getGlobalsAndPackages() ... DONE [18:40:47.476] - globals found/used: [n=1] 'FUN' [18:40:47.477] - needed namespaces: [n=0] [18:40:47.477] Finding globals ... DONE [18:40:47.477] - use_args: TRUE [18:40:47.477] - Getting '...' globals ... [18:40:47.478] resolve() on list ... [18:40:47.478] recursive: 0 [18:40:47.478] length: 1 [18:40:47.478] elements: '...' [18:40:47.479] length: 0 (resolved future 1) [18:40:47.479] resolve() on list ... DONE [18:40:47.479] - '...' content: [n=0] [18:40:47.479] List of 1 [18:40:47.479] $ ...: list() [18:40:47.479] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:47.479] - attr(*, "where")=List of 1 [18:40:47.479] ..$ ...: [18:40:47.479] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:47.479] - attr(*, "resolved")= logi TRUE [18:40:47.479] - attr(*, "total_size")= num NA [18:40:47.482] - Getting '...' globals ... DONE [18:40:47.483] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:40:47.483] List of 2 [18:40:47.483] $ ...future.FUN:function (x) [18:40:47.483] $ ... : list() [18:40:47.483] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:47.483] - attr(*, "where")=List of 2 [18:40:47.483] ..$ ...future.FUN: [18:40:47.483] ..$ ... : [18:40:47.483] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:47.483] - attr(*, "resolved")= logi FALSE [18:40:47.483] - attr(*, "total_size")= int 3672 [18:40:47.487] Packages to be attached in all futures: [n=0] [18:40:47.487] getGlobalsAndPackagesXApply() ... DONE [18:40:47.487] future_lapply() ... [18:40:47.490] Number of chunks: 1 [18:40:47.490] getGlobalsAndPackagesXApply() ... [18:40:47.490] - future.globals: with names 'list()' [18:40:47.490] - use_args: TRUE [18:40:47.491] Globals to be used in all futures (chunks): [n=2] '...', '...future.FUN' [18:40:47.491] List of 2 [18:40:47.491] $ ... : list() [18:40:47.491] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:47.491] $ ...future.FUN:function (x) [18:40:47.491] - attr(*, "where")=List of 2 [18:40:47.491] ..$ ... : [18:40:47.491] ..$ ...future.FUN: [18:40:47.491] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:47.491] - attr(*, "resolved")= logi FALSE [18:40:47.491] - attr(*, "total_size")= num NA [18:40:47.494] Packages to be attached in all futures: [n=0] [18:40:47.494] getGlobalsAndPackagesXApply() ... DONE [18:40:47.494] Number of futures (= number of chunks): 1 [18:40:47.495] Launching 1 futures (chunks) ... [18:40:47.495] Chunk #1 of 1 ... [18:40:47.495] - seeds: [18:40:47.495] - All globals exported: [n=5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:47.495] getGlobalsAndPackages() ... [18:40:47.495] - globals passed as-is: [5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:47.496] Resolving globals: FALSE [18:40:47.496] Tweak future expression to call with '...' arguments ... [18:40:47.496] { [18:40:47.496] do.call(function(...) { [18:40:47.496] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:47.496] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:47.496] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:47.496] on.exit(options(oopts), add = TRUE) [18:40:47.496] } [18:40:47.496] { [18:40:47.496] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:47.496] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:47.496] ...future.FUN(...future.X_jj, ...) [18:40:47.496] }) [18:40:47.496] } [18:40:47.496] }, args = future.call.arguments) [18:40:47.496] } [18:40:47.496] Tweak future expression to call with '...' arguments ... DONE [18:40:47.497] - globals: [5] 'future.call.arguments', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:47.497] [18:40:47.497] getGlobalsAndPackages() ... DONE [18:40:47.498] run() for 'Future' ... [18:40:47.498] - state: 'created' [18:40:47.498] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:40:47.499] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:40:47.499] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:40:47.499] - Field: 'label' [18:40:47.499] - Field: 'local' [18:40:47.499] - Field: 'owner' [18:40:47.500] - Field: 'envir' [18:40:47.500] - Field: 'packages' [18:40:47.500] - Field: 'gc' [18:40:47.500] - Field: 'conditions' [18:40:47.500] - Field: 'expr' [18:40:47.500] - Field: 'uuid' [18:40:47.501] - Field: 'seed' [18:40:47.501] - Field: 'version' [18:40:47.501] - Field: 'result' [18:40:47.501] - Field: 'asynchronous' [18:40:47.501] - Field: 'calls' [18:40:47.501] - Field: 'globals' [18:40:47.502] - Field: 'stdout' [18:40:47.502] - Field: 'earlySignal' [18:40:47.502] - Field: 'lazy' [18:40:47.502] - Field: 'state' [18:40:47.502] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:40:47.502] - Launch lazy future ... [18:40:47.503] Packages needed by the future expression (n = 0): [18:40:47.503] Packages needed by future strategies (n = 0): [18:40:47.503] { [18:40:47.503] { [18:40:47.503] { [18:40:47.503] ...future.startTime <- base::Sys.time() [18:40:47.503] { [18:40:47.503] { [18:40:47.503] { [18:40:47.503] base::local({ [18:40:47.503] has_future <- base::requireNamespace("future", [18:40:47.503] quietly = TRUE) [18:40:47.503] if (has_future) { [18:40:47.503] ns <- base::getNamespace("future") [18:40:47.503] version <- ns[[".package"]][["version"]] [18:40:47.503] if (is.null(version)) [18:40:47.503] version <- utils::packageVersion("future") [18:40:47.503] } [18:40:47.503] else { [18:40:47.503] version <- NULL [18:40:47.503] } [18:40:47.503] if (!has_future || version < "1.8.0") { [18:40:47.503] info <- base::c(r_version = base::gsub("R version ", [18:40:47.503] "", base::R.version$version.string), [18:40:47.503] platform = base::sprintf("%s (%s-bit)", [18:40:47.503] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:40:47.503] os = base::paste(base::Sys.info()[base::c("sysname", [18:40:47.503] "release", "version")], collapse = " "), [18:40:47.503] hostname = base::Sys.info()[["nodename"]]) [18:40:47.503] info <- base::sprintf("%s: %s", base::names(info), [18:40:47.503] info) [18:40:47.503] info <- base::paste(info, collapse = "; ") [18:40:47.503] if (!has_future) { [18:40:47.503] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:40:47.503] info) [18:40:47.503] } [18:40:47.503] else { [18:40:47.503] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:40:47.503] info, version) [18:40:47.503] } [18:40:47.503] base::stop(msg) [18:40:47.503] } [18:40:47.503] }) [18:40:47.503] } [18:40:47.503] ...future.strategy.old <- future::plan("list") [18:40:47.503] options(future.plan = NULL) [18:40:47.503] Sys.unsetenv("R_FUTURE_PLAN") [18:40:47.503] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:40:47.503] } [18:40:47.503] ...future.workdir <- getwd() [18:40:47.503] } [18:40:47.503] ...future.oldOptions <- base::as.list(base::.Options) [18:40:47.503] ...future.oldEnvVars <- base::Sys.getenv() [18:40:47.503] } [18:40:47.503] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:40:47.503] future.globals.maxSize = Inf, future.globals.method = NULL, [18:40:47.503] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:40:47.503] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:40:47.503] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:40:47.503] future.stdout.windows.reencode = NULL, width = 80L) [18:40:47.503] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:40:47.503] base::names(...future.oldOptions)) [18:40:47.503] } [18:40:47.503] if (FALSE) { [18:40:47.503] } [18:40:47.503] else { [18:40:47.503] if (TRUE) { [18:40:47.503] ...future.stdout <- base::rawConnection(base::raw(0L), [18:40:47.503] open = "w") [18:40:47.503] } [18:40:47.503] else { [18:40:47.503] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:40:47.503] windows = "NUL", "/dev/null"), open = "w") [18:40:47.503] } [18:40:47.503] base::sink(...future.stdout, type = "output", split = FALSE) [18:40:47.503] base::on.exit(if (!base::is.null(...future.stdout)) { [18:40:47.503] base::sink(type = "output", split = FALSE) [18:40:47.503] base::close(...future.stdout) [18:40:47.503] }, add = TRUE) [18:40:47.503] } [18:40:47.503] ...future.frame <- base::sys.nframe() [18:40:47.503] ...future.conditions <- base::list() [18:40:47.503] ...future.rng <- base::globalenv()$.Random.seed [18:40:47.503] if (FALSE) { [18:40:47.503] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:40:47.503] "...future.value", "...future.globalenv.names", ".Random.seed") [18:40:47.503] } [18:40:47.503] ...future.result <- base::tryCatch({ [18:40:47.503] base::withCallingHandlers({ [18:40:47.503] ...future.value <- base::withVisible(base::local({ [18:40:47.503] do.call(function(...) { [18:40:47.503] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:47.503] if (!identical(...future.globals.maxSize.org, [18:40:47.503] ...future.globals.maxSize)) { [18:40:47.503] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:47.503] on.exit(options(oopts), add = TRUE) [18:40:47.503] } [18:40:47.503] { [18:40:47.503] lapply(seq_along(...future.elements_ii), [18:40:47.503] FUN = function(jj) { [18:40:47.503] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:47.503] ...future.FUN(...future.X_jj, ...) [18:40:47.503] }) [18:40:47.503] } [18:40:47.503] }, args = future.call.arguments) [18:40:47.503] })) [18:40:47.503] future::FutureResult(value = ...future.value$value, [18:40:47.503] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:40:47.503] ...future.rng), globalenv = if (FALSE) [18:40:47.503] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:40:47.503] ...future.globalenv.names)) [18:40:47.503] else NULL, started = ...future.startTime, version = "1.8") [18:40:47.503] }, condition = base::local({ [18:40:47.503] c <- base::c [18:40:47.503] inherits <- base::inherits [18:40:47.503] invokeRestart <- base::invokeRestart [18:40:47.503] length <- base::length [18:40:47.503] list <- base::list [18:40:47.503] seq.int <- base::seq.int [18:40:47.503] signalCondition <- base::signalCondition [18:40:47.503] sys.calls <- base::sys.calls [18:40:47.503] `[[` <- base::`[[` [18:40:47.503] `+` <- base::`+` [18:40:47.503] `<<-` <- base::`<<-` [18:40:47.503] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:40:47.503] calls[seq.int(from = from + 12L, to = length(calls) - [18:40:47.503] 3L)] [18:40:47.503] } [18:40:47.503] function(cond) { [18:40:47.503] is_error <- inherits(cond, "error") [18:40:47.503] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:40:47.503] NULL) [18:40:47.503] if (is_error) { [18:40:47.503] sessionInformation <- function() { [18:40:47.503] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:40:47.503] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:40:47.503] search = base::search(), system = base::Sys.info()) [18:40:47.503] } [18:40:47.503] ...future.conditions[[length(...future.conditions) + [18:40:47.503] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:40:47.503] cond$call), session = sessionInformation(), [18:40:47.503] timestamp = base::Sys.time(), signaled = 0L) [18:40:47.503] signalCondition(cond) [18:40:47.503] } [18:40:47.503] else if (!ignore && TRUE && inherits(cond, c("condition", [18:40:47.503] "immediateCondition"))) { [18:40:47.503] signal <- TRUE && inherits(cond, "immediateCondition") [18:40:47.503] ...future.conditions[[length(...future.conditions) + [18:40:47.503] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:40:47.503] if (TRUE && !signal) { [18:40:47.503] muffleCondition <- function (cond, pattern = "^muffle") [18:40:47.503] { [18:40:47.503] inherits <- base::inherits [18:40:47.503] invokeRestart <- base::invokeRestart [18:40:47.503] is.null <- base::is.null [18:40:47.503] muffled <- FALSE [18:40:47.503] if (inherits(cond, "message")) { [18:40:47.503] muffled <- grepl(pattern, "muffleMessage") [18:40:47.503] if (muffled) [18:40:47.503] invokeRestart("muffleMessage") [18:40:47.503] } [18:40:47.503] else if (inherits(cond, "warning")) { [18:40:47.503] muffled <- grepl(pattern, "muffleWarning") [18:40:47.503] if (muffled) [18:40:47.503] invokeRestart("muffleWarning") [18:40:47.503] } [18:40:47.503] else if (inherits(cond, "condition")) { [18:40:47.503] if (!is.null(pattern)) { [18:40:47.503] computeRestarts <- base::computeRestarts [18:40:47.503] grepl <- base::grepl [18:40:47.503] restarts <- computeRestarts(cond) [18:40:47.503] for (restart in restarts) { [18:40:47.503] name <- restart$name [18:40:47.503] if (is.null(name)) [18:40:47.503] next [18:40:47.503] if (!grepl(pattern, name)) [18:40:47.503] next [18:40:47.503] invokeRestart(restart) [18:40:47.503] muffled <- TRUE [18:40:47.503] break [18:40:47.503] } [18:40:47.503] } [18:40:47.503] } [18:40:47.503] invisible(muffled) [18:40:47.503] } [18:40:47.503] muffleCondition(cond, pattern = "^muffle") [18:40:47.503] } [18:40:47.503] } [18:40:47.503] else { [18:40:47.503] if (TRUE) { [18:40:47.503] muffleCondition <- function (cond, pattern = "^muffle") [18:40:47.503] { [18:40:47.503] inherits <- base::inherits [18:40:47.503] invokeRestart <- base::invokeRestart [18:40:47.503] is.null <- base::is.null [18:40:47.503] muffled <- FALSE [18:40:47.503] if (inherits(cond, "message")) { [18:40:47.503] muffled <- grepl(pattern, "muffleMessage") [18:40:47.503] if (muffled) [18:40:47.503] invokeRestart("muffleMessage") [18:40:47.503] } [18:40:47.503] else if (inherits(cond, "warning")) { [18:40:47.503] muffled <- grepl(pattern, "muffleWarning") [18:40:47.503] if (muffled) [18:40:47.503] invokeRestart("muffleWarning") [18:40:47.503] } [18:40:47.503] else if (inherits(cond, "condition")) { [18:40:47.503] if (!is.null(pattern)) { [18:40:47.503] computeRestarts <- base::computeRestarts [18:40:47.503] grepl <- base::grepl [18:40:47.503] restarts <- computeRestarts(cond) [18:40:47.503] for (restart in restarts) { [18:40:47.503] name <- restart$name [18:40:47.503] if (is.null(name)) [18:40:47.503] next [18:40:47.503] if (!grepl(pattern, name)) [18:40:47.503] next [18:40:47.503] invokeRestart(restart) [18:40:47.503] muffled <- TRUE [18:40:47.503] break [18:40:47.503] } [18:40:47.503] } [18:40:47.503] } [18:40:47.503] invisible(muffled) [18:40:47.503] } [18:40:47.503] muffleCondition(cond, pattern = "^muffle") [18:40:47.503] } [18:40:47.503] } [18:40:47.503] } [18:40:47.503] })) [18:40:47.503] }, error = function(ex) { [18:40:47.503] base::structure(base::list(value = NULL, visible = NULL, [18:40:47.503] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:40:47.503] ...future.rng), started = ...future.startTime, [18:40:47.503] finished = Sys.time(), session_uuid = NA_character_, [18:40:47.503] version = "1.8"), class = "FutureResult") [18:40:47.503] }, finally = { [18:40:47.503] if (!identical(...future.workdir, getwd())) [18:40:47.503] setwd(...future.workdir) [18:40:47.503] { [18:40:47.503] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:40:47.503] ...future.oldOptions$nwarnings <- NULL [18:40:47.503] } [18:40:47.503] base::options(...future.oldOptions) [18:40:47.503] if (.Platform$OS.type == "windows") { [18:40:47.503] old_names <- names(...future.oldEnvVars) [18:40:47.503] envs <- base::Sys.getenv() [18:40:47.503] names <- names(envs) [18:40:47.503] common <- intersect(names, old_names) [18:40:47.503] added <- setdiff(names, old_names) [18:40:47.503] removed <- setdiff(old_names, names) [18:40:47.503] changed <- common[...future.oldEnvVars[common] != [18:40:47.503] envs[common]] [18:40:47.503] NAMES <- toupper(changed) [18:40:47.503] args <- list() [18:40:47.503] for (kk in seq_along(NAMES)) { [18:40:47.503] name <- changed[[kk]] [18:40:47.503] NAME <- NAMES[[kk]] [18:40:47.503] if (name != NAME && is.element(NAME, old_names)) [18:40:47.503] next [18:40:47.503] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:47.503] } [18:40:47.503] NAMES <- toupper(added) [18:40:47.503] for (kk in seq_along(NAMES)) { [18:40:47.503] name <- added[[kk]] [18:40:47.503] NAME <- NAMES[[kk]] [18:40:47.503] if (name != NAME && is.element(NAME, old_names)) [18:40:47.503] next [18:40:47.503] args[[name]] <- "" [18:40:47.503] } [18:40:47.503] NAMES <- toupper(removed) [18:40:47.503] for (kk in seq_along(NAMES)) { [18:40:47.503] name <- removed[[kk]] [18:40:47.503] NAME <- NAMES[[kk]] [18:40:47.503] if (name != NAME && is.element(NAME, old_names)) [18:40:47.503] next [18:40:47.503] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:47.503] } [18:40:47.503] if (length(args) > 0) [18:40:47.503] base::do.call(base::Sys.setenv, args = args) [18:40:47.503] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:40:47.503] } [18:40:47.503] else { [18:40:47.503] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:40:47.503] } [18:40:47.503] { [18:40:47.503] if (base::length(...future.futureOptionsAdded) > [18:40:47.503] 0L) { [18:40:47.503] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:40:47.503] base::names(opts) <- ...future.futureOptionsAdded [18:40:47.503] base::options(opts) [18:40:47.503] } [18:40:47.503] { [18:40:47.503] { [18:40:47.503] NULL [18:40:47.503] RNGkind("Mersenne-Twister") [18:40:47.503] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:40:47.503] inherits = FALSE) [18:40:47.503] } [18:40:47.503] options(future.plan = NULL) [18:40:47.503] if (is.na(NA_character_)) [18:40:47.503] Sys.unsetenv("R_FUTURE_PLAN") [18:40:47.503] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:40:47.503] future::plan(...future.strategy.old, .cleanup = FALSE, [18:40:47.503] .init = FALSE) [18:40:47.503] } [18:40:47.503] } [18:40:47.503] } [18:40:47.503] }) [18:40:47.503] if (TRUE) { [18:40:47.503] base::sink(type = "output", split = FALSE) [18:40:47.503] if (TRUE) { [18:40:47.503] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:40:47.503] } [18:40:47.503] else { [18:40:47.503] ...future.result["stdout"] <- base::list(NULL) [18:40:47.503] } [18:40:47.503] base::close(...future.stdout) [18:40:47.503] ...future.stdout <- NULL [18:40:47.503] } [18:40:47.503] ...future.result$conditions <- ...future.conditions [18:40:47.503] ...future.result$finished <- base::Sys.time() [18:40:47.503] ...future.result [18:40:47.503] } [18:40:47.507] assign_globals() ... [18:40:47.507] List of 5 [18:40:47.507] $ future.call.arguments : list() [18:40:47.507] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:47.507] $ ...future.FUN :function (x) [18:40:47.507] $ ...future.elements_ii :List of 6 [18:40:47.507] ..$ : int [1:4] 1 7 13 19 [18:40:47.507] ..$ : int [1:4] 2 8 14 20 [18:40:47.507] ..$ : int [1:4] 3 9 15 21 [18:40:47.507] ..$ : int [1:4] 4 10 16 22 [18:40:47.507] ..$ : int [1:4] 5 11 17 23 [18:40:47.507] ..$ : int [1:4] 6 12 18 24 [18:40:47.507] $ ...future.seeds_ii : NULL [18:40:47.507] $ ...future.globals.maxSize: num Inf [18:40:47.507] - attr(*, "resolved")= logi FALSE [18:40:47.507] - attr(*, "total_size")= num NA [18:40:47.507] - attr(*, "where")=List of 5 [18:40:47.507] ..$ future.call.arguments : [18:40:47.507] ..$ ...future.FUN : [18:40:47.507] ..$ ...future.elements_ii : [18:40:47.507] ..$ ...future.seeds_ii : [18:40:47.507] ..$ ...future.globals.maxSize: [18:40:47.507] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:47.507] - attr(*, "already-done")= logi TRUE [18:40:47.515] - copied 'future.call.arguments' to environment [18:40:47.515] - reassign environment for '...future.FUN' [18:40:47.515] - copied '...future.FUN' to environment [18:40:47.515] - copied '...future.elements_ii' to environment [18:40:47.515] - copied '...future.seeds_ii' to environment [18:40:47.515] - copied '...future.globals.maxSize' to environment [18:40:47.516] assign_globals() ... done [18:40:47.516] plan(): Setting new future strategy stack: [18:40:47.516] List of future strategies: [18:40:47.516] 1. sequential: [18:40:47.516] - args: function (..., envir = parent.frame(), workers = "") [18:40:47.516] - tweaked: FALSE [18:40:47.516] - call: NULL [18:40:47.517] plan(): nbrOfWorkers() = 1 [18:40:47.518] plan(): Setting new future strategy stack: [18:40:47.518] List of future strategies: [18:40:47.518] 1. sequential: [18:40:47.518] - args: function (..., envir = parent.frame(), workers = "") [18:40:47.518] - tweaked: FALSE [18:40:47.518] - call: plan(strategy) [18:40:47.519] plan(): nbrOfWorkers() = 1 [18:40:47.519] SequentialFuture started (and completed) [18:40:47.519] - Launch lazy future ... done [18:40:47.519] run() for 'SequentialFuture' ... done [18:40:47.519] Created future: [18:40:47.520] SequentialFuture: [18:40:47.520] Label: 'future_apply-1' [18:40:47.520] Expression: [18:40:47.520] { [18:40:47.520] do.call(function(...) { [18:40:47.520] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:47.520] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:47.520] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:47.520] on.exit(options(oopts), add = TRUE) [18:40:47.520] } [18:40:47.520] { [18:40:47.520] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:47.520] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:47.520] ...future.FUN(...future.X_jj, ...) [18:40:47.520] }) [18:40:47.520] } [18:40:47.520] }, args = future.call.arguments) [18:40:47.520] } [18:40:47.520] Lazy evaluation: FALSE [18:40:47.520] Asynchronous evaluation: FALSE [18:40:47.520] Local evaluation: TRUE [18:40:47.520] Environment: R_GlobalEnv [18:40:47.520] Capture standard output: TRUE [18:40:47.520] Capture condition classes: 'condition' (excluding 'nothing') [18:40:47.520] Globals: 5 objects totaling 749 bytes (DotDotDotList 'future.call.arguments' of 97 bytes, function '...future.FUN' of 411 bytes, list '...future.elements_ii' of 175 bytes, NULL '...future.seeds_ii' of 27 bytes, numeric '...future.globals.maxSize' of 39 bytes) [18:40:47.520] Packages: [18:40:47.520] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:40:47.520] Resolved: TRUE [18:40:47.520] Value: 521 bytes of class 'list' [18:40:47.520] Early signaling: FALSE [18:40:47.520] Owner process: 2171382a-9202-bc7d-80d6-248e0cb487f4 [18:40:47.520] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:40:47.521] Chunk #1 of 1 ... DONE [18:40:47.521] Launching 1 futures (chunks) ... DONE [18:40:47.521] Resolving 1 futures (chunks) ... [18:40:47.522] resolve() on list ... [18:40:47.522] recursive: 0 [18:40:47.522] length: 1 [18:40:47.522] [18:40:47.522] resolved() for 'SequentialFuture' ... [18:40:47.523] - state: 'finished' [18:40:47.523] - run: TRUE [18:40:47.523] - result: 'FutureResult' [18:40:47.523] resolved() for 'SequentialFuture' ... done [18:40:47.524] Future #1 [18:40:47.524] signalConditionsASAP(SequentialFuture, pos=1) ... [18:40:47.524] - nx: 1 [18:40:47.524] - relay: TRUE [18:40:47.524] - stdout: TRUE [18:40:47.524] - signal: TRUE [18:40:47.524] - resignal: FALSE [18:40:47.525] - force: TRUE [18:40:47.525] - relayed: [n=1] FALSE [18:40:47.525] - queued futures: [n=1] FALSE [18:40:47.525] - until=1 [18:40:47.525] - relaying element #1 [18:40:47.525] - relayed: [n=1] TRUE [18:40:47.526] - queued futures: [n=1] TRUE [18:40:47.526] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:40:47.526] length: 0 (resolved future 1) [18:40:47.526] Relaying remaining futures [18:40:47.526] signalConditionsASAP(NULL, pos=0) ... [18:40:47.526] - nx: 1 [18:40:47.527] - relay: TRUE [18:40:47.527] - stdout: TRUE [18:40:47.527] - signal: TRUE [18:40:47.527] - resignal: FALSE [18:40:47.527] - force: TRUE [18:40:47.527] - relayed: [n=1] TRUE [18:40:47.528] - queued futures: [n=1] TRUE - flush all [18:40:47.528] - relayed: [n=1] TRUE [18:40:47.528] - queued futures: [n=1] TRUE [18:40:47.528] signalConditionsASAP(NULL, pos=0) ... done [18:40:47.528] resolve() on list ... DONE [18:40:47.529] - Number of value chunks collected: 1 [18:40:47.529] Resolving 1 futures (chunks) ... DONE [18:40:47.529] Reducing values from 1 chunks ... [18:40:47.529] - Number of values collected after concatenation: 6 [18:40:47.529] - Number of values expected: 6 [18:40:47.529] Reducing values from 1 chunks ... DONE [18:40:47.529] future_lapply() ... DONE [,1] [,2] [,3] [1,] integer,19 integer,21 integer,23 [2,] integer,20 integer,22 integer,24 - apply(X, MARGIN = , ...) ... [18:40:47.530] getGlobalsAndPackagesXApply() ... [18:40:47.530] - future.globals: TRUE [18:40:47.530] getGlobalsAndPackages() ... [18:40:47.531] Searching for globals... [18:40:47.532] - globals found: [1] 'FUN' [18:40:47.532] Searching for globals ... DONE [18:40:47.532] Resolving globals: FALSE [18:40:47.533] The total size of the 1 globals is 185 bytes (185 bytes) [18:40:47.533] The total size of the 1 globals exported for future expression ('FUN(X = structure(1:2, dim = 2:1, dimnames = list(rows = c("a",; "b"), NULL)))') 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:40:47.533] - globals: [1] 'FUN' [18:40:47.533] [18:40:47.534] getGlobalsAndPackages() ... DONE [18:40:47.534] - globals found/used: [n=1] 'FUN' [18:40:47.534] - needed namespaces: [n=0] [18:40:47.534] Finding globals ... DONE [18:40:47.534] - use_args: TRUE [18:40:47.534] - Getting '...' globals ... [18:40:47.535] resolve() on list ... [18:40:47.535] recursive: 0 [18:40:47.535] length: 1 [18:40:47.535] elements: '...' [18:40:47.535] length: 0 (resolved future 1) [18:40:47.536] resolve() on list ... DONE [18:40:47.536] - '...' content: [n=0] [18:40:47.536] List of 1 [18:40:47.536] $ ...: list() [18:40:47.536] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:47.536] - attr(*, "where")=List of 1 [18:40:47.536] ..$ ...: [18:40:47.536] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:47.536] - attr(*, "resolved")= logi TRUE [18:40:47.536] - attr(*, "total_size")= num NA [18:40:47.539] - Getting '...' globals ... DONE [18:40:47.539] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:40:47.539] List of 2 [18:40:47.539] $ ...future.FUN:function (x) [18:40:47.539] $ ... : list() [18:40:47.539] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:47.539] - attr(*, "where")=List of 2 [18:40:47.539] ..$ ...future.FUN: [18:40:47.539] ..$ ... : [18:40:47.539] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:47.539] - attr(*, "resolved")= logi FALSE [18:40:47.539] - attr(*, "total_size")= int 2547 [18:40:47.542] Packages to be attached in all futures: [n=0] [18:40:47.542] getGlobalsAndPackagesXApply() ... DONE [18:40:47.543] future_lapply() ... [18:40:47.543] Number of chunks: 1 [18:40:47.543] getGlobalsAndPackagesXApply() ... [18:40:47.544] - future.globals: with names 'list()' [18:40:47.544] - use_args: TRUE [18:40:47.544] Globals to be used in all futures (chunks): [n=2] '...', '...future.FUN' [18:40:47.544] List of 2 [18:40:47.544] $ ... : list() [18:40:47.544] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:47.544] $ ...future.FUN:function (x) [18:40:47.544] - attr(*, "where")=List of 2 [18:40:47.544] ..$ ... : [18:40:47.544] ..$ ...future.FUN: [18:40:47.544] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:47.544] - attr(*, "resolved")= logi FALSE [18:40:47.544] - attr(*, "total_size")= num NA [18:40:47.548] Packages to be attached in all futures: [n=0] [18:40:47.548] getGlobalsAndPackagesXApply() ... DONE [18:40:47.549] Number of futures (= number of chunks): 1 [18:40:47.549] Launching 1 futures (chunks) ... [18:40:47.549] Chunk #1 of 1 ... [18:40:47.549] - seeds: [18:40:47.549] - All globals exported: [n=5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:47.549] getGlobalsAndPackages() ... [18:40:47.550] - globals passed as-is: [5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:47.550] Resolving globals: FALSE [18:40:47.550] Tweak future expression to call with '...' arguments ... [18:40:47.550] { [18:40:47.550] do.call(function(...) { [18:40:47.550] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:47.550] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:47.550] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:47.550] on.exit(options(oopts), add = TRUE) [18:40:47.550] } [18:40:47.550] { [18:40:47.550] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:47.550] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:47.550] ...future.FUN(...future.X_jj, ...) [18:40:47.550] }) [18:40:47.550] } [18:40:47.550] }, args = future.call.arguments) [18:40:47.550] } [18:40:47.551] Tweak future expression to call with '...' arguments ... DONE [18:40:47.551] - globals: [5] 'future.call.arguments', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:47.551] [18:40:47.551] getGlobalsAndPackages() ... DONE [18:40:47.552] run() for 'Future' ... [18:40:47.552] - state: 'created' [18:40:47.552] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:40:47.552] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:40:47.553] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:40:47.553] - Field: 'label' [18:40:47.553] - Field: 'local' [18:40:47.553] - Field: 'owner' [18:40:47.553] - Field: 'envir' [18:40:47.553] - Field: 'packages' [18:40:47.554] - Field: 'gc' [18:40:47.554] - Field: 'conditions' [18:40:47.554] - Field: 'expr' [18:40:47.554] - Field: 'uuid' [18:40:47.554] - Field: 'seed' [18:40:47.554] - Field: 'version' [18:40:47.555] - Field: 'result' [18:40:47.555] - Field: 'asynchronous' [18:40:47.555] - Field: 'calls' [18:40:47.555] - Field: 'globals' [18:40:47.555] - Field: 'stdout' [18:40:47.555] - Field: 'earlySignal' [18:40:47.555] - Field: 'lazy' [18:40:47.556] - Field: 'state' [18:40:47.556] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:40:47.556] - Launch lazy future ... [18:40:47.556] Packages needed by the future expression (n = 0): [18:40:47.556] Packages needed by future strategies (n = 0): [18:40:47.557] { [18:40:47.557] { [18:40:47.557] { [18:40:47.557] ...future.startTime <- base::Sys.time() [18:40:47.557] { [18:40:47.557] { [18:40:47.557] { [18:40:47.557] base::local({ [18:40:47.557] has_future <- base::requireNamespace("future", [18:40:47.557] quietly = TRUE) [18:40:47.557] if (has_future) { [18:40:47.557] ns <- base::getNamespace("future") [18:40:47.557] version <- ns[[".package"]][["version"]] [18:40:47.557] if (is.null(version)) [18:40:47.557] version <- utils::packageVersion("future") [18:40:47.557] } [18:40:47.557] else { [18:40:47.557] version <- NULL [18:40:47.557] } [18:40:47.557] if (!has_future || version < "1.8.0") { [18:40:47.557] info <- base::c(r_version = base::gsub("R version ", [18:40:47.557] "", base::R.version$version.string), [18:40:47.557] platform = base::sprintf("%s (%s-bit)", [18:40:47.557] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:40:47.557] os = base::paste(base::Sys.info()[base::c("sysname", [18:40:47.557] "release", "version")], collapse = " "), [18:40:47.557] hostname = base::Sys.info()[["nodename"]]) [18:40:47.557] info <- base::sprintf("%s: %s", base::names(info), [18:40:47.557] info) [18:40:47.557] info <- base::paste(info, collapse = "; ") [18:40:47.557] if (!has_future) { [18:40:47.557] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:40:47.557] info) [18:40:47.557] } [18:40:47.557] else { [18:40:47.557] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:40:47.557] info, version) [18:40:47.557] } [18:40:47.557] base::stop(msg) [18:40:47.557] } [18:40:47.557] }) [18:40:47.557] } [18:40:47.557] ...future.strategy.old <- future::plan("list") [18:40:47.557] options(future.plan = NULL) [18:40:47.557] Sys.unsetenv("R_FUTURE_PLAN") [18:40:47.557] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:40:47.557] } [18:40:47.557] ...future.workdir <- getwd() [18:40:47.557] } [18:40:47.557] ...future.oldOptions <- base::as.list(base::.Options) [18:40:47.557] ...future.oldEnvVars <- base::Sys.getenv() [18:40:47.557] } [18:40:47.557] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:40:47.557] future.globals.maxSize = Inf, future.globals.method = NULL, [18:40:47.557] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:40:47.557] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:40:47.557] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:40:47.557] future.stdout.windows.reencode = NULL, width = 80L) [18:40:47.557] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:40:47.557] base::names(...future.oldOptions)) [18:40:47.557] } [18:40:47.557] if (FALSE) { [18:40:47.557] } [18:40:47.557] else { [18:40:47.557] if (TRUE) { [18:40:47.557] ...future.stdout <- base::rawConnection(base::raw(0L), [18:40:47.557] open = "w") [18:40:47.557] } [18:40:47.557] else { [18:40:47.557] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:40:47.557] windows = "NUL", "/dev/null"), open = "w") [18:40:47.557] } [18:40:47.557] base::sink(...future.stdout, type = "output", split = FALSE) [18:40:47.557] base::on.exit(if (!base::is.null(...future.stdout)) { [18:40:47.557] base::sink(type = "output", split = FALSE) [18:40:47.557] base::close(...future.stdout) [18:40:47.557] }, add = TRUE) [18:40:47.557] } [18:40:47.557] ...future.frame <- base::sys.nframe() [18:40:47.557] ...future.conditions <- base::list() [18:40:47.557] ...future.rng <- base::globalenv()$.Random.seed [18:40:47.557] if (FALSE) { [18:40:47.557] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:40:47.557] "...future.value", "...future.globalenv.names", ".Random.seed") [18:40:47.557] } [18:40:47.557] ...future.result <- base::tryCatch({ [18:40:47.557] base::withCallingHandlers({ [18:40:47.557] ...future.value <- base::withVisible(base::local({ [18:40:47.557] do.call(function(...) { [18:40:47.557] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:47.557] if (!identical(...future.globals.maxSize.org, [18:40:47.557] ...future.globals.maxSize)) { [18:40:47.557] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:47.557] on.exit(options(oopts), add = TRUE) [18:40:47.557] } [18:40:47.557] { [18:40:47.557] lapply(seq_along(...future.elements_ii), [18:40:47.557] FUN = function(jj) { [18:40:47.557] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:47.557] ...future.FUN(...future.X_jj, ...) [18:40:47.557] }) [18:40:47.557] } [18:40:47.557] }, args = future.call.arguments) [18:40:47.557] })) [18:40:47.557] future::FutureResult(value = ...future.value$value, [18:40:47.557] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:40:47.557] ...future.rng), globalenv = if (FALSE) [18:40:47.557] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:40:47.557] ...future.globalenv.names)) [18:40:47.557] else NULL, started = ...future.startTime, version = "1.8") [18:40:47.557] }, condition = base::local({ [18:40:47.557] c <- base::c [18:40:47.557] inherits <- base::inherits [18:40:47.557] invokeRestart <- base::invokeRestart [18:40:47.557] length <- base::length [18:40:47.557] list <- base::list [18:40:47.557] seq.int <- base::seq.int [18:40:47.557] signalCondition <- base::signalCondition [18:40:47.557] sys.calls <- base::sys.calls [18:40:47.557] `[[` <- base::`[[` [18:40:47.557] `+` <- base::`+` [18:40:47.557] `<<-` <- base::`<<-` [18:40:47.557] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:40:47.557] calls[seq.int(from = from + 12L, to = length(calls) - [18:40:47.557] 3L)] [18:40:47.557] } [18:40:47.557] function(cond) { [18:40:47.557] is_error <- inherits(cond, "error") [18:40:47.557] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:40:47.557] NULL) [18:40:47.557] if (is_error) { [18:40:47.557] sessionInformation <- function() { [18:40:47.557] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:40:47.557] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:40:47.557] search = base::search(), system = base::Sys.info()) [18:40:47.557] } [18:40:47.557] ...future.conditions[[length(...future.conditions) + [18:40:47.557] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:40:47.557] cond$call), session = sessionInformation(), [18:40:47.557] timestamp = base::Sys.time(), signaled = 0L) [18:40:47.557] signalCondition(cond) [18:40:47.557] } [18:40:47.557] else if (!ignore && TRUE && inherits(cond, c("condition", [18:40:47.557] "immediateCondition"))) { [18:40:47.557] signal <- TRUE && inherits(cond, "immediateCondition") [18:40:47.557] ...future.conditions[[length(...future.conditions) + [18:40:47.557] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:40:47.557] if (TRUE && !signal) { [18:40:47.557] muffleCondition <- function (cond, pattern = "^muffle") [18:40:47.557] { [18:40:47.557] inherits <- base::inherits [18:40:47.557] invokeRestart <- base::invokeRestart [18:40:47.557] is.null <- base::is.null [18:40:47.557] muffled <- FALSE [18:40:47.557] if (inherits(cond, "message")) { [18:40:47.557] muffled <- grepl(pattern, "muffleMessage") [18:40:47.557] if (muffled) [18:40:47.557] invokeRestart("muffleMessage") [18:40:47.557] } [18:40:47.557] else if (inherits(cond, "warning")) { [18:40:47.557] muffled <- grepl(pattern, "muffleWarning") [18:40:47.557] if (muffled) [18:40:47.557] invokeRestart("muffleWarning") [18:40:47.557] } [18:40:47.557] else if (inherits(cond, "condition")) { [18:40:47.557] if (!is.null(pattern)) { [18:40:47.557] computeRestarts <- base::computeRestarts [18:40:47.557] grepl <- base::grepl [18:40:47.557] restarts <- computeRestarts(cond) [18:40:47.557] for (restart in restarts) { [18:40:47.557] name <- restart$name [18:40:47.557] if (is.null(name)) [18:40:47.557] next [18:40:47.557] if (!grepl(pattern, name)) [18:40:47.557] next [18:40:47.557] invokeRestart(restart) [18:40:47.557] muffled <- TRUE [18:40:47.557] break [18:40:47.557] } [18:40:47.557] } [18:40:47.557] } [18:40:47.557] invisible(muffled) [18:40:47.557] } [18:40:47.557] muffleCondition(cond, pattern = "^muffle") [18:40:47.557] } [18:40:47.557] } [18:40:47.557] else { [18:40:47.557] if (TRUE) { [18:40:47.557] muffleCondition <- function (cond, pattern = "^muffle") [18:40:47.557] { [18:40:47.557] inherits <- base::inherits [18:40:47.557] invokeRestart <- base::invokeRestart [18:40:47.557] is.null <- base::is.null [18:40:47.557] muffled <- FALSE [18:40:47.557] if (inherits(cond, "message")) { [18:40:47.557] muffled <- grepl(pattern, "muffleMessage") [18:40:47.557] if (muffled) [18:40:47.557] invokeRestart("muffleMessage") [18:40:47.557] } [18:40:47.557] else if (inherits(cond, "warning")) { [18:40:47.557] muffled <- grepl(pattern, "muffleWarning") [18:40:47.557] if (muffled) [18:40:47.557] invokeRestart("muffleWarning") [18:40:47.557] } [18:40:47.557] else if (inherits(cond, "condition")) { [18:40:47.557] if (!is.null(pattern)) { [18:40:47.557] computeRestarts <- base::computeRestarts [18:40:47.557] grepl <- base::grepl [18:40:47.557] restarts <- computeRestarts(cond) [18:40:47.557] for (restart in restarts) { [18:40:47.557] name <- restart$name [18:40:47.557] if (is.null(name)) [18:40:47.557] next [18:40:47.557] if (!grepl(pattern, name)) [18:40:47.557] next [18:40:47.557] invokeRestart(restart) [18:40:47.557] muffled <- TRUE [18:40:47.557] break [18:40:47.557] } [18:40:47.557] } [18:40:47.557] } [18:40:47.557] invisible(muffled) [18:40:47.557] } [18:40:47.557] muffleCondition(cond, pattern = "^muffle") [18:40:47.557] } [18:40:47.557] } [18:40:47.557] } [18:40:47.557] })) [18:40:47.557] }, error = function(ex) { [18:40:47.557] base::structure(base::list(value = NULL, visible = NULL, [18:40:47.557] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:40:47.557] ...future.rng), started = ...future.startTime, [18:40:47.557] finished = Sys.time(), session_uuid = NA_character_, [18:40:47.557] version = "1.8"), class = "FutureResult") [18:40:47.557] }, finally = { [18:40:47.557] if (!identical(...future.workdir, getwd())) [18:40:47.557] setwd(...future.workdir) [18:40:47.557] { [18:40:47.557] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:40:47.557] ...future.oldOptions$nwarnings <- NULL [18:40:47.557] } [18:40:47.557] base::options(...future.oldOptions) [18:40:47.557] if (.Platform$OS.type == "windows") { [18:40:47.557] old_names <- names(...future.oldEnvVars) [18:40:47.557] envs <- base::Sys.getenv() [18:40:47.557] names <- names(envs) [18:40:47.557] common <- intersect(names, old_names) [18:40:47.557] added <- setdiff(names, old_names) [18:40:47.557] removed <- setdiff(old_names, names) [18:40:47.557] changed <- common[...future.oldEnvVars[common] != [18:40:47.557] envs[common]] [18:40:47.557] NAMES <- toupper(changed) [18:40:47.557] args <- list() [18:40:47.557] for (kk in seq_along(NAMES)) { [18:40:47.557] name <- changed[[kk]] [18:40:47.557] NAME <- NAMES[[kk]] [18:40:47.557] if (name != NAME && is.element(NAME, old_names)) [18:40:47.557] next [18:40:47.557] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:47.557] } [18:40:47.557] NAMES <- toupper(added) [18:40:47.557] for (kk in seq_along(NAMES)) { [18:40:47.557] name <- added[[kk]] [18:40:47.557] NAME <- NAMES[[kk]] [18:40:47.557] if (name != NAME && is.element(NAME, old_names)) [18:40:47.557] next [18:40:47.557] args[[name]] <- "" [18:40:47.557] } [18:40:47.557] NAMES <- toupper(removed) [18:40:47.557] for (kk in seq_along(NAMES)) { [18:40:47.557] name <- removed[[kk]] [18:40:47.557] NAME <- NAMES[[kk]] [18:40:47.557] if (name != NAME && is.element(NAME, old_names)) [18:40:47.557] next [18:40:47.557] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:47.557] } [18:40:47.557] if (length(args) > 0) [18:40:47.557] base::do.call(base::Sys.setenv, args = args) [18:40:47.557] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:40:47.557] } [18:40:47.557] else { [18:40:47.557] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:40:47.557] } [18:40:47.557] { [18:40:47.557] if (base::length(...future.futureOptionsAdded) > [18:40:47.557] 0L) { [18:40:47.557] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:40:47.557] base::names(opts) <- ...future.futureOptionsAdded [18:40:47.557] base::options(opts) [18:40:47.557] } [18:40:47.557] { [18:40:47.557] { [18:40:47.557] NULL [18:40:47.557] RNGkind("Mersenne-Twister") [18:40:47.557] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:40:47.557] inherits = FALSE) [18:40:47.557] } [18:40:47.557] options(future.plan = NULL) [18:40:47.557] if (is.na(NA_character_)) [18:40:47.557] Sys.unsetenv("R_FUTURE_PLAN") [18:40:47.557] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:40:47.557] future::plan(...future.strategy.old, .cleanup = FALSE, [18:40:47.557] .init = FALSE) [18:40:47.557] } [18:40:47.557] } [18:40:47.557] } [18:40:47.557] }) [18:40:47.557] if (TRUE) { [18:40:47.557] base::sink(type = "output", split = FALSE) [18:40:47.557] if (TRUE) { [18:40:47.557] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:40:47.557] } [18:40:47.557] else { [18:40:47.557] ...future.result["stdout"] <- base::list(NULL) [18:40:47.557] } [18:40:47.557] base::close(...future.stdout) [18:40:47.557] ...future.stdout <- NULL [18:40:47.557] } [18:40:47.557] ...future.result$conditions <- ...future.conditions [18:40:47.557] ...future.result$finished <- base::Sys.time() [18:40:47.557] ...future.result [18:40:47.557] } [18:40:47.560] assign_globals() ... [18:40:47.561] List of 5 [18:40:47.561] $ future.call.arguments : list() [18:40:47.561] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:47.561] $ ...future.FUN :function (x) [18:40:47.561] $ ...future.elements_ii :List of 2 [18:40:47.561] ..$ : int 1 [18:40:47.561] ..$ : int 2 [18:40:47.561] $ ...future.seeds_ii : NULL [18:40:47.561] $ ...future.globals.maxSize: num Inf [18:40:47.561] - attr(*, "resolved")= logi FALSE [18:40:47.561] - attr(*, "total_size")= num NA [18:40:47.561] - attr(*, "where")=List of 5 [18:40:47.561] ..$ future.call.arguments : [18:40:47.561] ..$ ...future.FUN : [18:40:47.561] ..$ ...future.elements_ii : [18:40:47.561] ..$ ...future.seeds_ii : [18:40:47.561] ..$ ...future.globals.maxSize: [18:40:47.561] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:47.561] - attr(*, "already-done")= logi TRUE [18:40:47.566] - copied 'future.call.arguments' to environment [18:40:47.566] - copied '...future.FUN' to environment [18:40:47.567] - copied '...future.elements_ii' to environment [18:40:47.567] - copied '...future.seeds_ii' to environment [18:40:47.567] - copied '...future.globals.maxSize' to environment [18:40:47.567] assign_globals() ... done [18:40:47.567] plan(): Setting new future strategy stack: [18:40:47.568] List of future strategies: [18:40:47.568] 1. sequential: [18:40:47.568] - args: function (..., envir = parent.frame(), workers = "") [18:40:47.568] - tweaked: FALSE [18:40:47.568] - call: NULL [18:40:47.568] plan(): nbrOfWorkers() = 1 [18:40:47.569] plan(): Setting new future strategy stack: [18:40:47.569] List of future strategies: [18:40:47.569] 1. sequential: [18:40:47.569] - args: function (..., envir = parent.frame(), workers = "") [18:40:47.569] - tweaked: FALSE [18:40:47.569] - call: plan(strategy) [18:40:47.570] plan(): nbrOfWorkers() = 1 [18:40:47.570] SequentialFuture started (and completed) [18:40:47.570] - Launch lazy future ... done [18:40:47.571] run() for 'SequentialFuture' ... done [18:40:47.571] Created future: [18:40:47.571] SequentialFuture: [18:40:47.571] Label: 'future_apply-1' [18:40:47.571] Expression: [18:40:47.571] { [18:40:47.571] do.call(function(...) { [18:40:47.571] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:47.571] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:47.571] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:47.571] on.exit(options(oopts), add = TRUE) [18:40:47.571] } [18:40:47.571] { [18:40:47.571] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:47.571] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:47.571] ...future.FUN(...future.X_jj, ...) [18:40:47.571] }) [18:40:47.571] } [18:40:47.571] }, args = future.call.arguments) [18:40:47.571] } [18:40:47.571] Lazy evaluation: FALSE [18:40:47.571] Asynchronous evaluation: FALSE [18:40:47.571] Local evaluation: TRUE [18:40:47.571] Environment: R_GlobalEnv [18:40:47.571] Capture standard output: TRUE [18:40:47.571] Capture condition classes: 'condition' (excluding 'nothing') [18:40:47.571] Globals: 5 objects totaling 403 bytes (DotDotDotList 'future.call.arguments' of 97 bytes, function '...future.FUN' of 185 bytes, list '...future.elements_ii' of 55 bytes, NULL '...future.seeds_ii' of 27 bytes, numeric '...future.globals.maxSize' of 39 bytes) [18:40:47.571] Packages: [18:40:47.571] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:40:47.571] Resolved: TRUE [18:40:47.571] Value: 55 bytes of class 'list' [18:40:47.571] Early signaling: FALSE [18:40:47.571] Owner process: 2171382a-9202-bc7d-80d6-248e0cb487f4 [18:40:47.571] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:40:47.572] Chunk #1 of 1 ... DONE [18:40:47.572] Launching 1 futures (chunks) ... DONE [18:40:47.572] Resolving 1 futures (chunks) ... [18:40:47.572] resolve() on list ... [18:40:47.572] recursive: 0 [18:40:47.573] length: 1 [18:40:47.573] [18:40:47.573] resolved() for 'SequentialFuture' ... [18:40:47.573] - state: 'finished' [18:40:47.573] - run: TRUE [18:40:47.573] - result: 'FutureResult' [18:40:47.574] resolved() for 'SequentialFuture' ... done [18:40:47.574] Future #1 [18:40:47.574] signalConditionsASAP(SequentialFuture, pos=1) ... [18:40:47.574] - nx: 1 [18:40:47.574] - relay: TRUE [18:40:47.574] - stdout: TRUE [18:40:47.575] - signal: TRUE [18:40:47.575] - resignal: FALSE [18:40:47.575] - force: TRUE [18:40:47.575] - relayed: [n=1] FALSE [18:40:47.575] - queued futures: [n=1] FALSE [18:40:47.575] - until=1 [18:40:47.575] - relaying element #1 [18:40:47.576] - relayed: [n=1] TRUE [18:40:47.576] - queued futures: [n=1] TRUE [18:40:47.576] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:40:47.576] length: 0 (resolved future 1) [18:40:47.576] Relaying remaining futures [18:40:47.576] signalConditionsASAP(NULL, pos=0) ... [18:40:47.577] - nx: 1 [18:40:47.577] - relay: TRUE [18:40:47.577] - stdout: TRUE [18:40:47.577] - signal: TRUE [18:40:47.577] - resignal: FALSE [18:40:47.577] - force: TRUE [18:40:47.577] - relayed: [n=1] TRUE [18:40:47.578] - queued futures: [n=1] TRUE - flush all [18:40:47.578] - relayed: [n=1] TRUE [18:40:47.578] - queued futures: [n=1] TRUE [18:40:47.578] signalConditionsASAP(NULL, pos=0) ... done [18:40:47.578] resolve() on list ... DONE [18:40:47.578] - Number of value chunks collected: 1 [18:40:47.579] Resolving 1 futures (chunks) ... DONE [18:40:47.579] Reducing values from 1 chunks ... [18:40:47.579] - Number of values collected after concatenation: 2 [18:40:47.579] - Number of values expected: 2 [18:40:47.579] Reducing values from 1 chunks ... DONE [18:40:47.579] future_lapply() ... DONE a b 1 2 - apply(X, ...) - dim(X) > 2 ... [18:40:47.580] getGlobalsAndPackagesXApply() ... [18:40:47.580] - future.globals: TRUE [18:40:47.580] getGlobalsAndPackages() ... [18:40:47.580] Searching for globals... [18:40:47.581] - globals found: [1] 'FUN' [18:40:47.581] Searching for globals ... DONE [18:40:47.581] Resolving globals: FALSE [18:40:47.582] The total size of the 1 globals is 185 bytes (185 bytes) [18:40:47.582] The total size of the 1 globals exported for future expression ('FUN(X = structure(1:12, dim = c(2L, 2L, 3L)))') 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:40:47.582] - globals: [1] 'FUN' [18:40:47.583] [18:40:47.583] getGlobalsAndPackages() ... DONE [18:40:47.583] - globals found/used: [n=1] 'FUN' [18:40:47.583] - needed namespaces: [n=0] [18:40:47.583] Finding globals ... DONE [18:40:47.583] - use_args: TRUE [18:40:47.583] - Getting '...' globals ... [18:40:47.584] resolve() on list ... [18:40:47.584] recursive: 0 [18:40:47.584] length: 1 [18:40:47.584] elements: '...' [18:40:47.584] length: 0 (resolved future 1) [18:40:47.585] resolve() on list ... DONE [18:40:47.585] - '...' content: [n=0] [18:40:47.585] List of 1 [18:40:47.585] $ ...: list() [18:40:47.585] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:47.585] - attr(*, "where")=List of 1 [18:40:47.585] ..$ ...: [18:40:47.585] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:47.585] - attr(*, "resolved")= logi TRUE [18:40:47.585] - attr(*, "total_size")= num NA [18:40:47.587] - Getting '...' globals ... DONE [18:40:47.588] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:40:47.588] List of 2 [18:40:47.588] $ ...future.FUN:function (x) [18:40:47.588] $ ... : list() [18:40:47.588] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:47.588] - attr(*, "where")=List of 2 [18:40:47.588] ..$ ...future.FUN: [18:40:47.588] ..$ ... : [18:40:47.588] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:47.588] - attr(*, "resolved")= logi FALSE [18:40:47.588] - attr(*, "total_size")= int 2274 [18:40:47.591] Packages to be attached in all futures: [n=0] [18:40:47.591] getGlobalsAndPackagesXApply() ... DONE [18:40:47.591] future_lapply() ... [18:40:47.592] Number of chunks: 1 [18:40:47.592] getGlobalsAndPackagesXApply() ... [18:40:47.592] - future.globals: with names 'list()' [18:40:47.593] - use_args: TRUE [18:40:47.593] Globals to be used in all futures (chunks): [n=2] '...', '...future.FUN' [18:40:47.593] List of 2 [18:40:47.593] $ ... : list() [18:40:47.593] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:47.593] $ ...future.FUN:function (x) [18:40:47.593] - attr(*, "where")=List of 2 [18:40:47.593] ..$ ... : [18:40:47.593] ..$ ...future.FUN: [18:40:47.593] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:47.593] - attr(*, "resolved")= logi FALSE [18:40:47.593] - attr(*, "total_size")= num NA [18:40:47.597] Packages to be attached in all futures: [n=0] [18:40:47.597] getGlobalsAndPackagesXApply() ... DONE [18:40:47.597] Number of futures (= number of chunks): 1 [18:40:47.597] Launching 1 futures (chunks) ... [18:40:47.597] Chunk #1 of 1 ... [18:40:47.597] - seeds: [18:40:47.598] - All globals exported: [n=5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:47.598] getGlobalsAndPackages() ... [18:40:47.598] - globals passed as-is: [5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:47.598] Resolving globals: FALSE [18:40:47.598] Tweak future expression to call with '...' arguments ... [18:40:47.598] { [18:40:47.598] do.call(function(...) { [18:40:47.598] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:47.598] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:47.598] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:47.598] on.exit(options(oopts), add = TRUE) [18:40:47.598] } [18:40:47.598] { [18:40:47.598] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:47.598] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:47.598] ...future.FUN(...future.X_jj, ...) [18:40:47.598] }) [18:40:47.598] } [18:40:47.598] }, args = future.call.arguments) [18:40:47.598] } [18:40:47.599] Tweak future expression to call with '...' arguments ... DONE [18:40:47.603] - globals: [5] 'future.call.arguments', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:47.604] [18:40:47.604] getGlobalsAndPackages() ... DONE [18:40:47.604] run() for 'Future' ... [18:40:47.604] - state: 'created' [18:40:47.604] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:40:47.605] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:40:47.605] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:40:47.605] - Field: 'label' [18:40:47.605] - Field: 'local' [18:40:47.605] - Field: 'owner' [18:40:47.605] - Field: 'envir' [18:40:47.606] - Field: 'packages' [18:40:47.606] - Field: 'gc' [18:40:47.606] - Field: 'conditions' [18:40:47.606] - Field: 'expr' [18:40:47.606] - Field: 'uuid' [18:40:47.606] - Field: 'seed' [18:40:47.607] - Field: 'version' [18:40:47.607] - Field: 'result' [18:40:47.607] - Field: 'asynchronous' [18:40:47.607] - Field: 'calls' [18:40:47.607] - Field: 'globals' [18:40:47.607] - Field: 'stdout' [18:40:47.607] - Field: 'earlySignal' [18:40:47.608] - Field: 'lazy' [18:40:47.608] - Field: 'state' [18:40:47.608] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:40:47.608] - Launch lazy future ... [18:40:47.608] Packages needed by the future expression (n = 0): [18:40:47.608] Packages needed by future strategies (n = 0): [18:40:47.609] { [18:40:47.609] { [18:40:47.609] { [18:40:47.609] ...future.startTime <- base::Sys.time() [18:40:47.609] { [18:40:47.609] { [18:40:47.609] { [18:40:47.609] base::local({ [18:40:47.609] has_future <- base::requireNamespace("future", [18:40:47.609] quietly = TRUE) [18:40:47.609] if (has_future) { [18:40:47.609] ns <- base::getNamespace("future") [18:40:47.609] version <- ns[[".package"]][["version"]] [18:40:47.609] if (is.null(version)) [18:40:47.609] version <- utils::packageVersion("future") [18:40:47.609] } [18:40:47.609] else { [18:40:47.609] version <- NULL [18:40:47.609] } [18:40:47.609] if (!has_future || version < "1.8.0") { [18:40:47.609] info <- base::c(r_version = base::gsub("R version ", [18:40:47.609] "", base::R.version$version.string), [18:40:47.609] platform = base::sprintf("%s (%s-bit)", [18:40:47.609] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:40:47.609] os = base::paste(base::Sys.info()[base::c("sysname", [18:40:47.609] "release", "version")], collapse = " "), [18:40:47.609] hostname = base::Sys.info()[["nodename"]]) [18:40:47.609] info <- base::sprintf("%s: %s", base::names(info), [18:40:47.609] info) [18:40:47.609] info <- base::paste(info, collapse = "; ") [18:40:47.609] if (!has_future) { [18:40:47.609] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:40:47.609] info) [18:40:47.609] } [18:40:47.609] else { [18:40:47.609] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:40:47.609] info, version) [18:40:47.609] } [18:40:47.609] base::stop(msg) [18:40:47.609] } [18:40:47.609] }) [18:40:47.609] } [18:40:47.609] ...future.strategy.old <- future::plan("list") [18:40:47.609] options(future.plan = NULL) [18:40:47.609] Sys.unsetenv("R_FUTURE_PLAN") [18:40:47.609] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:40:47.609] } [18:40:47.609] ...future.workdir <- getwd() [18:40:47.609] } [18:40:47.609] ...future.oldOptions <- base::as.list(base::.Options) [18:40:47.609] ...future.oldEnvVars <- base::Sys.getenv() [18:40:47.609] } [18:40:47.609] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:40:47.609] future.globals.maxSize = Inf, future.globals.method = NULL, [18:40:47.609] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:40:47.609] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:40:47.609] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:40:47.609] future.stdout.windows.reencode = NULL, width = 80L) [18:40:47.609] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:40:47.609] base::names(...future.oldOptions)) [18:40:47.609] } [18:40:47.609] if (FALSE) { [18:40:47.609] } [18:40:47.609] else { [18:40:47.609] if (TRUE) { [18:40:47.609] ...future.stdout <- base::rawConnection(base::raw(0L), [18:40:47.609] open = "w") [18:40:47.609] } [18:40:47.609] else { [18:40:47.609] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:40:47.609] windows = "NUL", "/dev/null"), open = "w") [18:40:47.609] } [18:40:47.609] base::sink(...future.stdout, type = "output", split = FALSE) [18:40:47.609] base::on.exit(if (!base::is.null(...future.stdout)) { [18:40:47.609] base::sink(type = "output", split = FALSE) [18:40:47.609] base::close(...future.stdout) [18:40:47.609] }, add = TRUE) [18:40:47.609] } [18:40:47.609] ...future.frame <- base::sys.nframe() [18:40:47.609] ...future.conditions <- base::list() [18:40:47.609] ...future.rng <- base::globalenv()$.Random.seed [18:40:47.609] if (FALSE) { [18:40:47.609] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:40:47.609] "...future.value", "...future.globalenv.names", ".Random.seed") [18:40:47.609] } [18:40:47.609] ...future.result <- base::tryCatch({ [18:40:47.609] base::withCallingHandlers({ [18:40:47.609] ...future.value <- base::withVisible(base::local({ [18:40:47.609] do.call(function(...) { [18:40:47.609] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:47.609] if (!identical(...future.globals.maxSize.org, [18:40:47.609] ...future.globals.maxSize)) { [18:40:47.609] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:47.609] on.exit(options(oopts), add = TRUE) [18:40:47.609] } [18:40:47.609] { [18:40:47.609] lapply(seq_along(...future.elements_ii), [18:40:47.609] FUN = function(jj) { [18:40:47.609] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:47.609] ...future.FUN(...future.X_jj, ...) [18:40:47.609] }) [18:40:47.609] } [18:40:47.609] }, args = future.call.arguments) [18:40:47.609] })) [18:40:47.609] future::FutureResult(value = ...future.value$value, [18:40:47.609] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:40:47.609] ...future.rng), globalenv = if (FALSE) [18:40:47.609] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:40:47.609] ...future.globalenv.names)) [18:40:47.609] else NULL, started = ...future.startTime, version = "1.8") [18:40:47.609] }, condition = base::local({ [18:40:47.609] c <- base::c [18:40:47.609] inherits <- base::inherits [18:40:47.609] invokeRestart <- base::invokeRestart [18:40:47.609] length <- base::length [18:40:47.609] list <- base::list [18:40:47.609] seq.int <- base::seq.int [18:40:47.609] signalCondition <- base::signalCondition [18:40:47.609] sys.calls <- base::sys.calls [18:40:47.609] `[[` <- base::`[[` [18:40:47.609] `+` <- base::`+` [18:40:47.609] `<<-` <- base::`<<-` [18:40:47.609] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:40:47.609] calls[seq.int(from = from + 12L, to = length(calls) - [18:40:47.609] 3L)] [18:40:47.609] } [18:40:47.609] function(cond) { [18:40:47.609] is_error <- inherits(cond, "error") [18:40:47.609] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:40:47.609] NULL) [18:40:47.609] if (is_error) { [18:40:47.609] sessionInformation <- function() { [18:40:47.609] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:40:47.609] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:40:47.609] search = base::search(), system = base::Sys.info()) [18:40:47.609] } [18:40:47.609] ...future.conditions[[length(...future.conditions) + [18:40:47.609] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:40:47.609] cond$call), session = sessionInformation(), [18:40:47.609] timestamp = base::Sys.time(), signaled = 0L) [18:40:47.609] signalCondition(cond) [18:40:47.609] } [18:40:47.609] else if (!ignore && TRUE && inherits(cond, c("condition", [18:40:47.609] "immediateCondition"))) { [18:40:47.609] signal <- TRUE && inherits(cond, "immediateCondition") [18:40:47.609] ...future.conditions[[length(...future.conditions) + [18:40:47.609] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:40:47.609] if (TRUE && !signal) { [18:40:47.609] muffleCondition <- function (cond, pattern = "^muffle") [18:40:47.609] { [18:40:47.609] inherits <- base::inherits [18:40:47.609] invokeRestart <- base::invokeRestart [18:40:47.609] is.null <- base::is.null [18:40:47.609] muffled <- FALSE [18:40:47.609] if (inherits(cond, "message")) { [18:40:47.609] muffled <- grepl(pattern, "muffleMessage") [18:40:47.609] if (muffled) [18:40:47.609] invokeRestart("muffleMessage") [18:40:47.609] } [18:40:47.609] else if (inherits(cond, "warning")) { [18:40:47.609] muffled <- grepl(pattern, "muffleWarning") [18:40:47.609] if (muffled) [18:40:47.609] invokeRestart("muffleWarning") [18:40:47.609] } [18:40:47.609] else if (inherits(cond, "condition")) { [18:40:47.609] if (!is.null(pattern)) { [18:40:47.609] computeRestarts <- base::computeRestarts [18:40:47.609] grepl <- base::grepl [18:40:47.609] restarts <- computeRestarts(cond) [18:40:47.609] for (restart in restarts) { [18:40:47.609] name <- restart$name [18:40:47.609] if (is.null(name)) [18:40:47.609] next [18:40:47.609] if (!grepl(pattern, name)) [18:40:47.609] next [18:40:47.609] invokeRestart(restart) [18:40:47.609] muffled <- TRUE [18:40:47.609] break [18:40:47.609] } [18:40:47.609] } [18:40:47.609] } [18:40:47.609] invisible(muffled) [18:40:47.609] } [18:40:47.609] muffleCondition(cond, pattern = "^muffle") [18:40:47.609] } [18:40:47.609] } [18:40:47.609] else { [18:40:47.609] if (TRUE) { [18:40:47.609] muffleCondition <- function (cond, pattern = "^muffle") [18:40:47.609] { [18:40:47.609] inherits <- base::inherits [18:40:47.609] invokeRestart <- base::invokeRestart [18:40:47.609] is.null <- base::is.null [18:40:47.609] muffled <- FALSE [18:40:47.609] if (inherits(cond, "message")) { [18:40:47.609] muffled <- grepl(pattern, "muffleMessage") [18:40:47.609] if (muffled) [18:40:47.609] invokeRestart("muffleMessage") [18:40:47.609] } [18:40:47.609] else if (inherits(cond, "warning")) { [18:40:47.609] muffled <- grepl(pattern, "muffleWarning") [18:40:47.609] if (muffled) [18:40:47.609] invokeRestart("muffleWarning") [18:40:47.609] } [18:40:47.609] else if (inherits(cond, "condition")) { [18:40:47.609] if (!is.null(pattern)) { [18:40:47.609] computeRestarts <- base::computeRestarts [18:40:47.609] grepl <- base::grepl [18:40:47.609] restarts <- computeRestarts(cond) [18:40:47.609] for (restart in restarts) { [18:40:47.609] name <- restart$name [18:40:47.609] if (is.null(name)) [18:40:47.609] next [18:40:47.609] if (!grepl(pattern, name)) [18:40:47.609] next [18:40:47.609] invokeRestart(restart) [18:40:47.609] muffled <- TRUE [18:40:47.609] break [18:40:47.609] } [18:40:47.609] } [18:40:47.609] } [18:40:47.609] invisible(muffled) [18:40:47.609] } [18:40:47.609] muffleCondition(cond, pattern = "^muffle") [18:40:47.609] } [18:40:47.609] } [18:40:47.609] } [18:40:47.609] })) [18:40:47.609] }, error = function(ex) { [18:40:47.609] base::structure(base::list(value = NULL, visible = NULL, [18:40:47.609] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:40:47.609] ...future.rng), started = ...future.startTime, [18:40:47.609] finished = Sys.time(), session_uuid = NA_character_, [18:40:47.609] version = "1.8"), class = "FutureResult") [18:40:47.609] }, finally = { [18:40:47.609] if (!identical(...future.workdir, getwd())) [18:40:47.609] setwd(...future.workdir) [18:40:47.609] { [18:40:47.609] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:40:47.609] ...future.oldOptions$nwarnings <- NULL [18:40:47.609] } [18:40:47.609] base::options(...future.oldOptions) [18:40:47.609] if (.Platform$OS.type == "windows") { [18:40:47.609] old_names <- names(...future.oldEnvVars) [18:40:47.609] envs <- base::Sys.getenv() [18:40:47.609] names <- names(envs) [18:40:47.609] common <- intersect(names, old_names) [18:40:47.609] added <- setdiff(names, old_names) [18:40:47.609] removed <- setdiff(old_names, names) [18:40:47.609] changed <- common[...future.oldEnvVars[common] != [18:40:47.609] envs[common]] [18:40:47.609] NAMES <- toupper(changed) [18:40:47.609] args <- list() [18:40:47.609] for (kk in seq_along(NAMES)) { [18:40:47.609] name <- changed[[kk]] [18:40:47.609] NAME <- NAMES[[kk]] [18:40:47.609] if (name != NAME && is.element(NAME, old_names)) [18:40:47.609] next [18:40:47.609] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:47.609] } [18:40:47.609] NAMES <- toupper(added) [18:40:47.609] for (kk in seq_along(NAMES)) { [18:40:47.609] name <- added[[kk]] [18:40:47.609] NAME <- NAMES[[kk]] [18:40:47.609] if (name != NAME && is.element(NAME, old_names)) [18:40:47.609] next [18:40:47.609] args[[name]] <- "" [18:40:47.609] } [18:40:47.609] NAMES <- toupper(removed) [18:40:47.609] for (kk in seq_along(NAMES)) { [18:40:47.609] name <- removed[[kk]] [18:40:47.609] NAME <- NAMES[[kk]] [18:40:47.609] if (name != NAME && is.element(NAME, old_names)) [18:40:47.609] next [18:40:47.609] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:47.609] } [18:40:47.609] if (length(args) > 0) [18:40:47.609] base::do.call(base::Sys.setenv, args = args) [18:40:47.609] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:40:47.609] } [18:40:47.609] else { [18:40:47.609] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:40:47.609] } [18:40:47.609] { [18:40:47.609] if (base::length(...future.futureOptionsAdded) > [18:40:47.609] 0L) { [18:40:47.609] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:40:47.609] base::names(opts) <- ...future.futureOptionsAdded [18:40:47.609] base::options(opts) [18:40:47.609] } [18:40:47.609] { [18:40:47.609] { [18:40:47.609] NULL [18:40:47.609] RNGkind("Mersenne-Twister") [18:40:47.609] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:40:47.609] inherits = FALSE) [18:40:47.609] } [18:40:47.609] options(future.plan = NULL) [18:40:47.609] if (is.na(NA_character_)) [18:40:47.609] Sys.unsetenv("R_FUTURE_PLAN") [18:40:47.609] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:40:47.609] future::plan(...future.strategy.old, .cleanup = FALSE, [18:40:47.609] .init = FALSE) [18:40:47.609] } [18:40:47.609] } [18:40:47.609] } [18:40:47.609] }) [18:40:47.609] if (TRUE) { [18:40:47.609] base::sink(type = "output", split = FALSE) [18:40:47.609] if (TRUE) { [18:40:47.609] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:40:47.609] } [18:40:47.609] else { [18:40:47.609] ...future.result["stdout"] <- base::list(NULL) [18:40:47.609] } [18:40:47.609] base::close(...future.stdout) [18:40:47.609] ...future.stdout <- NULL [18:40:47.609] } [18:40:47.609] ...future.result$conditions <- ...future.conditions [18:40:47.609] ...future.result$finished <- base::Sys.time() [18:40:47.609] ...future.result [18:40:47.609] } [18:40:47.612] assign_globals() ... [18:40:47.612] List of 5 [18:40:47.612] $ future.call.arguments : list() [18:40:47.612] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:47.612] $ ...future.FUN :function (x) [18:40:47.612] $ ...future.elements_ii :List of 2 [18:40:47.612] ..$ : int [1:2, 1:3] 1 3 5 7 9 11 [18:40:47.612] ..$ : int [1:2, 1:3] 2 4 6 8 10 12 [18:40:47.612] $ ...future.seeds_ii : NULL [18:40:47.612] $ ...future.globals.maxSize: num Inf [18:40:47.612] - attr(*, "resolved")= logi FALSE [18:40:47.612] - attr(*, "total_size")= num NA [18:40:47.612] - attr(*, "where")=List of 5 [18:40:47.612] ..$ future.call.arguments : [18:40:47.612] ..$ ...future.FUN : [18:40:47.612] ..$ ...future.elements_ii : [18:40:47.612] ..$ ...future.seeds_ii : [18:40:47.612] ..$ ...future.globals.maxSize: [18:40:47.612] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:47.612] - attr(*, "already-done")= logi TRUE [18:40:47.618] - copied 'future.call.arguments' to environment [18:40:47.618] - copied '...future.FUN' to environment [18:40:47.618] - copied '...future.elements_ii' to environment [18:40:47.619] - copied '...future.seeds_ii' to environment [18:40:47.619] - copied '...future.globals.maxSize' to environment [18:40:47.619] assign_globals() ... done [18:40:47.619] plan(): Setting new future strategy stack: [18:40:47.619] List of future strategies: [18:40:47.619] 1. sequential: [18:40:47.619] - args: function (..., envir = parent.frame(), workers = "") [18:40:47.619] - tweaked: FALSE [18:40:47.619] - call: NULL [18:40:47.620] plan(): nbrOfWorkers() = 1 [18:40:47.621] plan(): Setting new future strategy stack: [18:40:47.621] List of future strategies: [18:40:47.621] 1. sequential: [18:40:47.621] - args: function (..., envir = parent.frame(), workers = "") [18:40:47.621] - tweaked: FALSE [18:40:47.621] - call: plan(strategy) [18:40:47.622] plan(): nbrOfWorkers() = 1 [18:40:47.622] SequentialFuture started (and completed) [18:40:47.622] - Launch lazy future ... done [18:40:47.622] run() for 'SequentialFuture' ... done [18:40:47.622] Created future: [18:40:47.622] SequentialFuture: [18:40:47.622] Label: 'future_apply-1' [18:40:47.622] Expression: [18:40:47.622] { [18:40:47.622] do.call(function(...) { [18:40:47.622] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:47.622] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:47.622] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:47.622] on.exit(options(oopts), add = TRUE) [18:40:47.622] } [18:40:47.622] { [18:40:47.622] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:47.622] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:47.622] ...future.FUN(...future.X_jj, ...) [18:40:47.622] }) [18:40:47.622] } [18:40:47.622] }, args = future.call.arguments) [18:40:47.622] } [18:40:47.622] Lazy evaluation: FALSE [18:40:47.622] Asynchronous evaluation: FALSE [18:40:47.622] Local evaluation: TRUE [18:40:47.622] Environment: R_GlobalEnv [18:40:47.622] Capture standard output: TRUE [18:40:47.622] Capture condition classes: 'condition' (excluding 'nothing') [18:40:47.622] Globals: 5 objects totaling 510 bytes (DotDotDotList 'future.call.arguments' of 97 bytes, function '...future.FUN' of 185 bytes, list '...future.elements_ii' of 162 bytes, NULL '...future.seeds_ii' of 27 bytes, numeric '...future.globals.maxSize' of 39 bytes) [18:40:47.622] Packages: [18:40:47.622] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:40:47.622] Resolved: TRUE [18:40:47.622] Value: 162 bytes of class 'list' [18:40:47.622] Early signaling: FALSE [18:40:47.622] Owner process: 2171382a-9202-bc7d-80d6-248e0cb487f4 [18:40:47.622] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:40:47.624] Chunk #1 of 1 ... DONE [18:40:47.624] Launching 1 futures (chunks) ... DONE [18:40:47.624] Resolving 1 futures (chunks) ... [18:40:47.624] resolve() on list ... [18:40:47.624] recursive: 0 [18:40:47.624] length: 1 [18:40:47.624] [18:40:47.625] resolved() for 'SequentialFuture' ... [18:40:47.625] - state: 'finished' [18:40:47.625] - run: TRUE [18:40:47.625] - result: 'FutureResult' [18:40:47.625] resolved() for 'SequentialFuture' ... done [18:40:47.625] Future #1 [18:40:47.626] signalConditionsASAP(SequentialFuture, pos=1) ... [18:40:47.626] - nx: 1 [18:40:47.626] - relay: TRUE [18:40:47.626] - stdout: TRUE [18:40:47.626] - signal: TRUE [18:40:47.626] - resignal: FALSE [18:40:47.626] - force: TRUE [18:40:47.627] - relayed: [n=1] FALSE [18:40:47.627] - queued futures: [n=1] FALSE [18:40:47.627] - until=1 [18:40:47.627] - relaying element #1 [18:40:47.627] - relayed: [n=1] TRUE [18:40:47.627] - queued futures: [n=1] TRUE [18:40:47.627] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:40:47.628] length: 0 (resolved future 1) [18:40:47.628] Relaying remaining futures [18:40:47.628] signalConditionsASAP(NULL, pos=0) ... [18:40:47.628] - nx: 1 [18:40:47.628] - relay: TRUE [18:40:47.628] - stdout: TRUE [18:40:47.628] - signal: TRUE [18:40:47.629] - resignal: FALSE [18:40:47.629] - force: TRUE [18:40:47.629] - relayed: [n=1] TRUE [18:40:47.629] - queued futures: [n=1] TRUE - flush all [18:40:47.629] - relayed: [n=1] TRUE [18:40:47.629] - queued futures: [n=1] TRUE [18:40:47.629] signalConditionsASAP(NULL, pos=0) ... done [18:40:47.630] resolve() on list ... DONE [18:40:47.630] - Number of value chunks collected: 1 [18:40:47.630] Resolving 1 futures (chunks) ... DONE [18:40:47.630] Reducing values from 1 chunks ... [18:40:47.630] - Number of values collected after concatenation: 2 [18:40:47.630] - Number of values expected: 2 [18:40:47.631] Reducing values from 1 chunks ... DONE [18:40:47.631] future_lapply() ... DONE [,1] [,2] [1,] 1 2 [2,] 3 4 [3,] 5 6 [4,] 7 8 [5,] 9 10 [6,] 11 12 - apply(X, ...) - not all same names ... [18:40:47.631] getGlobalsAndPackagesXApply() ... [18:40:47.631] - future.globals: TRUE [18:40:47.631] getGlobalsAndPackages() ... [18:40:47.631] Searching for globals... [18:40:47.634] - globals found: [10] 'FUN', '{', 'if', '==', '[', '<-', 'names', 'names<-', 'letters', 'seq_along' [18:40:47.634] Searching for globals ... DONE [18:40:47.635] Resolving globals: FALSE [18:40:47.635] The total size of the 1 globals is 1.28 KiB (1311 bytes) [18:40:47.636] The total size of the 1 globals exported for future expression ('FUN(X = structure(1:4, dim = c(2L, 2L)))') is 1.28 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (1.28 KiB of class 'function') [18:40:47.636] - globals: [1] 'FUN' [18:40:47.636] [18:40:47.636] getGlobalsAndPackages() ... DONE [18:40:47.636] - globals found/used: [n=1] 'FUN' [18:40:47.636] - needed namespaces: [n=0] [18:40:47.636] Finding globals ... DONE [18:40:47.637] - use_args: TRUE [18:40:47.637] - Getting '...' globals ... [18:40:47.637] resolve() on list ... [18:40:47.637] recursive: 0 [18:40:47.637] length: 1 [18:40:47.638] elements: '...' [18:40:47.638] length: 0 (resolved future 1) [18:40:47.638] resolve() on list ... DONE [18:40:47.638] - '...' content: [n=0] [18:40:47.638] List of 1 [18:40:47.638] $ ...: list() [18:40:47.638] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:47.638] - attr(*, "where")=List of 1 [18:40:47.638] ..$ ...: [18:40:47.638] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:47.638] - attr(*, "resolved")= logi TRUE [18:40:47.638] - attr(*, "total_size")= num NA [18:40:47.641] - Getting '...' globals ... DONE [18:40:47.641] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:40:47.641] List of 2 [18:40:47.641] $ ...future.FUN:function (x) [18:40:47.641] $ ... : list() [18:40:47.641] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:47.641] - attr(*, "where")=List of 2 [18:40:47.641] ..$ ...future.FUN: [18:40:47.641] ..$ ... : [18:40:47.641] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:47.641] - attr(*, "resolved")= logi FALSE [18:40:47.641] - attr(*, "total_size")= int 4449 [18:40:47.644] Packages to be attached in all futures: [n=0] [18:40:47.644] getGlobalsAndPackagesXApply() ... DONE [18:40:47.645] future_lapply() ... [18:40:47.646] Number of chunks: 1 [18:40:47.646] getGlobalsAndPackagesXApply() ... [18:40:47.647] - future.globals: with names 'list()' [18:40:47.647] - use_args: TRUE [18:40:47.647] Globals to be used in all futures (chunks): [n=2] '...', '...future.FUN' [18:40:47.647] List of 2 [18:40:47.647] $ ... : list() [18:40:47.647] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:47.647] $ ...future.FUN:function (x) [18:40:47.647] - attr(*, "where")=List of 2 [18:40:47.647] ..$ ... : [18:40:47.647] ..$ ...future.FUN: [18:40:47.647] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:47.647] - attr(*, "resolved")= logi FALSE [18:40:47.647] - attr(*, "total_size")= num NA [18:40:47.650] Packages to be attached in all futures: [n=0] [18:40:47.651] getGlobalsAndPackagesXApply() ... DONE [18:40:47.651] Number of futures (= number of chunks): 1 [18:40:47.651] Launching 1 futures (chunks) ... [18:40:47.651] Chunk #1 of 1 ... [18:40:47.651] - seeds: [18:40:47.652] - All globals exported: [n=5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:47.652] getGlobalsAndPackages() ... [18:40:47.652] - globals passed as-is: [5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:47.652] Resolving globals: FALSE [18:40:47.652] Tweak future expression to call with '...' arguments ... [18:40:47.652] { [18:40:47.652] do.call(function(...) { [18:40:47.652] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:47.652] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:47.652] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:47.652] on.exit(options(oopts), add = TRUE) [18:40:47.652] } [18:40:47.652] { [18:40:47.652] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:47.652] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:47.652] ...future.FUN(...future.X_jj, ...) [18:40:47.652] }) [18:40:47.652] } [18:40:47.652] }, args = future.call.arguments) [18:40:47.652] } [18:40:47.653] Tweak future expression to call with '...' arguments ... DONE [18:40:47.653] - globals: [5] 'future.call.arguments', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:47.653] [18:40:47.654] getGlobalsAndPackages() ... DONE [18:40:47.654] run() for 'Future' ... [18:40:47.654] - state: 'created' [18:40:47.654] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:40:47.655] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:40:47.655] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:40:47.655] - Field: 'label' [18:40:47.655] - Field: 'local' [18:40:47.655] - Field: 'owner' [18:40:47.656] - Field: 'envir' [18:40:47.656] - Field: 'packages' [18:40:47.656] - Field: 'gc' [18:40:47.656] - Field: 'conditions' [18:40:47.656] - Field: 'expr' [18:40:47.656] - Field: 'uuid' [18:40:47.657] - Field: 'seed' [18:40:47.657] - Field: 'version' [18:40:47.657] - Field: 'result' [18:40:47.657] - Field: 'asynchronous' [18:40:47.657] - Field: 'calls' [18:40:47.658] - Field: 'globals' [18:40:47.658] - Field: 'stdout' [18:40:47.658] - Field: 'earlySignal' [18:40:47.658] - Field: 'lazy' [18:40:47.658] - Field: 'state' [18:40:47.658] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:40:47.659] - Launch lazy future ... [18:40:47.659] Packages needed by the future expression (n = 0): [18:40:47.659] Packages needed by future strategies (n = 0): [18:40:47.660] { [18:40:47.660] { [18:40:47.660] { [18:40:47.660] ...future.startTime <- base::Sys.time() [18:40:47.660] { [18:40:47.660] { [18:40:47.660] { [18:40:47.660] base::local({ [18:40:47.660] has_future <- base::requireNamespace("future", [18:40:47.660] quietly = TRUE) [18:40:47.660] if (has_future) { [18:40:47.660] ns <- base::getNamespace("future") [18:40:47.660] version <- ns[[".package"]][["version"]] [18:40:47.660] if (is.null(version)) [18:40:47.660] version <- utils::packageVersion("future") [18:40:47.660] } [18:40:47.660] else { [18:40:47.660] version <- NULL [18:40:47.660] } [18:40:47.660] if (!has_future || version < "1.8.0") { [18:40:47.660] info <- base::c(r_version = base::gsub("R version ", [18:40:47.660] "", base::R.version$version.string), [18:40:47.660] platform = base::sprintf("%s (%s-bit)", [18:40:47.660] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:40:47.660] os = base::paste(base::Sys.info()[base::c("sysname", [18:40:47.660] "release", "version")], collapse = " "), [18:40:47.660] hostname = base::Sys.info()[["nodename"]]) [18:40:47.660] info <- base::sprintf("%s: %s", base::names(info), [18:40:47.660] info) [18:40:47.660] info <- base::paste(info, collapse = "; ") [18:40:47.660] if (!has_future) { [18:40:47.660] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:40:47.660] info) [18:40:47.660] } [18:40:47.660] else { [18:40:47.660] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:40:47.660] info, version) [18:40:47.660] } [18:40:47.660] base::stop(msg) [18:40:47.660] } [18:40:47.660] }) [18:40:47.660] } [18:40:47.660] ...future.strategy.old <- future::plan("list") [18:40:47.660] options(future.plan = NULL) [18:40:47.660] Sys.unsetenv("R_FUTURE_PLAN") [18:40:47.660] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:40:47.660] } [18:40:47.660] ...future.workdir <- getwd() [18:40:47.660] } [18:40:47.660] ...future.oldOptions <- base::as.list(base::.Options) [18:40:47.660] ...future.oldEnvVars <- base::Sys.getenv() [18:40:47.660] } [18:40:47.660] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:40:47.660] future.globals.maxSize = Inf, future.globals.method = NULL, [18:40:47.660] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:40:47.660] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:40:47.660] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:40:47.660] future.stdout.windows.reencode = NULL, width = 80L) [18:40:47.660] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:40:47.660] base::names(...future.oldOptions)) [18:40:47.660] } [18:40:47.660] if (FALSE) { [18:40:47.660] } [18:40:47.660] else { [18:40:47.660] if (TRUE) { [18:40:47.660] ...future.stdout <- base::rawConnection(base::raw(0L), [18:40:47.660] open = "w") [18:40:47.660] } [18:40:47.660] else { [18:40:47.660] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:40:47.660] windows = "NUL", "/dev/null"), open = "w") [18:40:47.660] } [18:40:47.660] base::sink(...future.stdout, type = "output", split = FALSE) [18:40:47.660] base::on.exit(if (!base::is.null(...future.stdout)) { [18:40:47.660] base::sink(type = "output", split = FALSE) [18:40:47.660] base::close(...future.stdout) [18:40:47.660] }, add = TRUE) [18:40:47.660] } [18:40:47.660] ...future.frame <- base::sys.nframe() [18:40:47.660] ...future.conditions <- base::list() [18:40:47.660] ...future.rng <- base::globalenv()$.Random.seed [18:40:47.660] if (FALSE) { [18:40:47.660] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:40:47.660] "...future.value", "...future.globalenv.names", ".Random.seed") [18:40:47.660] } [18:40:47.660] ...future.result <- base::tryCatch({ [18:40:47.660] base::withCallingHandlers({ [18:40:47.660] ...future.value <- base::withVisible(base::local({ [18:40:47.660] do.call(function(...) { [18:40:47.660] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:47.660] if (!identical(...future.globals.maxSize.org, [18:40:47.660] ...future.globals.maxSize)) { [18:40:47.660] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:47.660] on.exit(options(oopts), add = TRUE) [18:40:47.660] } [18:40:47.660] { [18:40:47.660] lapply(seq_along(...future.elements_ii), [18:40:47.660] FUN = function(jj) { [18:40:47.660] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:47.660] ...future.FUN(...future.X_jj, ...) [18:40:47.660] }) [18:40:47.660] } [18:40:47.660] }, args = future.call.arguments) [18:40:47.660] })) [18:40:47.660] future::FutureResult(value = ...future.value$value, [18:40:47.660] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:40:47.660] ...future.rng), globalenv = if (FALSE) [18:40:47.660] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:40:47.660] ...future.globalenv.names)) [18:40:47.660] else NULL, started = ...future.startTime, version = "1.8") [18:40:47.660] }, condition = base::local({ [18:40:47.660] c <- base::c [18:40:47.660] inherits <- base::inherits [18:40:47.660] invokeRestart <- base::invokeRestart [18:40:47.660] length <- base::length [18:40:47.660] list <- base::list [18:40:47.660] seq.int <- base::seq.int [18:40:47.660] signalCondition <- base::signalCondition [18:40:47.660] sys.calls <- base::sys.calls [18:40:47.660] `[[` <- base::`[[` [18:40:47.660] `+` <- base::`+` [18:40:47.660] `<<-` <- base::`<<-` [18:40:47.660] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:40:47.660] calls[seq.int(from = from + 12L, to = length(calls) - [18:40:47.660] 3L)] [18:40:47.660] } [18:40:47.660] function(cond) { [18:40:47.660] is_error <- inherits(cond, "error") [18:40:47.660] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:40:47.660] NULL) [18:40:47.660] if (is_error) { [18:40:47.660] sessionInformation <- function() { [18:40:47.660] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:40:47.660] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:40:47.660] search = base::search(), system = base::Sys.info()) [18:40:47.660] } [18:40:47.660] ...future.conditions[[length(...future.conditions) + [18:40:47.660] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:40:47.660] cond$call), session = sessionInformation(), [18:40:47.660] timestamp = base::Sys.time(), signaled = 0L) [18:40:47.660] signalCondition(cond) [18:40:47.660] } [18:40:47.660] else if (!ignore && TRUE && inherits(cond, c("condition", [18:40:47.660] "immediateCondition"))) { [18:40:47.660] signal <- TRUE && inherits(cond, "immediateCondition") [18:40:47.660] ...future.conditions[[length(...future.conditions) + [18:40:47.660] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:40:47.660] if (TRUE && !signal) { [18:40:47.660] muffleCondition <- function (cond, pattern = "^muffle") [18:40:47.660] { [18:40:47.660] inherits <- base::inherits [18:40:47.660] invokeRestart <- base::invokeRestart [18:40:47.660] is.null <- base::is.null [18:40:47.660] muffled <- FALSE [18:40:47.660] if (inherits(cond, "message")) { [18:40:47.660] muffled <- grepl(pattern, "muffleMessage") [18:40:47.660] if (muffled) [18:40:47.660] invokeRestart("muffleMessage") [18:40:47.660] } [18:40:47.660] else if (inherits(cond, "warning")) { [18:40:47.660] muffled <- grepl(pattern, "muffleWarning") [18:40:47.660] if (muffled) [18:40:47.660] invokeRestart("muffleWarning") [18:40:47.660] } [18:40:47.660] else if (inherits(cond, "condition")) { [18:40:47.660] if (!is.null(pattern)) { [18:40:47.660] computeRestarts <- base::computeRestarts [18:40:47.660] grepl <- base::grepl [18:40:47.660] restarts <- computeRestarts(cond) [18:40:47.660] for (restart in restarts) { [18:40:47.660] name <- restart$name [18:40:47.660] if (is.null(name)) [18:40:47.660] next [18:40:47.660] if (!grepl(pattern, name)) [18:40:47.660] next [18:40:47.660] invokeRestart(restart) [18:40:47.660] muffled <- TRUE [18:40:47.660] break [18:40:47.660] } [18:40:47.660] } [18:40:47.660] } [18:40:47.660] invisible(muffled) [18:40:47.660] } [18:40:47.660] muffleCondition(cond, pattern = "^muffle") [18:40:47.660] } [18:40:47.660] } [18:40:47.660] else { [18:40:47.660] if (TRUE) { [18:40:47.660] muffleCondition <- function (cond, pattern = "^muffle") [18:40:47.660] { [18:40:47.660] inherits <- base::inherits [18:40:47.660] invokeRestart <- base::invokeRestart [18:40:47.660] is.null <- base::is.null [18:40:47.660] muffled <- FALSE [18:40:47.660] if (inherits(cond, "message")) { [18:40:47.660] muffled <- grepl(pattern, "muffleMessage") [18:40:47.660] if (muffled) [18:40:47.660] invokeRestart("muffleMessage") [18:40:47.660] } [18:40:47.660] else if (inherits(cond, "warning")) { [18:40:47.660] muffled <- grepl(pattern, "muffleWarning") [18:40:47.660] if (muffled) [18:40:47.660] invokeRestart("muffleWarning") [18:40:47.660] } [18:40:47.660] else if (inherits(cond, "condition")) { [18:40:47.660] if (!is.null(pattern)) { [18:40:47.660] computeRestarts <- base::computeRestarts [18:40:47.660] grepl <- base::grepl [18:40:47.660] restarts <- computeRestarts(cond) [18:40:47.660] for (restart in restarts) { [18:40:47.660] name <- restart$name [18:40:47.660] if (is.null(name)) [18:40:47.660] next [18:40:47.660] if (!grepl(pattern, name)) [18:40:47.660] next [18:40:47.660] invokeRestart(restart) [18:40:47.660] muffled <- TRUE [18:40:47.660] break [18:40:47.660] } [18:40:47.660] } [18:40:47.660] } [18:40:47.660] invisible(muffled) [18:40:47.660] } [18:40:47.660] muffleCondition(cond, pattern = "^muffle") [18:40:47.660] } [18:40:47.660] } [18:40:47.660] } [18:40:47.660] })) [18:40:47.660] }, error = function(ex) { [18:40:47.660] base::structure(base::list(value = NULL, visible = NULL, [18:40:47.660] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:40:47.660] ...future.rng), started = ...future.startTime, [18:40:47.660] finished = Sys.time(), session_uuid = NA_character_, [18:40:47.660] version = "1.8"), class = "FutureResult") [18:40:47.660] }, finally = { [18:40:47.660] if (!identical(...future.workdir, getwd())) [18:40:47.660] setwd(...future.workdir) [18:40:47.660] { [18:40:47.660] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:40:47.660] ...future.oldOptions$nwarnings <- NULL [18:40:47.660] } [18:40:47.660] base::options(...future.oldOptions) [18:40:47.660] if (.Platform$OS.type == "windows") { [18:40:47.660] old_names <- names(...future.oldEnvVars) [18:40:47.660] envs <- base::Sys.getenv() [18:40:47.660] names <- names(envs) [18:40:47.660] common <- intersect(names, old_names) [18:40:47.660] added <- setdiff(names, old_names) [18:40:47.660] removed <- setdiff(old_names, names) [18:40:47.660] changed <- common[...future.oldEnvVars[common] != [18:40:47.660] envs[common]] [18:40:47.660] NAMES <- toupper(changed) [18:40:47.660] args <- list() [18:40:47.660] for (kk in seq_along(NAMES)) { [18:40:47.660] name <- changed[[kk]] [18:40:47.660] NAME <- NAMES[[kk]] [18:40:47.660] if (name != NAME && is.element(NAME, old_names)) [18:40:47.660] next [18:40:47.660] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:47.660] } [18:40:47.660] NAMES <- toupper(added) [18:40:47.660] for (kk in seq_along(NAMES)) { [18:40:47.660] name <- added[[kk]] [18:40:47.660] NAME <- NAMES[[kk]] [18:40:47.660] if (name != NAME && is.element(NAME, old_names)) [18:40:47.660] next [18:40:47.660] args[[name]] <- "" [18:40:47.660] } [18:40:47.660] NAMES <- toupper(removed) [18:40:47.660] for (kk in seq_along(NAMES)) { [18:40:47.660] name <- removed[[kk]] [18:40:47.660] NAME <- NAMES[[kk]] [18:40:47.660] if (name != NAME && is.element(NAME, old_names)) [18:40:47.660] next [18:40:47.660] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:47.660] } [18:40:47.660] if (length(args) > 0) [18:40:47.660] base::do.call(base::Sys.setenv, args = args) [18:40:47.660] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:40:47.660] } [18:40:47.660] else { [18:40:47.660] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:40:47.660] } [18:40:47.660] { [18:40:47.660] if (base::length(...future.futureOptionsAdded) > [18:40:47.660] 0L) { [18:40:47.660] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:40:47.660] base::names(opts) <- ...future.futureOptionsAdded [18:40:47.660] base::options(opts) [18:40:47.660] } [18:40:47.660] { [18:40:47.660] { [18:40:47.660] NULL [18:40:47.660] RNGkind("Mersenne-Twister") [18:40:47.660] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:40:47.660] inherits = FALSE) [18:40:47.660] } [18:40:47.660] options(future.plan = NULL) [18:40:47.660] if (is.na(NA_character_)) [18:40:47.660] Sys.unsetenv("R_FUTURE_PLAN") [18:40:47.660] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:40:47.660] future::plan(...future.strategy.old, .cleanup = FALSE, [18:40:47.660] .init = FALSE) [18:40:47.660] } [18:40:47.660] } [18:40:47.660] } [18:40:47.660] }) [18:40:47.660] if (TRUE) { [18:40:47.660] base::sink(type = "output", split = FALSE) [18:40:47.660] if (TRUE) { [18:40:47.660] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:40:47.660] } [18:40:47.660] else { [18:40:47.660] ...future.result["stdout"] <- base::list(NULL) [18:40:47.660] } [18:40:47.660] base::close(...future.stdout) [18:40:47.660] ...future.stdout <- NULL [18:40:47.660] } [18:40:47.660] ...future.result$conditions <- ...future.conditions [18:40:47.660] ...future.result$finished <- base::Sys.time() [18:40:47.660] ...future.result [18:40:47.660] } [18:40:47.663] assign_globals() ... [18:40:47.663] List of 5 [18:40:47.663] $ future.call.arguments : list() [18:40:47.663] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:47.663] $ ...future.FUN :function (x) [18:40:47.663] $ ...future.elements_ii :List of 2 [18:40:47.663] ..$ : int [1:2] 1 3 [18:40:47.663] ..$ : int [1:2] 2 4 [18:40:47.663] $ ...future.seeds_ii : NULL [18:40:47.663] $ ...future.globals.maxSize: num Inf [18:40:47.663] - attr(*, "resolved")= logi FALSE [18:40:47.663] - attr(*, "total_size")= num NA [18:40:47.663] - attr(*, "where")=List of 5 [18:40:47.663] ..$ future.call.arguments : [18:40:47.663] ..$ ...future.FUN : [18:40:47.663] ..$ ...future.elements_ii : [18:40:47.663] ..$ ...future.seeds_ii : [18:40:47.663] ..$ ...future.globals.maxSize: [18:40:47.663] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:47.663] - attr(*, "already-done")= logi TRUE [18:40:47.669] - copied 'future.call.arguments' to environment [18:40:47.670] - reassign environment for '...future.FUN' [18:40:47.670] - copied '...future.FUN' to environment [18:40:47.670] - copied '...future.elements_ii' to environment [18:40:47.670] - copied '...future.seeds_ii' to environment [18:40:47.670] - copied '...future.globals.maxSize' to environment [18:40:47.670] assign_globals() ... done [18:40:47.671] plan(): Setting new future strategy stack: [18:40:47.671] List of future strategies: [18:40:47.671] 1. sequential: [18:40:47.671] - args: function (..., envir = parent.frame(), workers = "") [18:40:47.671] - tweaked: FALSE [18:40:47.671] - call: NULL [18:40:47.671] plan(): nbrOfWorkers() = 1 [18:40:47.673] plan(): Setting new future strategy stack: [18:40:47.673] List of future strategies: [18:40:47.673] 1. sequential: [18:40:47.673] - args: function (..., envir = parent.frame(), workers = "") [18:40:47.673] - tweaked: FALSE [18:40:47.673] - call: plan(strategy) [18:40:47.673] plan(): nbrOfWorkers() = 1 [18:40:47.673] SequentialFuture started (and completed) [18:40:47.674] - Launch lazy future ... done [18:40:47.674] run() for 'SequentialFuture' ... done [18:40:47.674] Created future: [18:40:47.674] SequentialFuture: [18:40:47.674] Label: 'future_apply-1' [18:40:47.674] Expression: [18:40:47.674] { [18:40:47.674] do.call(function(...) { [18:40:47.674] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:47.674] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:47.674] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:47.674] on.exit(options(oopts), add = TRUE) [18:40:47.674] } [18:40:47.674] { [18:40:47.674] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:47.674] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:47.674] ...future.FUN(...future.X_jj, ...) [18:40:47.674] }) [18:40:47.674] } [18:40:47.674] }, args = future.call.arguments) [18:40:47.674] } [18:40:47.674] Lazy evaluation: FALSE [18:40:47.674] Asynchronous evaluation: FALSE [18:40:47.674] Local evaluation: TRUE [18:40:47.674] Environment: R_GlobalEnv [18:40:47.674] Capture standard output: TRUE [18:40:47.674] Capture condition classes: 'condition' (excluding 'nothing') [18:40:47.674] Globals: 5 objects totaling 1.50 KiB (DotDotDotList 'future.call.arguments' of 97 bytes, function '...future.FUN' of 1.28 KiB, list '...future.elements_ii' of 63 bytes, NULL '...future.seeds_ii' of 27 bytes, numeric '...future.globals.maxSize' of 39 bytes) [18:40:47.674] Packages: [18:40:47.674] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:40:47.674] Resolved: TRUE [18:40:47.674] Value: 114 bytes of class 'list' [18:40:47.674] Early signaling: FALSE [18:40:47.674] Owner process: 2171382a-9202-bc7d-80d6-248e0cb487f4 [18:40:47.674] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:40:47.675] Chunk #1 of 1 ... DONE [18:40:47.675] Launching 1 futures (chunks) ... DONE [18:40:47.675] Resolving 1 futures (chunks) ... [18:40:47.676] resolve() on list ... [18:40:47.676] recursive: 0 [18:40:47.676] length: 1 [18:40:47.676] [18:40:47.676] resolved() for 'SequentialFuture' ... [18:40:47.676] - state: 'finished' [18:40:47.676] - run: TRUE [18:40:47.677] - result: 'FutureResult' [18:40:47.677] resolved() for 'SequentialFuture' ... done [18:40:47.677] Future #1 [18:40:47.677] signalConditionsASAP(SequentialFuture, pos=1) ... [18:40:47.677] - nx: 1 [18:40:47.677] - relay: TRUE [18:40:47.678] - stdout: TRUE [18:40:47.678] - signal: TRUE [18:40:47.678] - resignal: FALSE [18:40:47.678] - force: TRUE [18:40:47.678] - relayed: [n=1] FALSE [18:40:47.678] - queued futures: [n=1] FALSE [18:40:47.679] - until=1 [18:40:47.679] - relaying element #1 [18:40:47.679] - relayed: [n=1] TRUE [18:40:47.679] - queued futures: [n=1] TRUE [18:40:47.679] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:40:47.679] length: 0 (resolved future 1) [18:40:47.680] Relaying remaining futures [18:40:47.680] signalConditionsASAP(NULL, pos=0) ... [18:40:47.680] - nx: 1 [18:40:47.680] - relay: TRUE [18:40:47.680] - stdout: TRUE [18:40:47.680] - signal: TRUE [18:40:47.680] - resignal: FALSE [18:40:47.681] - force: TRUE [18:40:47.681] - relayed: [n=1] TRUE [18:40:47.681] - queued futures: [n=1] TRUE - flush all [18:40:47.681] - relayed: [n=1] TRUE [18:40:47.681] - queued futures: [n=1] TRUE [18:40:47.681] signalConditionsASAP(NULL, pos=0) ... done [18:40:47.682] resolve() on list ... DONE [18:40:47.682] - Number of value chunks collected: 1 [18:40:47.682] Resolving 1 futures (chunks) ... DONE [18:40:47.682] Reducing values from 1 chunks ... [18:40:47.682] - Number of values collected after concatenation: 2 [18:40:47.682] - Number of values expected: 2 [18:40:47.683] Reducing values from 1 chunks ... DONE [18:40:47.683] future_lapply() ... DONE [,1] [,2] [1,] 1 2 [2,] 3 4 - example(future_apply) - reproducible RNG ... [18:40:47.683] getGlobalsAndPackagesXApply() ... [18:40:47.683] - future.globals: TRUE [18:40:47.683] getGlobalsAndPackages() ... [18:40:47.684] Searching for globals... [18:40:47.687] - globals found: [13] 'FUN', '{', 'if', '&&', '==', 'length', 'is.numeric', 'is.finite', '>=', 'missing', '<-', 'sample.int', '[' [18:40:47.687] Searching for globals ... DONE [18:40:47.687] Resolving globals: FALSE [18:40:47.688] The total size of the 1 globals is 3.66 KiB (3746 bytes) [18:40:47.689] The total size of the 1 globals exported for future expression ('FUN(X = structure(1:4, dim = c(2L, 2L)))') is 3.66 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (3.66 KiB of class 'function') [18:40:47.689] - globals: [1] 'FUN' [18:40:47.689] [18:40:47.689] getGlobalsAndPackages() ... DONE [18:40:47.689] - globals found/used: [n=1] 'FUN' [18:40:47.689] - needed namespaces: [n=0] [18:40:47.690] Finding globals ... DONE [18:40:47.690] - use_args: TRUE [18:40:47.690] - Getting '...' globals ... [18:40:47.690] resolve() on list ... [18:40:47.690] recursive: 0 [18:40:47.691] length: 1 [18:40:47.691] elements: '...' [18:40:47.691] length: 0 (resolved future 1) [18:40:47.691] resolve() on list ... DONE [18:40:47.691] - '...' content: [n=0] [18:40:47.692] List of 1 [18:40:47.692] $ ...: list() [18:40:47.692] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:47.692] - attr(*, "where")=List of 1 [18:40:47.692] ..$ ...: [18:40:47.692] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:47.692] - attr(*, "resolved")= logi TRUE [18:40:47.692] - attr(*, "total_size")= num NA [18:40:47.694] - Getting '...' globals ... DONE [18:40:47.695] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:40:47.695] List of 2 [18:40:47.695] $ ...future.FUN:function (x, size, replace = FALSE, prob = NULL) [18:40:47.695] $ ... : list() [18:40:47.695] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:47.695] - attr(*, "where")=List of 2 [18:40:47.695] ..$ ...future.FUN: [18:40:47.695] ..$ ... : [18:40:47.695] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:47.695] - attr(*, "resolved")= logi FALSE [18:40:47.695] - attr(*, "total_size")= int 9424 [18:40:47.698] Packages to be attached in all futures: [n=0] [18:40:47.698] getGlobalsAndPackagesXApply() ... DONE [18:40:47.699] future_lapply() ... [18:40:47.701] Generating random seeds ... [18:40:47.702] Generating random seed streams for 2 elements ... [18:40:47.702] Generating random seed streams for 2 elements ... DONE [18:40:47.702] Generating random seeds ... DONE [18:40:47.702] Will set RNG state on exit: 10407, -585360144, 2045164431, 331696693, 805922727, -792336278, 336250629 [18:40:47.703] Number of chunks: 1 [18:40:47.703] getGlobalsAndPackagesXApply() ... [18:40:47.703] - future.globals: with names 'list()' [18:40:47.703] - use_args: TRUE [18:40:47.704] Globals to be used in all futures (chunks): [n=2] '...', '...future.FUN' [18:40:47.704] List of 2 [18:40:47.704] $ ... : list() [18:40:47.704] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:47.704] $ ...future.FUN:function (x, size, replace = FALSE, prob = NULL) [18:40:47.704] - attr(*, "where")=List of 2 [18:40:47.704] ..$ ... : [18:40:47.704] ..$ ...future.FUN: [18:40:47.704] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:47.704] - attr(*, "resolved")= logi FALSE [18:40:47.704] - attr(*, "total_size")= num NA [18:40:47.708] Packages to be attached in all futures: [n=0] [18:40:47.710] getGlobalsAndPackagesXApply() ... DONE [18:40:47.710] Number of futures (= number of chunks): 1 [18:40:47.710] Launching 1 futures (chunks) ... [18:40:47.710] Chunk #1 of 1 ... [18:40:47.710] - seeds: [2] [18:40:47.711] - All globals exported: [n=5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:47.711] getGlobalsAndPackages() ... [18:40:47.711] - globals passed as-is: [5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:47.711] Resolving globals: FALSE [18:40:47.711] Tweak future expression to call with '...' arguments ... [18:40:47.711] { [18:40:47.711] do.call(function(...) { [18:40:47.711] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:47.711] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:47.711] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:47.711] on.exit(options(oopts), add = TRUE) [18:40:47.711] } [18:40:47.711] { [18:40:47.711] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:47.711] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:47.711] assign(".Random.seed", ...future.seeds_ii[[jj]], [18:40:47.711] envir = globalenv(), inherits = FALSE) [18:40:47.711] ...future.FUN(...future.X_jj, ...) [18:40:47.711] }) [18:40:47.711] } [18:40:47.711] }, args = future.call.arguments) [18:40:47.711] } [18:40:47.712] Tweak future expression to call with '...' arguments ... DONE [18:40:47.712] - globals: [5] 'future.call.arguments', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:47.713] [18:40:47.713] getGlobalsAndPackages() ... DONE [18:40:47.713] run() for 'Future' ... [18:40:47.713] - state: 'created' [18:40:47.714] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:40:47.714] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:40:47.714] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:40:47.714] - Field: 'label' [18:40:47.714] - Field: 'local' [18:40:47.715] - Field: 'owner' [18:40:47.715] - Field: 'envir' [18:40:47.715] - Field: 'packages' [18:40:47.715] - Field: 'gc' [18:40:47.715] - Field: 'conditions' [18:40:47.715] - Field: 'expr' [18:40:47.716] - Field: 'uuid' [18:40:47.716] - Field: 'seed' [18:40:47.716] - Field: 'version' [18:40:47.716] - Field: 'result' [18:40:47.716] - Field: 'asynchronous' [18:40:47.717] - Field: 'calls' [18:40:47.717] - Field: 'globals' [18:40:47.717] - Field: 'stdout' [18:40:47.717] - Field: 'earlySignal' [18:40:47.717] - Field: 'lazy' [18:40:47.717] - Field: 'state' [18:40:47.718] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:40:47.718] - Launch lazy future ... [18:40:47.718] Packages needed by the future expression (n = 0): [18:40:47.718] Packages needed by future strategies (n = 0): [18:40:47.719] { [18:40:47.719] { [18:40:47.719] { [18:40:47.719] ...future.startTime <- base::Sys.time() [18:40:47.719] { [18:40:47.719] { [18:40:47.719] { [18:40:47.719] base::local({ [18:40:47.719] has_future <- base::requireNamespace("future", [18:40:47.719] quietly = TRUE) [18:40:47.719] if (has_future) { [18:40:47.719] ns <- base::getNamespace("future") [18:40:47.719] version <- ns[[".package"]][["version"]] [18:40:47.719] if (is.null(version)) [18:40:47.719] version <- utils::packageVersion("future") [18:40:47.719] } [18:40:47.719] else { [18:40:47.719] version <- NULL [18:40:47.719] } [18:40:47.719] if (!has_future || version < "1.8.0") { [18:40:47.719] info <- base::c(r_version = base::gsub("R version ", [18:40:47.719] "", base::R.version$version.string), [18:40:47.719] platform = base::sprintf("%s (%s-bit)", [18:40:47.719] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:40:47.719] os = base::paste(base::Sys.info()[base::c("sysname", [18:40:47.719] "release", "version")], collapse = " "), [18:40:47.719] hostname = base::Sys.info()[["nodename"]]) [18:40:47.719] info <- base::sprintf("%s: %s", base::names(info), [18:40:47.719] info) [18:40:47.719] info <- base::paste(info, collapse = "; ") [18:40:47.719] if (!has_future) { [18:40:47.719] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:40:47.719] info) [18:40:47.719] } [18:40:47.719] else { [18:40:47.719] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:40:47.719] info, version) [18:40:47.719] } [18:40:47.719] base::stop(msg) [18:40:47.719] } [18:40:47.719] }) [18:40:47.719] } [18:40:47.719] ...future.strategy.old <- future::plan("list") [18:40:47.719] options(future.plan = NULL) [18:40:47.719] Sys.unsetenv("R_FUTURE_PLAN") [18:40:47.719] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:40:47.719] } [18:40:47.719] ...future.workdir <- getwd() [18:40:47.719] } [18:40:47.719] ...future.oldOptions <- base::as.list(base::.Options) [18:40:47.719] ...future.oldEnvVars <- base::Sys.getenv() [18:40:47.719] } [18:40:47.719] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:40:47.719] future.globals.maxSize = Inf, future.globals.method = NULL, [18:40:47.719] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:40:47.719] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:40:47.719] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:40:47.719] future.stdout.windows.reencode = NULL, width = 80L) [18:40:47.719] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:40:47.719] base::names(...future.oldOptions)) [18:40:47.719] } [18:40:47.719] if (FALSE) { [18:40:47.719] } [18:40:47.719] else { [18:40:47.719] if (TRUE) { [18:40:47.719] ...future.stdout <- base::rawConnection(base::raw(0L), [18:40:47.719] open = "w") [18:40:47.719] } [18:40:47.719] else { [18:40:47.719] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:40:47.719] windows = "NUL", "/dev/null"), open = "w") [18:40:47.719] } [18:40:47.719] base::sink(...future.stdout, type = "output", split = FALSE) [18:40:47.719] base::on.exit(if (!base::is.null(...future.stdout)) { [18:40:47.719] base::sink(type = "output", split = FALSE) [18:40:47.719] base::close(...future.stdout) [18:40:47.719] }, add = TRUE) [18:40:47.719] } [18:40:47.719] ...future.frame <- base::sys.nframe() [18:40:47.719] ...future.conditions <- base::list() [18:40:47.719] ...future.rng <- base::globalenv()$.Random.seed [18:40:47.719] if (FALSE) { [18:40:47.719] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:40:47.719] "...future.value", "...future.globalenv.names", ".Random.seed") [18:40:47.719] } [18:40:47.719] ...future.result <- base::tryCatch({ [18:40:47.719] base::withCallingHandlers({ [18:40:47.719] ...future.value <- base::withVisible(base::local({ [18:40:47.719] do.call(function(...) { [18:40:47.719] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:47.719] if (!identical(...future.globals.maxSize.org, [18:40:47.719] ...future.globals.maxSize)) { [18:40:47.719] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:47.719] on.exit(options(oopts), add = TRUE) [18:40:47.719] } [18:40:47.719] { [18:40:47.719] lapply(seq_along(...future.elements_ii), [18:40:47.719] FUN = function(jj) { [18:40:47.719] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:47.719] assign(".Random.seed", ...future.seeds_ii[[jj]], [18:40:47.719] envir = globalenv(), inherits = FALSE) [18:40:47.719] ...future.FUN(...future.X_jj, ...) [18:40:47.719] }) [18:40:47.719] } [18:40:47.719] }, args = future.call.arguments) [18:40:47.719] })) [18:40:47.719] future::FutureResult(value = ...future.value$value, [18:40:47.719] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:40:47.719] ...future.rng), globalenv = if (FALSE) [18:40:47.719] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:40:47.719] ...future.globalenv.names)) [18:40:47.719] else NULL, started = ...future.startTime, version = "1.8") [18:40:47.719] }, condition = base::local({ [18:40:47.719] c <- base::c [18:40:47.719] inherits <- base::inherits [18:40:47.719] invokeRestart <- base::invokeRestart [18:40:47.719] length <- base::length [18:40:47.719] list <- base::list [18:40:47.719] seq.int <- base::seq.int [18:40:47.719] signalCondition <- base::signalCondition [18:40:47.719] sys.calls <- base::sys.calls [18:40:47.719] `[[` <- base::`[[` [18:40:47.719] `+` <- base::`+` [18:40:47.719] `<<-` <- base::`<<-` [18:40:47.719] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:40:47.719] calls[seq.int(from = from + 12L, to = length(calls) - [18:40:47.719] 3L)] [18:40:47.719] } [18:40:47.719] function(cond) { [18:40:47.719] is_error <- inherits(cond, "error") [18:40:47.719] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:40:47.719] NULL) [18:40:47.719] if (is_error) { [18:40:47.719] sessionInformation <- function() { [18:40:47.719] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:40:47.719] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:40:47.719] search = base::search(), system = base::Sys.info()) [18:40:47.719] } [18:40:47.719] ...future.conditions[[length(...future.conditions) + [18:40:47.719] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:40:47.719] cond$call), session = sessionInformation(), [18:40:47.719] timestamp = base::Sys.time(), signaled = 0L) [18:40:47.719] signalCondition(cond) [18:40:47.719] } [18:40:47.719] else if (!ignore && FALSE && inherits(cond, NULL)) { [18:40:47.719] signal <- TRUE && inherits(cond, character(0)) [18:40:47.719] ...future.conditions[[length(...future.conditions) + [18:40:47.719] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:40:47.719] if (TRUE && !signal) { [18:40:47.719] muffleCondition <- function (cond, pattern = "^muffle") [18:40:47.719] { [18:40:47.719] inherits <- base::inherits [18:40:47.719] invokeRestart <- base::invokeRestart [18:40:47.719] is.null <- base::is.null [18:40:47.719] muffled <- FALSE [18:40:47.719] if (inherits(cond, "message")) { [18:40:47.719] muffled <- grepl(pattern, "muffleMessage") [18:40:47.719] if (muffled) [18:40:47.719] invokeRestart("muffleMessage") [18:40:47.719] } [18:40:47.719] else if (inherits(cond, "warning")) { [18:40:47.719] muffled <- grepl(pattern, "muffleWarning") [18:40:47.719] if (muffled) [18:40:47.719] invokeRestart("muffleWarning") [18:40:47.719] } [18:40:47.719] else if (inherits(cond, "condition")) { [18:40:47.719] if (!is.null(pattern)) { [18:40:47.719] computeRestarts <- base::computeRestarts [18:40:47.719] grepl <- base::grepl [18:40:47.719] restarts <- computeRestarts(cond) [18:40:47.719] for (restart in restarts) { [18:40:47.719] name <- restart$name [18:40:47.719] if (is.null(name)) [18:40:47.719] next [18:40:47.719] if (!grepl(pattern, name)) [18:40:47.719] next [18:40:47.719] invokeRestart(restart) [18:40:47.719] muffled <- TRUE [18:40:47.719] break [18:40:47.719] } [18:40:47.719] } [18:40:47.719] } [18:40:47.719] invisible(muffled) [18:40:47.719] } [18:40:47.719] muffleCondition(cond, pattern = "^muffle") [18:40:47.719] } [18:40:47.719] } [18:40:47.719] else { [18:40:47.719] if (FALSE) { [18:40:47.719] muffleCondition <- function (cond, pattern = "^muffle") [18:40:47.719] { [18:40:47.719] inherits <- base::inherits [18:40:47.719] invokeRestart <- base::invokeRestart [18:40:47.719] is.null <- base::is.null [18:40:47.719] muffled <- FALSE [18:40:47.719] if (inherits(cond, "message")) { [18:40:47.719] muffled <- grepl(pattern, "muffleMessage") [18:40:47.719] if (muffled) [18:40:47.719] invokeRestart("muffleMessage") [18:40:47.719] } [18:40:47.719] else if (inherits(cond, "warning")) { [18:40:47.719] muffled <- grepl(pattern, "muffleWarning") [18:40:47.719] if (muffled) [18:40:47.719] invokeRestart("muffleWarning") [18:40:47.719] } [18:40:47.719] else if (inherits(cond, "condition")) { [18:40:47.719] if (!is.null(pattern)) { [18:40:47.719] computeRestarts <- base::computeRestarts [18:40:47.719] grepl <- base::grepl [18:40:47.719] restarts <- computeRestarts(cond) [18:40:47.719] for (restart in restarts) { [18:40:47.719] name <- restart$name [18:40:47.719] if (is.null(name)) [18:40:47.719] next [18:40:47.719] if (!grepl(pattern, name)) [18:40:47.719] next [18:40:47.719] invokeRestart(restart) [18:40:47.719] muffled <- TRUE [18:40:47.719] break [18:40:47.719] } [18:40:47.719] } [18:40:47.719] } [18:40:47.719] invisible(muffled) [18:40:47.719] } [18:40:47.719] muffleCondition(cond, pattern = "^muffle") [18:40:47.719] } [18:40:47.719] } [18:40:47.719] } [18:40:47.719] })) [18:40:47.719] }, error = function(ex) { [18:40:47.719] base::structure(base::list(value = NULL, visible = NULL, [18:40:47.719] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:40:47.719] ...future.rng), started = ...future.startTime, [18:40:47.719] finished = Sys.time(), session_uuid = NA_character_, [18:40:47.719] version = "1.8"), class = "FutureResult") [18:40:47.719] }, finally = { [18:40:47.719] if (!identical(...future.workdir, getwd())) [18:40:47.719] setwd(...future.workdir) [18:40:47.719] { [18:40:47.719] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:40:47.719] ...future.oldOptions$nwarnings <- NULL [18:40:47.719] } [18:40:47.719] base::options(...future.oldOptions) [18:40:47.719] if (.Platform$OS.type == "windows") { [18:40:47.719] old_names <- names(...future.oldEnvVars) [18:40:47.719] envs <- base::Sys.getenv() [18:40:47.719] names <- names(envs) [18:40:47.719] common <- intersect(names, old_names) [18:40:47.719] added <- setdiff(names, old_names) [18:40:47.719] removed <- setdiff(old_names, names) [18:40:47.719] changed <- common[...future.oldEnvVars[common] != [18:40:47.719] envs[common]] [18:40:47.719] NAMES <- toupper(changed) [18:40:47.719] args <- list() [18:40:47.719] for (kk in seq_along(NAMES)) { [18:40:47.719] name <- changed[[kk]] [18:40:47.719] NAME <- NAMES[[kk]] [18:40:47.719] if (name != NAME && is.element(NAME, old_names)) [18:40:47.719] next [18:40:47.719] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:47.719] } [18:40:47.719] NAMES <- toupper(added) [18:40:47.719] for (kk in seq_along(NAMES)) { [18:40:47.719] name <- added[[kk]] [18:40:47.719] NAME <- NAMES[[kk]] [18:40:47.719] if (name != NAME && is.element(NAME, old_names)) [18:40:47.719] next [18:40:47.719] args[[name]] <- "" [18:40:47.719] } [18:40:47.719] NAMES <- toupper(removed) [18:40:47.719] for (kk in seq_along(NAMES)) { [18:40:47.719] name <- removed[[kk]] [18:40:47.719] NAME <- NAMES[[kk]] [18:40:47.719] if (name != NAME && is.element(NAME, old_names)) [18:40:47.719] next [18:40:47.719] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:47.719] } [18:40:47.719] if (length(args) > 0) [18:40:47.719] base::do.call(base::Sys.setenv, args = args) [18:40:47.719] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:40:47.719] } [18:40:47.719] else { [18:40:47.719] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:40:47.719] } [18:40:47.719] { [18:40:47.719] if (base::length(...future.futureOptionsAdded) > [18:40:47.719] 0L) { [18:40:47.719] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:40:47.719] base::names(opts) <- ...future.futureOptionsAdded [18:40:47.719] base::options(opts) [18:40:47.719] } [18:40:47.719] { [18:40:47.719] { [18:40:47.719] base::assign(".Random.seed", c(10407L, -585360144L, [18:40:47.719] 2045164431L, 331696693L, 805922727L, -792336278L, [18:40:47.719] 336250629L), envir = base::globalenv(), inherits = FALSE) [18:40:47.719] NULL [18:40:47.719] } [18:40:47.719] options(future.plan = NULL) [18:40:47.719] if (is.na(NA_character_)) [18:40:47.719] Sys.unsetenv("R_FUTURE_PLAN") [18:40:47.719] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:40:47.719] future::plan(...future.strategy.old, .cleanup = FALSE, [18:40:47.719] .init = FALSE) [18:40:47.719] } [18:40:47.719] } [18:40:47.719] } [18:40:47.719] }) [18:40:47.719] if (TRUE) { [18:40:47.719] base::sink(type = "output", split = FALSE) [18:40:47.719] if (TRUE) { [18:40:47.719] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:40:47.719] } [18:40:47.719] else { [18:40:47.719] ...future.result["stdout"] <- base::list(NULL) [18:40:47.719] } [18:40:47.719] base::close(...future.stdout) [18:40:47.719] ...future.stdout <- NULL [18:40:47.719] } [18:40:47.719] ...future.result$conditions <- ...future.conditions [18:40:47.719] ...future.result$finished <- base::Sys.time() [18:40:47.719] ...future.result [18:40:47.719] } [18:40:47.723] assign_globals() ... [18:40:47.723] List of 5 [18:40:47.723] $ future.call.arguments : list() [18:40:47.723] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:47.723] $ ...future.FUN :function (x, size, replace = FALSE, prob = NULL) [18:40:47.723] $ ...future.elements_ii :List of 2 [18:40:47.723] ..$ : int [1:2] 1 3 [18:40:47.723] ..$ : int [1:2] 2 4 [18:40:47.723] $ ...future.seeds_ii :List of 2 [18:40:47.723] ..$ : int [1:7] 10407 1242173061 -1150840343 -834448425 701050094 -1369558043 -650964284 [18:40:47.723] ..$ : int [1:7] 10407 859061261 1088872332 -1371790091 -942478768 -889560561 1393381402 [18:40:47.723] $ ...future.globals.maxSize: num Inf [18:40:47.723] - attr(*, "resolved")= logi FALSE [18:40:47.723] - attr(*, "total_size")= num NA [18:40:47.723] - attr(*, "where")=List of 5 [18:40:47.723] ..$ future.call.arguments : [18:40:47.723] ..$ ...future.FUN : [18:40:47.723] ..$ ...future.elements_ii : [18:40:47.723] ..$ ...future.seeds_ii : [18:40:47.723] ..$ ...future.globals.maxSize: [18:40:47.723] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:47.723] - attr(*, "already-done")= logi TRUE [18:40:47.730] - copied 'future.call.arguments' to environment [18:40:47.730] - copied '...future.FUN' to environment [18:40:47.730] - copied '...future.elements_ii' to environment [18:40:47.730] - copied '...future.seeds_ii' to environment [18:40:47.730] - copied '...future.globals.maxSize' to environment [18:40:47.731] assign_globals() ... done [18:40:47.731] plan(): Setting new future strategy stack: [18:40:47.731] List of future strategies: [18:40:47.731] 1. sequential: [18:40:47.731] - args: function (..., envir = parent.frame(), workers = "") [18:40:47.731] - tweaked: FALSE [18:40:47.731] - call: NULL [18:40:47.732] plan(): nbrOfWorkers() = 1 [18:40:47.733] plan(): Setting new future strategy stack: [18:40:47.733] List of future strategies: [18:40:47.733] 1. sequential: [18:40:47.733] - args: function (..., envir = parent.frame(), workers = "") [18:40:47.733] - tweaked: FALSE [18:40:47.733] - call: plan(strategy) [18:40:47.734] plan(): nbrOfWorkers() = 1 [18:40:47.734] SequentialFuture started (and completed) [18:40:47.734] - Launch lazy future ... done [18:40:47.734] run() for 'SequentialFuture' ... done [18:40:47.735] Created future: [18:40:47.735] SequentialFuture: [18:40:47.735] Label: 'future_apply-1' [18:40:47.735] Expression: [18:40:47.735] { [18:40:47.735] do.call(function(...) { [18:40:47.735] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:47.735] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:47.735] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:47.735] on.exit(options(oopts), add = TRUE) [18:40:47.735] } [18:40:47.735] { [18:40:47.735] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:47.735] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:47.735] assign(".Random.seed", ...future.seeds_ii[[jj]], [18:40:47.735] envir = globalenv(), inherits = FALSE) [18:40:47.735] ...future.FUN(...future.X_jj, ...) [18:40:47.735] }) [18:40:47.735] } [18:40:47.735] }, args = future.call.arguments) [18:40:47.735] } [18:40:47.735] Lazy evaluation: FALSE [18:40:47.735] Asynchronous evaluation: FALSE [18:40:47.735] Local evaluation: TRUE [18:40:47.735] Environment: R_GlobalEnv [18:40:47.735] Capture standard output: TRUE [18:40:47.735] Capture condition classes: [18:40:47.735] Globals: 5 objects totaling 3.95 KiB (DotDotDotList 'future.call.arguments' of 97 bytes, function '...future.FUN' of 3.66 KiB, list '...future.elements_ii' of 63 bytes, list '...future.seeds_ii' of 103 bytes, numeric '...future.globals.maxSize' of 39 bytes) [18:40:47.735] Packages: [18:40:47.735] L'Ecuyer-CMRG RNG seed: (seed = NULL) [18:40:47.735] Resolved: TRUE [18:40:47.735] Value: 63 bytes of class 'list' [18:40:47.735] Early signaling: FALSE [18:40:47.735] Owner process: 2171382a-9202-bc7d-80d6-248e0cb487f4 [18:40:47.735] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:40:47.736] Chunk #1 of 1 ... DONE [18:40:47.736] Launching 1 futures (chunks) ... DONE [18:40:47.736] Resolving 1 futures (chunks) ... [18:40:47.736] resolve() on list ... [18:40:47.736] recursive: 0 [18:40:47.737] length: 1 [18:40:47.737] [18:40:47.737] resolved() for 'SequentialFuture' ... [18:40:47.737] - state: 'finished' [18:40:47.737] - run: TRUE [18:40:47.737] - result: 'FutureResult' [18:40:47.738] resolved() for 'SequentialFuture' ... done [18:40:47.738] Future #1 [18:40:47.738] signalConditionsASAP(SequentialFuture, pos=1) ... [18:40:47.738] - nx: 1 [18:40:47.738] - relay: TRUE [18:40:47.739] - stdout: TRUE [18:40:47.739] - signal: TRUE [18:40:47.739] - resignal: FALSE [18:40:47.739] - force: TRUE [18:40:47.739] - relayed: [n=1] FALSE [18:40:47.739] - queued futures: [n=1] FALSE [18:40:47.739] - until=1 [18:40:47.740] - relaying element #1 [18:40:47.740] - relayed: [n=1] TRUE [18:40:47.740] - queued futures: [n=1] TRUE [18:40:47.740] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:40:47.740] length: 0 (resolved future 1) [18:40:47.741] Relaying remaining futures [18:40:47.741] signalConditionsASAP(NULL, pos=0) ... [18:40:47.741] - nx: 1 [18:40:47.741] - relay: TRUE [18:40:47.741] - stdout: TRUE [18:40:47.741] - signal: TRUE [18:40:47.741] - resignal: FALSE [18:40:47.742] - force: TRUE [18:40:47.742] - relayed: [n=1] TRUE [18:40:47.742] - queued futures: [n=1] TRUE - flush all [18:40:47.742] - relayed: [n=1] TRUE [18:40:47.742] - queued futures: [n=1] TRUE [18:40:47.742] signalConditionsASAP(NULL, pos=0) ... done [18:40:47.743] resolve() on list ... DONE [18:40:47.743] - Number of value chunks collected: 1 [18:40:47.743] Resolving 1 futures (chunks) ... DONE [18:40:47.743] Reducing values from 1 chunks ... [18:40:47.743] - Number of values collected after concatenation: 2 [18:40:47.743] - Number of values expected: 2 [18:40:47.744] Reducing values from 1 chunks ... DONE [18:40:47.744] future_lapply() ... DONE [,1] [,2] [1,] 3 2 [2,] 1 4 [18:40:47.744] plan(): Setting new future strategy stack: [18:40:47.744] List of future strategies: [18:40:47.744] 1. sequential: [18:40:47.744] - args: function (..., envir = parent.frame(), workers = "") [18:40:47.744] - tweaked: FALSE [18:40:47.744] - call: plan(sequential) [18:40:47.745] plan(): nbrOfWorkers() = 1 *** strategy = 'sequential' ... done *** strategy = 'multisession' ... [18:40:47.745] plan(): Setting new future strategy stack: [18:40:47.746] List of future strategies: [18:40:47.746] 1. multisession: [18:40:47.746] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:40:47.746] - tweaked: FALSE [18:40:47.746] - call: plan(strategy) [18:40:47.746] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... [18:40:47.746] multisession: [18:40:47.746] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:40:47.746] - tweaked: FALSE [18:40:47.746] - call: plan(strategy) [18:40:47.750] getGlobalsAndPackages() ... [18:40:47.751] Not searching for globals [18:40:47.751] - globals: [0] [18:40:47.751] getGlobalsAndPackages() ... DONE [18:40:47.752] [local output] makeClusterPSOCK() ... [18:40:47.788] [local output] Workers: [n = 2] 'localhost', 'localhost' [18:40:47.795] [local output] Base port: 20788 [18:40:47.795] [local output] Getting setup options for 2 cluster nodes ... [18:40:47.796] [local output] - Node #1 of 2 ... [18:40:47.796] [local output] localMachine=TRUE => revtunnel=FALSE [18:40:47.798] Testing if worker's PID can be inferred: '"D:/RCompile/recent/R/bin/x64/Rscript" -e "try(suppressWarnings(cat(Sys.getpid(),file=\"D:/temp/RtmpCqNDI5/worker.rank=1.parallelly.parent=154416.25b304e51529a.pid\")), silent = TRUE)" -e "file.exists(\"D:/temp/RtmpCqNDI5/worker.rank=1.parallelly.parent=154416.25b304e51529a.pid\")"' [18:40:48.014] - Possible to infer worker's PID: TRUE [18:40:48.015] [local output] Rscript port: 20788 [18:40:48.016] [local output] - Node #2 of 2 ... [18:40:48.016] [local output] localMachine=TRUE => revtunnel=FALSE [18:40:48.018] [local output] Rscript port: 20788 [18:40:48.018] [local output] Getting setup options for 2 cluster nodes ... done [18:40:48.018] [local output] - Parallel setup requested for some PSOCK nodes [18:40:48.019] [local output] Setting up PSOCK nodes in parallel [18:40:48.019] List of 36 [18:40:48.019] $ worker : chr "localhost" [18:40:48.019] ..- attr(*, "localhost")= logi TRUE [18:40:48.019] $ master : chr "localhost" [18:40:48.019] $ port : int 20788 [18:40:48.019] $ connectTimeout : num 120 [18:40:48.019] $ timeout : num 120 [18:40:48.019] $ rscript : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\"" [18:40:48.019] $ homogeneous : logi TRUE [18:40:48.019] $ rscript_args : chr "--default-packages=datasets,utils,grDevices,graphics,stats,methods -e \"#label=future_apply.R:154416:CRANWIN3:C"| __truncated__ [18:40:48.019] $ rscript_envs : NULL [18:40:48.019] $ rscript_libs : chr [1:2] "D:/temp/Rtmpi4y3mu/RLIBS_25080533fa8" "D:/RCompile/recent/R/library" [18:40:48.019] $ rscript_startup : NULL [18:40:48.019] $ rscript_sh : chr [1:2] "cmd" "cmd" [18:40:48.019] $ default_packages: chr [1:6] "datasets" "utils" "grDevices" "graphics" ... [18:40:48.019] $ methods : logi TRUE [18:40:48.019] $ socketOptions : chr "no-delay" [18:40:48.019] $ useXDR : logi FALSE [18:40:48.019] $ outfile : chr "/dev/null" [18:40:48.019] $ renice : int NA [18:40:48.019] $ rshcmd : NULL [18:40:48.019] $ user : chr(0) [18:40:48.019] $ revtunnel : logi FALSE [18:40:48.019] $ rshlogfile : NULL [18:40:48.019] $ rshopts : chr(0) [18:40:48.019] $ rank : int 1 [18:40:48.019] $ manual : logi FALSE [18:40:48.019] $ dryrun : logi FALSE [18:40:48.019] $ quiet : logi FALSE [18:40:48.019] $ setup_strategy : chr "parallel" [18:40:48.019] $ local_cmd : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "| __truncated__ [18:40:48.019] $ pidfile : chr "D:/temp/RtmpCqNDI5/worker.rank=1.parallelly.parent=154416.25b304e51529a.pid" [18:40:48.019] $ rshcmd_label : NULL [18:40:48.019] $ rsh_call : NULL [18:40:48.019] $ cmd : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "| __truncated__ [18:40:48.019] $ localMachine : logi TRUE [18:40:48.019] $ make_fcn :function (worker = getOption2("parallelly.localhost.hostname", "localhost"), [18:40:48.019] master = NULL, port, connectTimeout = getOption2("parallelly.makeNodePSOCK.connectTimeout", [18:40:48.019] 2 * 60), timeout = getOption2("parallelly.makeNodePSOCK.timeout", [18:40:48.019] 30 * 24 * 60 * 60), rscript = NULL, homogeneous = NULL, rscript_args = NULL, [18:40:48.019] rscript_envs = NULL, rscript_libs = NULL, rscript_startup = NULL, rscript_sh = c("auto", [18:40:48.019] "cmd", "sh", "none"), default_packages = c("datasets", "utils", [18:40:48.019] "grDevices", "graphics", "stats", if (methods) "methods"), methods = TRUE, [18:40:48.019] socketOptions = getOption2("parallelly.makeNodePSOCK.socketOptions", [18:40:48.019] "no-delay"), useXDR = getOption2("parallelly.makeNodePSOCK.useXDR", [18:40:48.019] FALSE), outfile = "/dev/null", renice = NA_integer_, rshcmd = getOption2("parallelly.makeNodePSOCK.rshcmd", [18:40:48.019] NULL), user = NULL, revtunnel = NA, rshlogfile = NULL, rshopts = getOption2("parallelly.makeNodePSOCK.rshopts", [18:40:48.019] NULL), rank = 1L, manual = FALSE, dryrun = FALSE, quiet = FALSE, [18:40:48.019] setup_strategy = getOption2("parallelly.makeNodePSOCK.setup_strategy", [18:40:48.019] "parallel"), action = c("launch", "options"), verbose = FALSE) [18:40:48.019] $ arguments :List of 28 [18:40:48.019] ..$ worker : chr "localhost" [18:40:48.019] ..$ master : NULL [18:40:48.019] ..$ port : int 20788 [18:40:48.019] ..$ connectTimeout : num 120 [18:40:48.019] ..$ timeout : num 120 [18:40:48.019] ..$ rscript : NULL [18:40:48.019] ..$ homogeneous : NULL [18:40:48.019] ..$ rscript_args : NULL [18:40:48.019] ..$ rscript_envs : NULL [18:40:48.019] ..$ rscript_libs : chr [1:2] "D:/temp/Rtmpi4y3mu/RLIBS_25080533fa8" "D:/RCompile/recent/R/library" [18:40:48.019] ..$ rscript_startup : NULL [18:40:48.019] ..$ rscript_sh : chr "auto" [18:40:48.019] ..$ default_packages: chr [1:6] "datasets" "utils" "grDevices" "graphics" ... [18:40:48.019] ..$ methods : logi TRUE [18:40:48.019] ..$ socketOptions : chr "no-delay" [18:40:48.019] ..$ useXDR : logi FALSE [18:40:48.019] ..$ outfile : chr "/dev/null" [18:40:48.019] ..$ renice : int NA [18:40:48.019] ..$ rshcmd : NULL [18:40:48.019] ..$ user : NULL [18:40:48.019] ..$ revtunnel : logi NA [18:40:48.019] ..$ rshlogfile : NULL [18:40:48.019] ..$ rshopts : NULL [18:40:48.019] ..$ rank : int 1 [18:40:48.019] ..$ manual : logi FALSE [18:40:48.019] ..$ dryrun : logi FALSE [18:40:48.019] ..$ quiet : logi FALSE [18:40:48.019] ..$ setup_strategy : chr "parallel" [18:40:48.019] - attr(*, "class")= chr [1:2] "makeNodePSOCKOptions" "makeNodeOptions" [18:40:48.042] [local output] System call to launch all workers: [18:40:48.042] [local output] "D:/RCompile/recent/R/bin/x64/Rscript" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "#label=future_apply.R:154416:CRANWIN3:CRAN" -e "try(suppressWarnings(cat(Sys.getpid(),file=\"D:/temp/RtmpCqNDI5/worker.rank=1.parallelly.parent=154416.25b304e51529a.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=20788 OUT=/dev/null TIMEOUT=120 XDR=FALSE SETUPTIMEOUT=120 SETUPSTRATEGY=parallel [18:40:48.042] [local output] Starting PSOCK main server [18:40:48.048] [local output] Workers launched [18:40:48.049] [local output] Waiting for workers to connect back [18:40:48.049] - [local output] 0 workers out of 2 ready [18:40:48.223] - [local output] 0 workers out of 2 ready [18:40:48.224] - [local output] 1 workers out of 2 ready [18:40:48.268] - [local output] 1 workers out of 2 ready [18:40:48.268] - [local output] 2 workers out of 2 ready [18:40:48.269] [local output] Launching of 2 workers completed [18:40:48.269] [local output] Number of nodes in cluster: 2 [18:40:48.269] [local output] Collecting session information from 2 workers [18:40:48.270] [local output] - Worker #1 of 2 [18:40:48.271] [local output] - Worker #2 of 2 [18:40:48.271] [local output] makeClusterPSOCK() ... done [18:40:48.285] Packages needed by the future expression (n = 0): [18:40:48.285] Packages needed by future strategies (n = 0): [18:40:48.285] { [18:40:48.285] { [18:40:48.285] { [18:40:48.285] ...future.startTime <- base::Sys.time() [18:40:48.285] { [18:40:48.285] { [18:40:48.285] { [18:40:48.285] { [18:40:48.285] base::local({ [18:40:48.285] has_future <- base::requireNamespace("future", [18:40:48.285] quietly = TRUE) [18:40:48.285] if (has_future) { [18:40:48.285] ns <- base::getNamespace("future") [18:40:48.285] version <- ns[[".package"]][["version"]] [18:40:48.285] if (is.null(version)) [18:40:48.285] version <- utils::packageVersion("future") [18:40:48.285] } [18:40:48.285] else { [18:40:48.285] version <- NULL [18:40:48.285] } [18:40:48.285] if (!has_future || version < "1.8.0") { [18:40:48.285] info <- base::c(r_version = base::gsub("R version ", [18:40:48.285] "", base::R.version$version.string), [18:40:48.285] platform = base::sprintf("%s (%s-bit)", [18:40:48.285] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:40:48.285] os = base::paste(base::Sys.info()[base::c("sysname", [18:40:48.285] "release", "version")], collapse = " "), [18:40:48.285] hostname = base::Sys.info()[["nodename"]]) [18:40:48.285] info <- base::sprintf("%s: %s", base::names(info), [18:40:48.285] info) [18:40:48.285] info <- base::paste(info, collapse = "; ") [18:40:48.285] if (!has_future) { [18:40:48.285] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:40:48.285] info) [18:40:48.285] } [18:40:48.285] else { [18:40:48.285] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:40:48.285] info, version) [18:40:48.285] } [18:40:48.285] base::stop(msg) [18:40:48.285] } [18:40:48.285] }) [18:40:48.285] } [18:40:48.285] ...future.mc.cores.old <- base::getOption("mc.cores") [18:40:48.285] base::options(mc.cores = 1L) [18:40:48.285] } [18:40:48.285] ...future.strategy.old <- future::plan("list") [18:40:48.285] options(future.plan = NULL) [18:40:48.285] Sys.unsetenv("R_FUTURE_PLAN") [18:40:48.285] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:40:48.285] } [18:40:48.285] ...future.workdir <- getwd() [18:40:48.285] } [18:40:48.285] ...future.oldOptions <- base::as.list(base::.Options) [18:40:48.285] ...future.oldEnvVars <- base::Sys.getenv() [18:40:48.285] } [18:40:48.285] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:40:48.285] future.globals.maxSize = NULL, future.globals.method = NULL, [18:40:48.285] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:40:48.285] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:40:48.285] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:40:48.285] future.stdout.windows.reencode = NULL, width = 80L) [18:40:48.285] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:40:48.285] base::names(...future.oldOptions)) [18:40:48.285] } [18:40:48.285] if (FALSE) { [18:40:48.285] } [18:40:48.285] else { [18:40:48.285] if (TRUE) { [18:40:48.285] ...future.stdout <- base::rawConnection(base::raw(0L), [18:40:48.285] open = "w") [18:40:48.285] } [18:40:48.285] else { [18:40:48.285] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:40:48.285] windows = "NUL", "/dev/null"), open = "w") [18:40:48.285] } [18:40:48.285] base::sink(...future.stdout, type = "output", split = FALSE) [18:40:48.285] base::on.exit(if (!base::is.null(...future.stdout)) { [18:40:48.285] base::sink(type = "output", split = FALSE) [18:40:48.285] base::close(...future.stdout) [18:40:48.285] }, add = TRUE) [18:40:48.285] } [18:40:48.285] ...future.frame <- base::sys.nframe() [18:40:48.285] ...future.conditions <- base::list() [18:40:48.285] ...future.rng <- base::globalenv()$.Random.seed [18:40:48.285] if (FALSE) { [18:40:48.285] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:40:48.285] "...future.value", "...future.globalenv.names", ".Random.seed") [18:40:48.285] } [18:40:48.285] ...future.result <- base::tryCatch({ [18:40:48.285] base::withCallingHandlers({ [18:40:48.285] ...future.value <- base::withVisible(base::local({ [18:40:48.285] ...future.makeSendCondition <- base::local({ [18:40:48.285] sendCondition <- NULL [18:40:48.285] function(frame = 1L) { [18:40:48.285] if (is.function(sendCondition)) [18:40:48.285] return(sendCondition) [18:40:48.285] ns <- getNamespace("parallel") [18:40:48.285] if (exists("sendData", mode = "function", [18:40:48.285] envir = ns)) { [18:40:48.285] parallel_sendData <- get("sendData", mode = "function", [18:40:48.285] envir = ns) [18:40:48.285] envir <- sys.frame(frame) [18:40:48.285] master <- NULL [18:40:48.285] while (!identical(envir, .GlobalEnv) && [18:40:48.285] !identical(envir, emptyenv())) { [18:40:48.285] if (exists("master", mode = "list", envir = envir, [18:40:48.285] inherits = FALSE)) { [18:40:48.285] master <- get("master", mode = "list", [18:40:48.285] envir = envir, inherits = FALSE) [18:40:48.285] if (inherits(master, c("SOCKnode", [18:40:48.285] "SOCK0node"))) { [18:40:48.285] sendCondition <<- function(cond) { [18:40:48.285] data <- list(type = "VALUE", value = cond, [18:40:48.285] success = TRUE) [18:40:48.285] parallel_sendData(master, data) [18:40:48.285] } [18:40:48.285] return(sendCondition) [18:40:48.285] } [18:40:48.285] } [18:40:48.285] frame <- frame + 1L [18:40:48.285] envir <- sys.frame(frame) [18:40:48.285] } [18:40:48.285] } [18:40:48.285] sendCondition <<- function(cond) NULL [18:40:48.285] } [18:40:48.285] }) [18:40:48.285] withCallingHandlers({ [18:40:48.285] NA [18:40:48.285] }, immediateCondition = function(cond) { [18:40:48.285] sendCondition <- ...future.makeSendCondition() [18:40:48.285] sendCondition(cond) [18:40:48.285] muffleCondition <- function (cond, pattern = "^muffle") [18:40:48.285] { [18:40:48.285] inherits <- base::inherits [18:40:48.285] invokeRestart <- base::invokeRestart [18:40:48.285] is.null <- base::is.null [18:40:48.285] muffled <- FALSE [18:40:48.285] if (inherits(cond, "message")) { [18:40:48.285] muffled <- grepl(pattern, "muffleMessage") [18:40:48.285] if (muffled) [18:40:48.285] invokeRestart("muffleMessage") [18:40:48.285] } [18:40:48.285] else if (inherits(cond, "warning")) { [18:40:48.285] muffled <- grepl(pattern, "muffleWarning") [18:40:48.285] if (muffled) [18:40:48.285] invokeRestart("muffleWarning") [18:40:48.285] } [18:40:48.285] else if (inherits(cond, "condition")) { [18:40:48.285] if (!is.null(pattern)) { [18:40:48.285] computeRestarts <- base::computeRestarts [18:40:48.285] grepl <- base::grepl [18:40:48.285] restarts <- computeRestarts(cond) [18:40:48.285] for (restart in restarts) { [18:40:48.285] name <- restart$name [18:40:48.285] if (is.null(name)) [18:40:48.285] next [18:40:48.285] if (!grepl(pattern, name)) [18:40:48.285] next [18:40:48.285] invokeRestart(restart) [18:40:48.285] muffled <- TRUE [18:40:48.285] break [18:40:48.285] } [18:40:48.285] } [18:40:48.285] } [18:40:48.285] invisible(muffled) [18:40:48.285] } [18:40:48.285] muffleCondition(cond) [18:40:48.285] }) [18:40:48.285] })) [18:40:48.285] future::FutureResult(value = ...future.value$value, [18:40:48.285] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:40:48.285] ...future.rng), globalenv = if (FALSE) [18:40:48.285] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:40:48.285] ...future.globalenv.names)) [18:40:48.285] else NULL, started = ...future.startTime, version = "1.8") [18:40:48.285] }, condition = base::local({ [18:40:48.285] c <- base::c [18:40:48.285] inherits <- base::inherits [18:40:48.285] invokeRestart <- base::invokeRestart [18:40:48.285] length <- base::length [18:40:48.285] list <- base::list [18:40:48.285] seq.int <- base::seq.int [18:40:48.285] signalCondition <- base::signalCondition [18:40:48.285] sys.calls <- base::sys.calls [18:40:48.285] `[[` <- base::`[[` [18:40:48.285] `+` <- base::`+` [18:40:48.285] `<<-` <- base::`<<-` [18:40:48.285] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:40:48.285] calls[seq.int(from = from + 12L, to = length(calls) - [18:40:48.285] 3L)] [18:40:48.285] } [18:40:48.285] function(cond) { [18:40:48.285] is_error <- inherits(cond, "error") [18:40:48.285] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:40:48.285] NULL) [18:40:48.285] if (is_error) { [18:40:48.285] sessionInformation <- function() { [18:40:48.285] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:40:48.285] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:40:48.285] search = base::search(), system = base::Sys.info()) [18:40:48.285] } [18:40:48.285] ...future.conditions[[length(...future.conditions) + [18:40:48.285] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:40:48.285] cond$call), session = sessionInformation(), [18:40:48.285] timestamp = base::Sys.time(), signaled = 0L) [18:40:48.285] signalCondition(cond) [18:40:48.285] } [18:40:48.285] else if (!ignore && TRUE && inherits(cond, c("condition", [18:40:48.285] "immediateCondition"))) { [18:40:48.285] signal <- TRUE && inherits(cond, "immediateCondition") [18:40:48.285] ...future.conditions[[length(...future.conditions) + [18:40:48.285] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:40:48.285] if (TRUE && !signal) { [18:40:48.285] muffleCondition <- function (cond, pattern = "^muffle") [18:40:48.285] { [18:40:48.285] inherits <- base::inherits [18:40:48.285] invokeRestart <- base::invokeRestart [18:40:48.285] is.null <- base::is.null [18:40:48.285] muffled <- FALSE [18:40:48.285] if (inherits(cond, "message")) { [18:40:48.285] muffled <- grepl(pattern, "muffleMessage") [18:40:48.285] if (muffled) [18:40:48.285] invokeRestart("muffleMessage") [18:40:48.285] } [18:40:48.285] else if (inherits(cond, "warning")) { [18:40:48.285] muffled <- grepl(pattern, "muffleWarning") [18:40:48.285] if (muffled) [18:40:48.285] invokeRestart("muffleWarning") [18:40:48.285] } [18:40:48.285] else if (inherits(cond, "condition")) { [18:40:48.285] if (!is.null(pattern)) { [18:40:48.285] computeRestarts <- base::computeRestarts [18:40:48.285] grepl <- base::grepl [18:40:48.285] restarts <- computeRestarts(cond) [18:40:48.285] for (restart in restarts) { [18:40:48.285] name <- restart$name [18:40:48.285] if (is.null(name)) [18:40:48.285] next [18:40:48.285] if (!grepl(pattern, name)) [18:40:48.285] next [18:40:48.285] invokeRestart(restart) [18:40:48.285] muffled <- TRUE [18:40:48.285] break [18:40:48.285] } [18:40:48.285] } [18:40:48.285] } [18:40:48.285] invisible(muffled) [18:40:48.285] } [18:40:48.285] muffleCondition(cond, pattern = "^muffle") [18:40:48.285] } [18:40:48.285] } [18:40:48.285] else { [18:40:48.285] if (TRUE) { [18:40:48.285] muffleCondition <- function (cond, pattern = "^muffle") [18:40:48.285] { [18:40:48.285] inherits <- base::inherits [18:40:48.285] invokeRestart <- base::invokeRestart [18:40:48.285] is.null <- base::is.null [18:40:48.285] muffled <- FALSE [18:40:48.285] if (inherits(cond, "message")) { [18:40:48.285] muffled <- grepl(pattern, "muffleMessage") [18:40:48.285] if (muffled) [18:40:48.285] invokeRestart("muffleMessage") [18:40:48.285] } [18:40:48.285] else if (inherits(cond, "warning")) { [18:40:48.285] muffled <- grepl(pattern, "muffleWarning") [18:40:48.285] if (muffled) [18:40:48.285] invokeRestart("muffleWarning") [18:40:48.285] } [18:40:48.285] else if (inherits(cond, "condition")) { [18:40:48.285] if (!is.null(pattern)) { [18:40:48.285] computeRestarts <- base::computeRestarts [18:40:48.285] grepl <- base::grepl [18:40:48.285] restarts <- computeRestarts(cond) [18:40:48.285] for (restart in restarts) { [18:40:48.285] name <- restart$name [18:40:48.285] if (is.null(name)) [18:40:48.285] next [18:40:48.285] if (!grepl(pattern, name)) [18:40:48.285] next [18:40:48.285] invokeRestart(restart) [18:40:48.285] muffled <- TRUE [18:40:48.285] break [18:40:48.285] } [18:40:48.285] } [18:40:48.285] } [18:40:48.285] invisible(muffled) [18:40:48.285] } [18:40:48.285] muffleCondition(cond, pattern = "^muffle") [18:40:48.285] } [18:40:48.285] } [18:40:48.285] } [18:40:48.285] })) [18:40:48.285] }, error = function(ex) { [18:40:48.285] base::structure(base::list(value = NULL, visible = NULL, [18:40:48.285] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:40:48.285] ...future.rng), started = ...future.startTime, [18:40:48.285] finished = Sys.time(), session_uuid = NA_character_, [18:40:48.285] version = "1.8"), class = "FutureResult") [18:40:48.285] }, finally = { [18:40:48.285] if (!identical(...future.workdir, getwd())) [18:40:48.285] setwd(...future.workdir) [18:40:48.285] { [18:40:48.285] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:40:48.285] ...future.oldOptions$nwarnings <- NULL [18:40:48.285] } [18:40:48.285] base::options(...future.oldOptions) [18:40:48.285] if (.Platform$OS.type == "windows") { [18:40:48.285] old_names <- names(...future.oldEnvVars) [18:40:48.285] envs <- base::Sys.getenv() [18:40:48.285] names <- names(envs) [18:40:48.285] common <- intersect(names, old_names) [18:40:48.285] added <- setdiff(names, old_names) [18:40:48.285] removed <- setdiff(old_names, names) [18:40:48.285] changed <- common[...future.oldEnvVars[common] != [18:40:48.285] envs[common]] [18:40:48.285] NAMES <- toupper(changed) [18:40:48.285] args <- list() [18:40:48.285] for (kk in seq_along(NAMES)) { [18:40:48.285] name <- changed[[kk]] [18:40:48.285] NAME <- NAMES[[kk]] [18:40:48.285] if (name != NAME && is.element(NAME, old_names)) [18:40:48.285] next [18:40:48.285] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:48.285] } [18:40:48.285] NAMES <- toupper(added) [18:40:48.285] for (kk in seq_along(NAMES)) { [18:40:48.285] name <- added[[kk]] [18:40:48.285] NAME <- NAMES[[kk]] [18:40:48.285] if (name != NAME && is.element(NAME, old_names)) [18:40:48.285] next [18:40:48.285] args[[name]] <- "" [18:40:48.285] } [18:40:48.285] NAMES <- toupper(removed) [18:40:48.285] for (kk in seq_along(NAMES)) { [18:40:48.285] name <- removed[[kk]] [18:40:48.285] NAME <- NAMES[[kk]] [18:40:48.285] if (name != NAME && is.element(NAME, old_names)) [18:40:48.285] next [18:40:48.285] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:48.285] } [18:40:48.285] if (length(args) > 0) [18:40:48.285] base::do.call(base::Sys.setenv, args = args) [18:40:48.285] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:40:48.285] } [18:40:48.285] else { [18:40:48.285] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:40:48.285] } [18:40:48.285] { [18:40:48.285] if (base::length(...future.futureOptionsAdded) > [18:40:48.285] 0L) { [18:40:48.285] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:40:48.285] base::names(opts) <- ...future.futureOptionsAdded [18:40:48.285] base::options(opts) [18:40:48.285] } [18:40:48.285] { [18:40:48.285] { [18:40:48.285] base::options(mc.cores = ...future.mc.cores.old) [18:40:48.285] NULL [18:40:48.285] } [18:40:48.285] options(future.plan = NULL) [18:40:48.285] if (is.na(NA_character_)) [18:40:48.285] Sys.unsetenv("R_FUTURE_PLAN") [18:40:48.285] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:40:48.285] future::plan(...future.strategy.old, .cleanup = FALSE, [18:40:48.285] .init = FALSE) [18:40:48.285] } [18:40:48.285] } [18:40:48.285] } [18:40:48.285] }) [18:40:48.285] if (TRUE) { [18:40:48.285] base::sink(type = "output", split = FALSE) [18:40:48.285] if (TRUE) { [18:40:48.285] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:40:48.285] } [18:40:48.285] else { [18:40:48.285] ...future.result["stdout"] <- base::list(NULL) [18:40:48.285] } [18:40:48.285] base::close(...future.stdout) [18:40:48.285] ...future.stdout <- NULL [18:40:48.285] } [18:40:48.285] ...future.result$conditions <- ...future.conditions [18:40:48.285] ...future.result$finished <- base::Sys.time() [18:40:48.285] ...future.result [18:40:48.285] } [18:40:48.374] MultisessionFuture started [18:40:48.375] result() for ClusterFuture ... [18:40:48.375] receiveMessageFromWorker() for ClusterFuture ... [18:40:48.375] - Validating connection of MultisessionFuture [18:40:48.428] - received message: FutureResult [18:40:48.428] - Received FutureResult [18:40:48.431] - Erased future from FutureRegistry [18:40:48.431] result() for ClusterFuture ... [18:40:48.431] - result already collected: FutureResult [18:40:48.431] result() for ClusterFuture ... done [18:40:48.431] receiveMessageFromWorker() for ClusterFuture ... done [18:40:48.432] result() for ClusterFuture ... done [18:40:48.432] result() for ClusterFuture ... [18:40:48.432] - result already collected: FutureResult [18:40:48.432] result() for ClusterFuture ... done [18:40:48.432] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... DONE [18:40:48.435] plan(): nbrOfWorkers() = 2 - From example(apply) ... [18:40:48.435] getGlobalsAndPackagesXApply() ... [18:40:48.435] - future.globals: TRUE [18:40:48.436] getGlobalsAndPackages() ... [18:40:48.436] Searching for globals... [18:40:48.483] - globals found: [59] 'FUN', 'if', '==', 'c', 'list.names', '{', '<-', '[', 'as.list', 'substitute', '-', '&&', 'length', 'is.list', '!', 'is.null', 'names', 'return', 'seq_along', 'vapply', 'switch', '+', 'is.symbol', 'as.character', 'deparse', '[<-', 'missing', 'match', 'match.arg', '!=', 'warning', 'list', '[[', 'paste', 'stop', 'integer', 'for', 'is.factor', 'anyNA', 'options', 'on.exit', 'factor', '(', '||', 'levels', 'as.integer', 'which', 'is.na', 'is.na<-', '>', 'prod', '$', '.Machine', '*', 'names<-', 'array', 'tabulate', 'class', 'class<-' [18:40:48.483] Searching for globals ... DONE [18:40:48.483] Resolving globals: FALSE [18:40:48.486] The total size of the 1 globals is 31.30 KiB (32048 bytes) [18:40:48.486] The total size of the 1 globals exported for future expression ('FUN(X = structure(c(1, 2, 3, 4, 1, 6, 7, 8), dim = c(2L, 4L)))') is 31.30 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (31.30 KiB of class 'function') [18:40:48.486] - globals: [1] 'FUN' [18:40:48.487] [18:40:48.487] getGlobalsAndPackages() ... DONE [18:40:48.487] - globals found/used: [n=1] 'FUN' [18:40:48.487] - needed namespaces: [n=0] [18:40:48.487] Finding globals ... DONE [18:40:48.487] - use_args: TRUE [18:40:48.487] - Getting '...' globals ... [18:40:48.488] resolve() on list ... [18:40:48.488] recursive: 0 [18:40:48.488] length: 1 [18:40:48.488] elements: '...' [18:40:48.489] length: 0 (resolved future 1) [18:40:48.489] resolve() on list ... DONE [18:40:48.489] - '...' content: [n=0] [18:40:48.489] List of 1 [18:40:48.489] $ ...: list() [18:40:48.489] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:48.489] - attr(*, "where")=List of 1 [18:40:48.489] ..$ ...: [18:40:48.489] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:48.489] - attr(*, "resolved")= logi TRUE [18:40:48.489] - attr(*, "total_size")= num NA [18:40:48.492] - Getting '...' globals ... DONE [18:40:48.493] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:40:48.493] List of 2 [18:40:48.493] $ ...future.FUN:function (..., exclude = if (useNA == "no") c(NA, NaN), useNA = c("no", [18:40:48.493] "ifany", "always"), dnn = list.names(...), deparse.level = 1) [18:40:48.493] $ ... : list() [18:40:48.493] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:48.493] - attr(*, "where")=List of 2 [18:40:48.493] ..$ ...future.FUN: [18:40:48.493] ..$ ... : [18:40:48.493] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:48.493] - attr(*, "resolved")= logi FALSE [18:40:48.493] - attr(*, "total_size")= int 65963 [18:40:48.496] Packages to be attached in all futures: [n=0] [18:40:48.496] getGlobalsAndPackagesXApply() ... DONE [18:40:48.499] future_lapply() ... [18:40:48.542] Number of chunks: 2 [18:40:48.542] getGlobalsAndPackagesXApply() ... [18:40:48.543] - future.globals: with names 'list()' [18:40:48.543] - use_args: TRUE [18:40:48.543] Globals to be used in all futures (chunks): [n=2] '...', '...future.FUN' [18:40:48.543] List of 2 [18:40:48.543] $ ... : list() [18:40:48.543] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:48.543] $ ...future.FUN:function (..., exclude = if (useNA == "no") c(NA, NaN), useNA = c("no", [18:40:48.543] "ifany", "always"), dnn = list.names(...), deparse.level = 1) [18:40:48.543] - attr(*, "where")=List of 2 [18:40:48.543] ..$ ... : [18:40:48.543] ..$ ...future.FUN: [18:40:48.543] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:48.543] - attr(*, "resolved")= logi FALSE [18:40:48.543] - attr(*, "total_size")= num NA [18:40:48.550] Packages to be attached in all futures: [n=0] [18:40:48.550] getGlobalsAndPackagesXApply() ... DONE [18:40:48.551] Number of futures (= number of chunks): 2 [18:40:48.551] Launching 2 futures (chunks) ... [18:40:48.551] Chunk #1 of 2 ... [18:40:48.552] - Adjusted option 'future.globals.maxSize': Inf -> 2 * Inf = Inf (bytes) [18:40:48.552] - seeds: [18:40:48.552] - All globals exported: [n=5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:48.552] getGlobalsAndPackages() ... [18:40:48.553] - globals passed as-is: [5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:48.553] Resolving globals: FALSE [18:40:48.553] Tweak future expression to call with '...' arguments ... [18:40:48.554] { [18:40:48.554] do.call(function(...) { [18:40:48.554] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:48.554] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:48.554] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:48.554] on.exit(options(oopts), add = TRUE) [18:40:48.554] } [18:40:48.554] { [18:40:48.554] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:48.554] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:48.554] ...future.FUN(...future.X_jj, ...) [18:40:48.554] }) [18:40:48.554] } [18:40:48.554] }, args = future.call.arguments) [18:40:48.554] } [18:40:48.554] Tweak future expression to call with '...' arguments ... DONE [18:40:48.555] - globals: [5] 'future.call.arguments', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:48.555] [18:40:48.555] getGlobalsAndPackages() ... DONE [18:40:48.556] run() for 'Future' ... [18:40:48.556] - state: 'created' [18:40:48.556] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:40:48.572] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:40:48.572] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:40:48.573] - Field: 'node' [18:40:48.573] - Field: 'label' [18:40:48.573] - Field: 'local' [18:40:48.573] - Field: 'owner' [18:40:48.573] - Field: 'envir' [18:40:48.573] - Field: 'workers' [18:40:48.574] - Field: 'packages' [18:40:48.574] - Field: 'gc' [18:40:48.574] - Field: 'conditions' [18:40:48.574] - Field: 'persistent' [18:40:48.574] - Field: 'expr' [18:40:48.574] - Field: 'uuid' [18:40:48.575] - Field: 'seed' [18:40:48.575] - Field: 'version' [18:40:48.575] - Field: 'result' [18:40:48.575] - Field: 'asynchronous' [18:40:48.575] - Field: 'calls' [18:40:48.576] - Field: 'globals' [18:40:48.576] - Field: 'stdout' [18:40:48.576] - Field: 'earlySignal' [18:40:48.576] - Field: 'lazy' [18:40:48.576] - Field: 'state' [18:40:48.576] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:40:48.577] - Launch lazy future ... [18:40:48.577] Packages needed by the future expression (n = 0): [18:40:48.577] Packages needed by future strategies (n = 0): [18:40:48.578] { [18:40:48.578] { [18:40:48.578] { [18:40:48.578] ...future.startTime <- base::Sys.time() [18:40:48.578] { [18:40:48.578] { [18:40:48.578] { [18:40:48.578] { [18:40:48.578] base::local({ [18:40:48.578] has_future <- base::requireNamespace("future", [18:40:48.578] quietly = TRUE) [18:40:48.578] if (has_future) { [18:40:48.578] ns <- base::getNamespace("future") [18:40:48.578] version <- ns[[".package"]][["version"]] [18:40:48.578] if (is.null(version)) [18:40:48.578] version <- utils::packageVersion("future") [18:40:48.578] } [18:40:48.578] else { [18:40:48.578] version <- NULL [18:40:48.578] } [18:40:48.578] if (!has_future || version < "1.8.0") { [18:40:48.578] info <- base::c(r_version = base::gsub("R version ", [18:40:48.578] "", base::R.version$version.string), [18:40:48.578] platform = base::sprintf("%s (%s-bit)", [18:40:48.578] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:40:48.578] os = base::paste(base::Sys.info()[base::c("sysname", [18:40:48.578] "release", "version")], collapse = " "), [18:40:48.578] hostname = base::Sys.info()[["nodename"]]) [18:40:48.578] info <- base::sprintf("%s: %s", base::names(info), [18:40:48.578] info) [18:40:48.578] info <- base::paste(info, collapse = "; ") [18:40:48.578] if (!has_future) { [18:40:48.578] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:40:48.578] info) [18:40:48.578] } [18:40:48.578] else { [18:40:48.578] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:40:48.578] info, version) [18:40:48.578] } [18:40:48.578] base::stop(msg) [18:40:48.578] } [18:40:48.578] }) [18:40:48.578] } [18:40:48.578] ...future.mc.cores.old <- base::getOption("mc.cores") [18:40:48.578] base::options(mc.cores = 1L) [18:40:48.578] } [18:40:48.578] ...future.strategy.old <- future::plan("list") [18:40:48.578] options(future.plan = NULL) [18:40:48.578] Sys.unsetenv("R_FUTURE_PLAN") [18:40:48.578] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:40:48.578] } [18:40:48.578] ...future.workdir <- getwd() [18:40:48.578] } [18:40:48.578] ...future.oldOptions <- base::as.list(base::.Options) [18:40:48.578] ...future.oldEnvVars <- base::Sys.getenv() [18:40:48.578] } [18:40:48.578] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:40:48.578] future.globals.maxSize = Inf, future.globals.method = NULL, [18:40:48.578] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:40:48.578] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:40:48.578] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:40:48.578] future.stdout.windows.reencode = NULL, width = 80L) [18:40:48.578] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:40:48.578] base::names(...future.oldOptions)) [18:40:48.578] } [18:40:48.578] if (FALSE) { [18:40:48.578] } [18:40:48.578] else { [18:40:48.578] if (TRUE) { [18:40:48.578] ...future.stdout <- base::rawConnection(base::raw(0L), [18:40:48.578] open = "w") [18:40:48.578] } [18:40:48.578] else { [18:40:48.578] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:40:48.578] windows = "NUL", "/dev/null"), open = "w") [18:40:48.578] } [18:40:48.578] base::sink(...future.stdout, type = "output", split = FALSE) [18:40:48.578] base::on.exit(if (!base::is.null(...future.stdout)) { [18:40:48.578] base::sink(type = "output", split = FALSE) [18:40:48.578] base::close(...future.stdout) [18:40:48.578] }, add = TRUE) [18:40:48.578] } [18:40:48.578] ...future.frame <- base::sys.nframe() [18:40:48.578] ...future.conditions <- base::list() [18:40:48.578] ...future.rng <- base::globalenv()$.Random.seed [18:40:48.578] if (FALSE) { [18:40:48.578] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:40:48.578] "...future.value", "...future.globalenv.names", ".Random.seed") [18:40:48.578] } [18:40:48.578] ...future.result <- base::tryCatch({ [18:40:48.578] base::withCallingHandlers({ [18:40:48.578] ...future.value <- base::withVisible(base::local({ [18:40:48.578] ...future.makeSendCondition <- base::local({ [18:40:48.578] sendCondition <- NULL [18:40:48.578] function(frame = 1L) { [18:40:48.578] if (is.function(sendCondition)) [18:40:48.578] return(sendCondition) [18:40:48.578] ns <- getNamespace("parallel") [18:40:48.578] if (exists("sendData", mode = "function", [18:40:48.578] envir = ns)) { [18:40:48.578] parallel_sendData <- get("sendData", mode = "function", [18:40:48.578] envir = ns) [18:40:48.578] envir <- sys.frame(frame) [18:40:48.578] master <- NULL [18:40:48.578] while (!identical(envir, .GlobalEnv) && [18:40:48.578] !identical(envir, emptyenv())) { [18:40:48.578] if (exists("master", mode = "list", envir = envir, [18:40:48.578] inherits = FALSE)) { [18:40:48.578] master <- get("master", mode = "list", [18:40:48.578] envir = envir, inherits = FALSE) [18:40:48.578] if (inherits(master, c("SOCKnode", [18:40:48.578] "SOCK0node"))) { [18:40:48.578] sendCondition <<- function(cond) { [18:40:48.578] data <- list(type = "VALUE", value = cond, [18:40:48.578] success = TRUE) [18:40:48.578] parallel_sendData(master, data) [18:40:48.578] } [18:40:48.578] return(sendCondition) [18:40:48.578] } [18:40:48.578] } [18:40:48.578] frame <- frame + 1L [18:40:48.578] envir <- sys.frame(frame) [18:40:48.578] } [18:40:48.578] } [18:40:48.578] sendCondition <<- function(cond) NULL [18:40:48.578] } [18:40:48.578] }) [18:40:48.578] withCallingHandlers({ [18:40:48.578] { [18:40:48.578] do.call(function(...) { [18:40:48.578] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:48.578] if (!identical(...future.globals.maxSize.org, [18:40:48.578] ...future.globals.maxSize)) { [18:40:48.578] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:48.578] on.exit(options(oopts), add = TRUE) [18:40:48.578] } [18:40:48.578] { [18:40:48.578] lapply(seq_along(...future.elements_ii), [18:40:48.578] FUN = function(jj) { [18:40:48.578] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:48.578] ...future.FUN(...future.X_jj, ...) [18:40:48.578] }) [18:40:48.578] } [18:40:48.578] }, args = future.call.arguments) [18:40:48.578] } [18:40:48.578] }, immediateCondition = function(cond) { [18:40:48.578] sendCondition <- ...future.makeSendCondition() [18:40:48.578] sendCondition(cond) [18:40:48.578] muffleCondition <- function (cond, pattern = "^muffle") [18:40:48.578] { [18:40:48.578] inherits <- base::inherits [18:40:48.578] invokeRestart <- base::invokeRestart [18:40:48.578] is.null <- base::is.null [18:40:48.578] muffled <- FALSE [18:40:48.578] if (inherits(cond, "message")) { [18:40:48.578] muffled <- grepl(pattern, "muffleMessage") [18:40:48.578] if (muffled) [18:40:48.578] invokeRestart("muffleMessage") [18:40:48.578] } [18:40:48.578] else if (inherits(cond, "warning")) { [18:40:48.578] muffled <- grepl(pattern, "muffleWarning") [18:40:48.578] if (muffled) [18:40:48.578] invokeRestart("muffleWarning") [18:40:48.578] } [18:40:48.578] else if (inherits(cond, "condition")) { [18:40:48.578] if (!is.null(pattern)) { [18:40:48.578] computeRestarts <- base::computeRestarts [18:40:48.578] grepl <- base::grepl [18:40:48.578] restarts <- computeRestarts(cond) [18:40:48.578] for (restart in restarts) { [18:40:48.578] name <- restart$name [18:40:48.578] if (is.null(name)) [18:40:48.578] next [18:40:48.578] if (!grepl(pattern, name)) [18:40:48.578] next [18:40:48.578] invokeRestart(restart) [18:40:48.578] muffled <- TRUE [18:40:48.578] break [18:40:48.578] } [18:40:48.578] } [18:40:48.578] } [18:40:48.578] invisible(muffled) [18:40:48.578] } [18:40:48.578] muffleCondition(cond) [18:40:48.578] }) [18:40:48.578] })) [18:40:48.578] future::FutureResult(value = ...future.value$value, [18:40:48.578] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:40:48.578] ...future.rng), globalenv = if (FALSE) [18:40:48.578] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:40:48.578] ...future.globalenv.names)) [18:40:48.578] else NULL, started = ...future.startTime, version = "1.8") [18:40:48.578] }, condition = base::local({ [18:40:48.578] c <- base::c [18:40:48.578] inherits <- base::inherits [18:40:48.578] invokeRestart <- base::invokeRestart [18:40:48.578] length <- base::length [18:40:48.578] list <- base::list [18:40:48.578] seq.int <- base::seq.int [18:40:48.578] signalCondition <- base::signalCondition [18:40:48.578] sys.calls <- base::sys.calls [18:40:48.578] `[[` <- base::`[[` [18:40:48.578] `+` <- base::`+` [18:40:48.578] `<<-` <- base::`<<-` [18:40:48.578] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:40:48.578] calls[seq.int(from = from + 12L, to = length(calls) - [18:40:48.578] 3L)] [18:40:48.578] } [18:40:48.578] function(cond) { [18:40:48.578] is_error <- inherits(cond, "error") [18:40:48.578] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:40:48.578] NULL) [18:40:48.578] if (is_error) { [18:40:48.578] sessionInformation <- function() { [18:40:48.578] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:40:48.578] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:40:48.578] search = base::search(), system = base::Sys.info()) [18:40:48.578] } [18:40:48.578] ...future.conditions[[length(...future.conditions) + [18:40:48.578] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:40:48.578] cond$call), session = sessionInformation(), [18:40:48.578] timestamp = base::Sys.time(), signaled = 0L) [18:40:48.578] signalCondition(cond) [18:40:48.578] } [18:40:48.578] else if (!ignore && TRUE && inherits(cond, c("condition", [18:40:48.578] "immediateCondition"))) { [18:40:48.578] signal <- TRUE && inherits(cond, "immediateCondition") [18:40:48.578] ...future.conditions[[length(...future.conditions) + [18:40:48.578] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:40:48.578] if (TRUE && !signal) { [18:40:48.578] muffleCondition <- function (cond, pattern = "^muffle") [18:40:48.578] { [18:40:48.578] inherits <- base::inherits [18:40:48.578] invokeRestart <- base::invokeRestart [18:40:48.578] is.null <- base::is.null [18:40:48.578] muffled <- FALSE [18:40:48.578] if (inherits(cond, "message")) { [18:40:48.578] muffled <- grepl(pattern, "muffleMessage") [18:40:48.578] if (muffled) [18:40:48.578] invokeRestart("muffleMessage") [18:40:48.578] } [18:40:48.578] else if (inherits(cond, "warning")) { [18:40:48.578] muffled <- grepl(pattern, "muffleWarning") [18:40:48.578] if (muffled) [18:40:48.578] invokeRestart("muffleWarning") [18:40:48.578] } [18:40:48.578] else if (inherits(cond, "condition")) { [18:40:48.578] if (!is.null(pattern)) { [18:40:48.578] computeRestarts <- base::computeRestarts [18:40:48.578] grepl <- base::grepl [18:40:48.578] restarts <- computeRestarts(cond) [18:40:48.578] for (restart in restarts) { [18:40:48.578] name <- restart$name [18:40:48.578] if (is.null(name)) [18:40:48.578] next [18:40:48.578] if (!grepl(pattern, name)) [18:40:48.578] next [18:40:48.578] invokeRestart(restart) [18:40:48.578] muffled <- TRUE [18:40:48.578] break [18:40:48.578] } [18:40:48.578] } [18:40:48.578] } [18:40:48.578] invisible(muffled) [18:40:48.578] } [18:40:48.578] muffleCondition(cond, pattern = "^muffle") [18:40:48.578] } [18:40:48.578] } [18:40:48.578] else { [18:40:48.578] if (TRUE) { [18:40:48.578] muffleCondition <- function (cond, pattern = "^muffle") [18:40:48.578] { [18:40:48.578] inherits <- base::inherits [18:40:48.578] invokeRestart <- base::invokeRestart [18:40:48.578] is.null <- base::is.null [18:40:48.578] muffled <- FALSE [18:40:48.578] if (inherits(cond, "message")) { [18:40:48.578] muffled <- grepl(pattern, "muffleMessage") [18:40:48.578] if (muffled) [18:40:48.578] invokeRestart("muffleMessage") [18:40:48.578] } [18:40:48.578] else if (inherits(cond, "warning")) { [18:40:48.578] muffled <- grepl(pattern, "muffleWarning") [18:40:48.578] if (muffled) [18:40:48.578] invokeRestart("muffleWarning") [18:40:48.578] } [18:40:48.578] else if (inherits(cond, "condition")) { [18:40:48.578] if (!is.null(pattern)) { [18:40:48.578] computeRestarts <- base::computeRestarts [18:40:48.578] grepl <- base::grepl [18:40:48.578] restarts <- computeRestarts(cond) [18:40:48.578] for (restart in restarts) { [18:40:48.578] name <- restart$name [18:40:48.578] if (is.null(name)) [18:40:48.578] next [18:40:48.578] if (!grepl(pattern, name)) [18:40:48.578] next [18:40:48.578] invokeRestart(restart) [18:40:48.578] muffled <- TRUE [18:40:48.578] break [18:40:48.578] } [18:40:48.578] } [18:40:48.578] } [18:40:48.578] invisible(muffled) [18:40:48.578] } [18:40:48.578] muffleCondition(cond, pattern = "^muffle") [18:40:48.578] } [18:40:48.578] } [18:40:48.578] } [18:40:48.578] })) [18:40:48.578] }, error = function(ex) { [18:40:48.578] base::structure(base::list(value = NULL, visible = NULL, [18:40:48.578] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:40:48.578] ...future.rng), started = ...future.startTime, [18:40:48.578] finished = Sys.time(), session_uuid = NA_character_, [18:40:48.578] version = "1.8"), class = "FutureResult") [18:40:48.578] }, finally = { [18:40:48.578] if (!identical(...future.workdir, getwd())) [18:40:48.578] setwd(...future.workdir) [18:40:48.578] { [18:40:48.578] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:40:48.578] ...future.oldOptions$nwarnings <- NULL [18:40:48.578] } [18:40:48.578] base::options(...future.oldOptions) [18:40:48.578] if (.Platform$OS.type == "windows") { [18:40:48.578] old_names <- names(...future.oldEnvVars) [18:40:48.578] envs <- base::Sys.getenv() [18:40:48.578] names <- names(envs) [18:40:48.578] common <- intersect(names, old_names) [18:40:48.578] added <- setdiff(names, old_names) [18:40:48.578] removed <- setdiff(old_names, names) [18:40:48.578] changed <- common[...future.oldEnvVars[common] != [18:40:48.578] envs[common]] [18:40:48.578] NAMES <- toupper(changed) [18:40:48.578] args <- list() [18:40:48.578] for (kk in seq_along(NAMES)) { [18:40:48.578] name <- changed[[kk]] [18:40:48.578] NAME <- NAMES[[kk]] [18:40:48.578] if (name != NAME && is.element(NAME, old_names)) [18:40:48.578] next [18:40:48.578] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:48.578] } [18:40:48.578] NAMES <- toupper(added) [18:40:48.578] for (kk in seq_along(NAMES)) { [18:40:48.578] name <- added[[kk]] [18:40:48.578] NAME <- NAMES[[kk]] [18:40:48.578] if (name != NAME && is.element(NAME, old_names)) [18:40:48.578] next [18:40:48.578] args[[name]] <- "" [18:40:48.578] } [18:40:48.578] NAMES <- toupper(removed) [18:40:48.578] for (kk in seq_along(NAMES)) { [18:40:48.578] name <- removed[[kk]] [18:40:48.578] NAME <- NAMES[[kk]] [18:40:48.578] if (name != NAME && is.element(NAME, old_names)) [18:40:48.578] next [18:40:48.578] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:48.578] } [18:40:48.578] if (length(args) > 0) [18:40:48.578] base::do.call(base::Sys.setenv, args = args) [18:40:48.578] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:40:48.578] } [18:40:48.578] else { [18:40:48.578] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:40:48.578] } [18:40:48.578] { [18:40:48.578] if (base::length(...future.futureOptionsAdded) > [18:40:48.578] 0L) { [18:40:48.578] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:40:48.578] base::names(opts) <- ...future.futureOptionsAdded [18:40:48.578] base::options(opts) [18:40:48.578] } [18:40:48.578] { [18:40:48.578] { [18:40:48.578] base::options(mc.cores = ...future.mc.cores.old) [18:40:48.578] NULL [18:40:48.578] } [18:40:48.578] options(future.plan = NULL) [18:40:48.578] if (is.na(NA_character_)) [18:40:48.578] Sys.unsetenv("R_FUTURE_PLAN") [18:40:48.578] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:40:48.578] future::plan(...future.strategy.old, .cleanup = FALSE, [18:40:48.578] .init = FALSE) [18:40:48.578] } [18:40:48.578] } [18:40:48.578] } [18:40:48.578] }) [18:40:48.578] if (TRUE) { [18:40:48.578] base::sink(type = "output", split = FALSE) [18:40:48.578] if (TRUE) { [18:40:48.578] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:40:48.578] } [18:40:48.578] else { [18:40:48.578] ...future.result["stdout"] <- base::list(NULL) [18:40:48.578] } [18:40:48.578] base::close(...future.stdout) [18:40:48.578] ...future.stdout <- NULL [18:40:48.578] } [18:40:48.578] ...future.result$conditions <- ...future.conditions [18:40:48.578] ...future.result$finished <- base::Sys.time() [18:40:48.578] ...future.result [18:40:48.578] } [18:40:48.583] Exporting 5 global objects (31.96 KiB) to cluster node #1 ... [18:40:48.584] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:40:48.584] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:40:48.585] Exporting '...future.FUN' (31.30 KiB) to cluster node #1 ... [18:40:48.585] Exporting '...future.FUN' (31.30 KiB) to cluster node #1 ... DONE [18:40:48.586] Exporting '...future.elements_ii' (71 bytes) to cluster node #1 ... [18:40:48.586] Exporting '...future.elements_ii' (71 bytes) to cluster node #1 ... DONE [18:40:48.586] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:40:48.586] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:40:48.587] Exporting '...future.globals.maxSize' (39 bytes) to cluster node #1 ... [18:40:48.587] Exporting '...future.globals.maxSize' (39 bytes) to cluster node #1 ... DONE [18:40:48.587] Exporting 5 global objects (31.96 KiB) to cluster node #1 ... DONE [18:40:48.588] MultisessionFuture started [18:40:48.588] - Launch lazy future ... done [18:40:48.588] run() for 'MultisessionFuture' ... done [18:40:48.588] Created future: [18:40:48.602] receiveMessageFromWorker() for ClusterFuture ... [18:40:48.603] - Validating connection of MultisessionFuture [18:40:48.603] - received message: FutureResult [18:40:48.603] - Received FutureResult [18:40:48.603] - Erased future from FutureRegistry [18:40:48.605] result() for ClusterFuture ... [18:40:48.606] - result already collected: FutureResult [18:40:48.606] result() for ClusterFuture ... done [18:40:48.606] receiveMessageFromWorker() for ClusterFuture ... done [18:40:48.589] MultisessionFuture: [18:40:48.589] Label: 'future_apply-1' [18:40:48.589] Expression: [18:40:48.589] { [18:40:48.589] do.call(function(...) { [18:40:48.589] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:48.589] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:48.589] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:48.589] on.exit(options(oopts), add = TRUE) [18:40:48.589] } [18:40:48.589] { [18:40:48.589] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:48.589] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:48.589] ...future.FUN(...future.X_jj, ...) [18:40:48.589] }) [18:40:48.589] } [18:40:48.589] }, args = future.call.arguments) [18:40:48.589] } [18:40:48.589] Lazy evaluation: FALSE [18:40:48.589] Asynchronous evaluation: TRUE [18:40:48.589] Local evaluation: TRUE [18:40:48.589] Environment: R_GlobalEnv [18:40:48.589] Capture standard output: TRUE [18:40:48.589] Capture condition classes: 'condition' (excluding 'nothing') [18:40:48.589] Globals: 5 objects totaling 31.53 KiB (DotDotDotList 'future.call.arguments' of 97 bytes, function '...future.FUN' of 31.30 KiB, list '...future.elements_ii' of 71 bytes, NULL '...future.seeds_ii' of 27 bytes, numeric '...future.globals.maxSize' of 39 bytes) [18:40:48.589] Packages: [18:40:48.589] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:40:48.589] Resolved: TRUE [18:40:48.589] Value: [18:40:48.589] Conditions captured: [18:40:48.589] Early signaling: FALSE [18:40:48.589] Owner process: 2171382a-9202-bc7d-80d6-248e0cb487f4 [18:40:48.589] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:40:48.606] Chunk #1 of 2 ... DONE [18:40:48.606] Chunk #2 of 2 ... [18:40:48.607] - Adjusted option 'future.globals.maxSize': Inf -> 2 * Inf = Inf (bytes) [18:40:48.607] - seeds: [18:40:48.607] - All globals exported: [n=5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:48.607] getGlobalsAndPackages() ... [18:40:48.607] - globals passed as-is: [5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:48.608] Resolving globals: FALSE [18:40:48.608] Tweak future expression to call with '...' arguments ... [18:40:48.608] { [18:40:48.608] do.call(function(...) { [18:40:48.608] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:48.608] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:48.608] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:48.608] on.exit(options(oopts), add = TRUE) [18:40:48.608] } [18:40:48.608] { [18:40:48.608] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:48.608] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:48.608] ...future.FUN(...future.X_jj, ...) [18:40:48.608] }) [18:40:48.608] } [18:40:48.608] }, args = future.call.arguments) [18:40:48.608] } [18:40:48.608] Tweak future expression to call with '...' arguments ... DONE [18:40:48.609] - globals: [5] 'future.call.arguments', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:48.609] [18:40:48.609] getGlobalsAndPackages() ... DONE [18:40:48.610] run() for 'Future' ... [18:40:48.610] - state: 'created' [18:40:48.610] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:40:48.625] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:40:48.625] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:40:48.625] - Field: 'node' [18:40:48.625] - Field: 'label' [18:40:48.626] - Field: 'local' [18:40:48.626] - Field: 'owner' [18:40:48.626] - Field: 'envir' [18:40:48.626] - Field: 'workers' [18:40:48.626] - Field: 'packages' [18:40:48.626] - Field: 'gc' [18:40:48.627] - Field: 'conditions' [18:40:48.627] - Field: 'persistent' [18:40:48.627] - Field: 'expr' [18:40:48.627] - Field: 'uuid' [18:40:48.627] - Field: 'seed' [18:40:48.627] - Field: 'version' [18:40:48.628] - Field: 'result' [18:40:48.628] - Field: 'asynchronous' [18:40:48.628] - Field: 'calls' [18:40:48.628] - Field: 'globals' [18:40:48.628] - Field: 'stdout' [18:40:48.628] - Field: 'earlySignal' [18:40:48.629] - Field: 'lazy' [18:40:48.629] - Field: 'state' [18:40:48.629] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:40:48.629] - Launch lazy future ... [18:40:48.629] Packages needed by the future expression (n = 0): [18:40:48.630] Packages needed by future strategies (n = 0): [18:40:48.630] { [18:40:48.630] { [18:40:48.630] { [18:40:48.630] ...future.startTime <- base::Sys.time() [18:40:48.630] { [18:40:48.630] { [18:40:48.630] { [18:40:48.630] { [18:40:48.630] base::local({ [18:40:48.630] has_future <- base::requireNamespace("future", [18:40:48.630] quietly = TRUE) [18:40:48.630] if (has_future) { [18:40:48.630] ns <- base::getNamespace("future") [18:40:48.630] version <- ns[[".package"]][["version"]] [18:40:48.630] if (is.null(version)) [18:40:48.630] version <- utils::packageVersion("future") [18:40:48.630] } [18:40:48.630] else { [18:40:48.630] version <- NULL [18:40:48.630] } [18:40:48.630] if (!has_future || version < "1.8.0") { [18:40:48.630] info <- base::c(r_version = base::gsub("R version ", [18:40:48.630] "", base::R.version$version.string), [18:40:48.630] platform = base::sprintf("%s (%s-bit)", [18:40:48.630] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:40:48.630] os = base::paste(base::Sys.info()[base::c("sysname", [18:40:48.630] "release", "version")], collapse = " "), [18:40:48.630] hostname = base::Sys.info()[["nodename"]]) [18:40:48.630] info <- base::sprintf("%s: %s", base::names(info), [18:40:48.630] info) [18:40:48.630] info <- base::paste(info, collapse = "; ") [18:40:48.630] if (!has_future) { [18:40:48.630] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:40:48.630] info) [18:40:48.630] } [18:40:48.630] else { [18:40:48.630] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:40:48.630] info, version) [18:40:48.630] } [18:40:48.630] base::stop(msg) [18:40:48.630] } [18:40:48.630] }) [18:40:48.630] } [18:40:48.630] ...future.mc.cores.old <- base::getOption("mc.cores") [18:40:48.630] base::options(mc.cores = 1L) [18:40:48.630] } [18:40:48.630] ...future.strategy.old <- future::plan("list") [18:40:48.630] options(future.plan = NULL) [18:40:48.630] Sys.unsetenv("R_FUTURE_PLAN") [18:40:48.630] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:40:48.630] } [18:40:48.630] ...future.workdir <- getwd() [18:40:48.630] } [18:40:48.630] ...future.oldOptions <- base::as.list(base::.Options) [18:40:48.630] ...future.oldEnvVars <- base::Sys.getenv() [18:40:48.630] } [18:40:48.630] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:40:48.630] future.globals.maxSize = Inf, future.globals.method = NULL, [18:40:48.630] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:40:48.630] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:40:48.630] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:40:48.630] future.stdout.windows.reencode = NULL, width = 80L) [18:40:48.630] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:40:48.630] base::names(...future.oldOptions)) [18:40:48.630] } [18:40:48.630] if (FALSE) { [18:40:48.630] } [18:40:48.630] else { [18:40:48.630] if (TRUE) { [18:40:48.630] ...future.stdout <- base::rawConnection(base::raw(0L), [18:40:48.630] open = "w") [18:40:48.630] } [18:40:48.630] else { [18:40:48.630] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:40:48.630] windows = "NUL", "/dev/null"), open = "w") [18:40:48.630] } [18:40:48.630] base::sink(...future.stdout, type = "output", split = FALSE) [18:40:48.630] base::on.exit(if (!base::is.null(...future.stdout)) { [18:40:48.630] base::sink(type = "output", split = FALSE) [18:40:48.630] base::close(...future.stdout) [18:40:48.630] }, add = TRUE) [18:40:48.630] } [18:40:48.630] ...future.frame <- base::sys.nframe() [18:40:48.630] ...future.conditions <- base::list() [18:40:48.630] ...future.rng <- base::globalenv()$.Random.seed [18:40:48.630] if (FALSE) { [18:40:48.630] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:40:48.630] "...future.value", "...future.globalenv.names", ".Random.seed") [18:40:48.630] } [18:40:48.630] ...future.result <- base::tryCatch({ [18:40:48.630] base::withCallingHandlers({ [18:40:48.630] ...future.value <- base::withVisible(base::local({ [18:40:48.630] ...future.makeSendCondition <- base::local({ [18:40:48.630] sendCondition <- NULL [18:40:48.630] function(frame = 1L) { [18:40:48.630] if (is.function(sendCondition)) [18:40:48.630] return(sendCondition) [18:40:48.630] ns <- getNamespace("parallel") [18:40:48.630] if (exists("sendData", mode = "function", [18:40:48.630] envir = ns)) { [18:40:48.630] parallel_sendData <- get("sendData", mode = "function", [18:40:48.630] envir = ns) [18:40:48.630] envir <- sys.frame(frame) [18:40:48.630] master <- NULL [18:40:48.630] while (!identical(envir, .GlobalEnv) && [18:40:48.630] !identical(envir, emptyenv())) { [18:40:48.630] if (exists("master", mode = "list", envir = envir, [18:40:48.630] inherits = FALSE)) { [18:40:48.630] master <- get("master", mode = "list", [18:40:48.630] envir = envir, inherits = FALSE) [18:40:48.630] if (inherits(master, c("SOCKnode", [18:40:48.630] "SOCK0node"))) { [18:40:48.630] sendCondition <<- function(cond) { [18:40:48.630] data <- list(type = "VALUE", value = cond, [18:40:48.630] success = TRUE) [18:40:48.630] parallel_sendData(master, data) [18:40:48.630] } [18:40:48.630] return(sendCondition) [18:40:48.630] } [18:40:48.630] } [18:40:48.630] frame <- frame + 1L [18:40:48.630] envir <- sys.frame(frame) [18:40:48.630] } [18:40:48.630] } [18:40:48.630] sendCondition <<- function(cond) NULL [18:40:48.630] } [18:40:48.630] }) [18:40:48.630] withCallingHandlers({ [18:40:48.630] { [18:40:48.630] do.call(function(...) { [18:40:48.630] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:48.630] if (!identical(...future.globals.maxSize.org, [18:40:48.630] ...future.globals.maxSize)) { [18:40:48.630] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:48.630] on.exit(options(oopts), add = TRUE) [18:40:48.630] } [18:40:48.630] { [18:40:48.630] lapply(seq_along(...future.elements_ii), [18:40:48.630] FUN = function(jj) { [18:40:48.630] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:48.630] ...future.FUN(...future.X_jj, ...) [18:40:48.630] }) [18:40:48.630] } [18:40:48.630] }, args = future.call.arguments) [18:40:48.630] } [18:40:48.630] }, immediateCondition = function(cond) { [18:40:48.630] sendCondition <- ...future.makeSendCondition() [18:40:48.630] sendCondition(cond) [18:40:48.630] muffleCondition <- function (cond, pattern = "^muffle") [18:40:48.630] { [18:40:48.630] inherits <- base::inherits [18:40:48.630] invokeRestart <- base::invokeRestart [18:40:48.630] is.null <- base::is.null [18:40:48.630] muffled <- FALSE [18:40:48.630] if (inherits(cond, "message")) { [18:40:48.630] muffled <- grepl(pattern, "muffleMessage") [18:40:48.630] if (muffled) [18:40:48.630] invokeRestart("muffleMessage") [18:40:48.630] } [18:40:48.630] else if (inherits(cond, "warning")) { [18:40:48.630] muffled <- grepl(pattern, "muffleWarning") [18:40:48.630] if (muffled) [18:40:48.630] invokeRestart("muffleWarning") [18:40:48.630] } [18:40:48.630] else if (inherits(cond, "condition")) { [18:40:48.630] if (!is.null(pattern)) { [18:40:48.630] computeRestarts <- base::computeRestarts [18:40:48.630] grepl <- base::grepl [18:40:48.630] restarts <- computeRestarts(cond) [18:40:48.630] for (restart in restarts) { [18:40:48.630] name <- restart$name [18:40:48.630] if (is.null(name)) [18:40:48.630] next [18:40:48.630] if (!grepl(pattern, name)) [18:40:48.630] next [18:40:48.630] invokeRestart(restart) [18:40:48.630] muffled <- TRUE [18:40:48.630] break [18:40:48.630] } [18:40:48.630] } [18:40:48.630] } [18:40:48.630] invisible(muffled) [18:40:48.630] } [18:40:48.630] muffleCondition(cond) [18:40:48.630] }) [18:40:48.630] })) [18:40:48.630] future::FutureResult(value = ...future.value$value, [18:40:48.630] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:40:48.630] ...future.rng), globalenv = if (FALSE) [18:40:48.630] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:40:48.630] ...future.globalenv.names)) [18:40:48.630] else NULL, started = ...future.startTime, version = "1.8") [18:40:48.630] }, condition = base::local({ [18:40:48.630] c <- base::c [18:40:48.630] inherits <- base::inherits [18:40:48.630] invokeRestart <- base::invokeRestart [18:40:48.630] length <- base::length [18:40:48.630] list <- base::list [18:40:48.630] seq.int <- base::seq.int [18:40:48.630] signalCondition <- base::signalCondition [18:40:48.630] sys.calls <- base::sys.calls [18:40:48.630] `[[` <- base::`[[` [18:40:48.630] `+` <- base::`+` [18:40:48.630] `<<-` <- base::`<<-` [18:40:48.630] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:40:48.630] calls[seq.int(from = from + 12L, to = length(calls) - [18:40:48.630] 3L)] [18:40:48.630] } [18:40:48.630] function(cond) { [18:40:48.630] is_error <- inherits(cond, "error") [18:40:48.630] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:40:48.630] NULL) [18:40:48.630] if (is_error) { [18:40:48.630] sessionInformation <- function() { [18:40:48.630] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:40:48.630] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:40:48.630] search = base::search(), system = base::Sys.info()) [18:40:48.630] } [18:40:48.630] ...future.conditions[[length(...future.conditions) + [18:40:48.630] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:40:48.630] cond$call), session = sessionInformation(), [18:40:48.630] timestamp = base::Sys.time(), signaled = 0L) [18:40:48.630] signalCondition(cond) [18:40:48.630] } [18:40:48.630] else if (!ignore && TRUE && inherits(cond, c("condition", [18:40:48.630] "immediateCondition"))) { [18:40:48.630] signal <- TRUE && inherits(cond, "immediateCondition") [18:40:48.630] ...future.conditions[[length(...future.conditions) + [18:40:48.630] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:40:48.630] if (TRUE && !signal) { [18:40:48.630] muffleCondition <- function (cond, pattern = "^muffle") [18:40:48.630] { [18:40:48.630] inherits <- base::inherits [18:40:48.630] invokeRestart <- base::invokeRestart [18:40:48.630] is.null <- base::is.null [18:40:48.630] muffled <- FALSE [18:40:48.630] if (inherits(cond, "message")) { [18:40:48.630] muffled <- grepl(pattern, "muffleMessage") [18:40:48.630] if (muffled) [18:40:48.630] invokeRestart("muffleMessage") [18:40:48.630] } [18:40:48.630] else if (inherits(cond, "warning")) { [18:40:48.630] muffled <- grepl(pattern, "muffleWarning") [18:40:48.630] if (muffled) [18:40:48.630] invokeRestart("muffleWarning") [18:40:48.630] } [18:40:48.630] else if (inherits(cond, "condition")) { [18:40:48.630] if (!is.null(pattern)) { [18:40:48.630] computeRestarts <- base::computeRestarts [18:40:48.630] grepl <- base::grepl [18:40:48.630] restarts <- computeRestarts(cond) [18:40:48.630] for (restart in restarts) { [18:40:48.630] name <- restart$name [18:40:48.630] if (is.null(name)) [18:40:48.630] next [18:40:48.630] if (!grepl(pattern, name)) [18:40:48.630] next [18:40:48.630] invokeRestart(restart) [18:40:48.630] muffled <- TRUE [18:40:48.630] break [18:40:48.630] } [18:40:48.630] } [18:40:48.630] } [18:40:48.630] invisible(muffled) [18:40:48.630] } [18:40:48.630] muffleCondition(cond, pattern = "^muffle") [18:40:48.630] } [18:40:48.630] } [18:40:48.630] else { [18:40:48.630] if (TRUE) { [18:40:48.630] muffleCondition <- function (cond, pattern = "^muffle") [18:40:48.630] { [18:40:48.630] inherits <- base::inherits [18:40:48.630] invokeRestart <- base::invokeRestart [18:40:48.630] is.null <- base::is.null [18:40:48.630] muffled <- FALSE [18:40:48.630] if (inherits(cond, "message")) { [18:40:48.630] muffled <- grepl(pattern, "muffleMessage") [18:40:48.630] if (muffled) [18:40:48.630] invokeRestart("muffleMessage") [18:40:48.630] } [18:40:48.630] else if (inherits(cond, "warning")) { [18:40:48.630] muffled <- grepl(pattern, "muffleWarning") [18:40:48.630] if (muffled) [18:40:48.630] invokeRestart("muffleWarning") [18:40:48.630] } [18:40:48.630] else if (inherits(cond, "condition")) { [18:40:48.630] if (!is.null(pattern)) { [18:40:48.630] computeRestarts <- base::computeRestarts [18:40:48.630] grepl <- base::grepl [18:40:48.630] restarts <- computeRestarts(cond) [18:40:48.630] for (restart in restarts) { [18:40:48.630] name <- restart$name [18:40:48.630] if (is.null(name)) [18:40:48.630] next [18:40:48.630] if (!grepl(pattern, name)) [18:40:48.630] next [18:40:48.630] invokeRestart(restart) [18:40:48.630] muffled <- TRUE [18:40:48.630] break [18:40:48.630] } [18:40:48.630] } [18:40:48.630] } [18:40:48.630] invisible(muffled) [18:40:48.630] } [18:40:48.630] muffleCondition(cond, pattern = "^muffle") [18:40:48.630] } [18:40:48.630] } [18:40:48.630] } [18:40:48.630] })) [18:40:48.630] }, error = function(ex) { [18:40:48.630] base::structure(base::list(value = NULL, visible = NULL, [18:40:48.630] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:40:48.630] ...future.rng), started = ...future.startTime, [18:40:48.630] finished = Sys.time(), session_uuid = NA_character_, [18:40:48.630] version = "1.8"), class = "FutureResult") [18:40:48.630] }, finally = { [18:40:48.630] if (!identical(...future.workdir, getwd())) [18:40:48.630] setwd(...future.workdir) [18:40:48.630] { [18:40:48.630] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:40:48.630] ...future.oldOptions$nwarnings <- NULL [18:40:48.630] } [18:40:48.630] base::options(...future.oldOptions) [18:40:48.630] if (.Platform$OS.type == "windows") { [18:40:48.630] old_names <- names(...future.oldEnvVars) [18:40:48.630] envs <- base::Sys.getenv() [18:40:48.630] names <- names(envs) [18:40:48.630] common <- intersect(names, old_names) [18:40:48.630] added <- setdiff(names, old_names) [18:40:48.630] removed <- setdiff(old_names, names) [18:40:48.630] changed <- common[...future.oldEnvVars[common] != [18:40:48.630] envs[common]] [18:40:48.630] NAMES <- toupper(changed) [18:40:48.630] args <- list() [18:40:48.630] for (kk in seq_along(NAMES)) { [18:40:48.630] name <- changed[[kk]] [18:40:48.630] NAME <- NAMES[[kk]] [18:40:48.630] if (name != NAME && is.element(NAME, old_names)) [18:40:48.630] next [18:40:48.630] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:48.630] } [18:40:48.630] NAMES <- toupper(added) [18:40:48.630] for (kk in seq_along(NAMES)) { [18:40:48.630] name <- added[[kk]] [18:40:48.630] NAME <- NAMES[[kk]] [18:40:48.630] if (name != NAME && is.element(NAME, old_names)) [18:40:48.630] next [18:40:48.630] args[[name]] <- "" [18:40:48.630] } [18:40:48.630] NAMES <- toupper(removed) [18:40:48.630] for (kk in seq_along(NAMES)) { [18:40:48.630] name <- removed[[kk]] [18:40:48.630] NAME <- NAMES[[kk]] [18:40:48.630] if (name != NAME && is.element(NAME, old_names)) [18:40:48.630] next [18:40:48.630] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:48.630] } [18:40:48.630] if (length(args) > 0) [18:40:48.630] base::do.call(base::Sys.setenv, args = args) [18:40:48.630] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:40:48.630] } [18:40:48.630] else { [18:40:48.630] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:40:48.630] } [18:40:48.630] { [18:40:48.630] if (base::length(...future.futureOptionsAdded) > [18:40:48.630] 0L) { [18:40:48.630] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:40:48.630] base::names(opts) <- ...future.futureOptionsAdded [18:40:48.630] base::options(opts) [18:40:48.630] } [18:40:48.630] { [18:40:48.630] { [18:40:48.630] base::options(mc.cores = ...future.mc.cores.old) [18:40:48.630] NULL [18:40:48.630] } [18:40:48.630] options(future.plan = NULL) [18:40:48.630] if (is.na(NA_character_)) [18:40:48.630] Sys.unsetenv("R_FUTURE_PLAN") [18:40:48.630] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:40:48.630] future::plan(...future.strategy.old, .cleanup = FALSE, [18:40:48.630] .init = FALSE) [18:40:48.630] } [18:40:48.630] } [18:40:48.630] } [18:40:48.630] }) [18:40:48.630] if (TRUE) { [18:40:48.630] base::sink(type = "output", split = FALSE) [18:40:48.630] if (TRUE) { [18:40:48.630] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:40:48.630] } [18:40:48.630] else { [18:40:48.630] ...future.result["stdout"] <- base::list(NULL) [18:40:48.630] } [18:40:48.630] base::close(...future.stdout) [18:40:48.630] ...future.stdout <- NULL [18:40:48.630] } [18:40:48.630] ...future.result$conditions <- ...future.conditions [18:40:48.630] ...future.result$finished <- base::Sys.time() [18:40:48.630] ...future.result [18:40:48.630] } [18:40:48.635] Exporting 5 global objects (31.96 KiB) to cluster node #1 ... [18:40:48.636] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:40:48.636] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:40:48.637] Exporting '...future.FUN' (31.30 KiB) to cluster node #1 ... [18:40:48.637] Exporting '...future.FUN' (31.30 KiB) to cluster node #1 ... DONE [18:40:48.637] Exporting '...future.elements_ii' (71 bytes) to cluster node #1 ... [18:40:48.638] Exporting '...future.elements_ii' (71 bytes) to cluster node #1 ... DONE [18:40:48.638] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:40:48.638] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:40:48.639] Exporting '...future.globals.maxSize' (39 bytes) to cluster node #1 ... [18:40:48.639] Exporting '...future.globals.maxSize' (39 bytes) to cluster node #1 ... DONE [18:40:48.639] Exporting 5 global objects (31.96 KiB) to cluster node #1 ... DONE [18:40:48.640] MultisessionFuture started [18:40:48.640] - Launch lazy future ... done [18:40:48.640] run() for 'MultisessionFuture' ... done [18:40:48.640] Created future: [18:40:48.656] receiveMessageFromWorker() for ClusterFuture ... [18:40:48.656] - Validating connection of MultisessionFuture [18:40:48.657] - received message: FutureResult [18:40:48.657] - Received FutureResult [18:40:48.657] - Erased future from FutureRegistry [18:40:48.657] result() for ClusterFuture ... [18:40:48.658] - result already collected: FutureResult [18:40:48.658] result() for ClusterFuture ... done [18:40:48.658] receiveMessageFromWorker() for ClusterFuture ... done [18:40:48.640] MultisessionFuture: [18:40:48.640] Label: 'future_apply-2' [18:40:48.640] Expression: [18:40:48.640] { [18:40:48.640] do.call(function(...) { [18:40:48.640] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:48.640] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:48.640] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:48.640] on.exit(options(oopts), add = TRUE) [18:40:48.640] } [18:40:48.640] { [18:40:48.640] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:48.640] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:48.640] ...future.FUN(...future.X_jj, ...) [18:40:48.640] }) [18:40:48.640] } [18:40:48.640] }, args = future.call.arguments) [18:40:48.640] } [18:40:48.640] Lazy evaluation: FALSE [18:40:48.640] Asynchronous evaluation: TRUE [18:40:48.640] Local evaluation: TRUE [18:40:48.640] Environment: R_GlobalEnv [18:40:48.640] Capture standard output: TRUE [18:40:48.640] Capture condition classes: 'condition' (excluding 'nothing') [18:40:48.640] Globals: 5 objects totaling 31.53 KiB (DotDotDotList 'future.call.arguments' of 97 bytes, function '...future.FUN' of 31.30 KiB, list '...future.elements_ii' of 71 bytes, NULL '...future.seeds_ii' of 27 bytes, numeric '...future.globals.maxSize' of 39 bytes) [18:40:48.640] Packages: [18:40:48.640] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:40:48.640] Resolved: TRUE [18:40:48.640] Value: [18:40:48.640] Conditions captured: [18:40:48.640] Early signaling: FALSE [18:40:48.640] Owner process: 2171382a-9202-bc7d-80d6-248e0cb487f4 [18:40:48.640] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:40:48.659] Chunk #2 of 2 ... DONE [18:40:48.659] Launching 2 futures (chunks) ... DONE [18:40:48.659] Resolving 2 futures (chunks) ... [18:40:48.659] resolve() on list ... [18:40:48.659] recursive: 0 [18:40:48.660] length: 2 [18:40:48.660] [18:40:48.660] Future #1 [18:40:48.660] result() for ClusterFuture ... [18:40:48.660] - result already collected: FutureResult [18:40:48.660] result() for ClusterFuture ... done [18:40:48.660] result() for ClusterFuture ... [18:40:48.661] - result already collected: FutureResult [18:40:48.661] result() for ClusterFuture ... done [18:40:48.661] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:40:48.661] - nx: 2 [18:40:48.661] - relay: TRUE [18:40:48.661] - stdout: TRUE [18:40:48.662] - signal: TRUE [18:40:48.662] - resignal: FALSE [18:40:48.662] - force: TRUE [18:40:48.662] - relayed: [n=2] FALSE, FALSE [18:40:48.662] - queued futures: [n=2] FALSE, FALSE [18:40:48.662] - until=1 [18:40:48.663] - relaying element #1 [18:40:48.663] result() for ClusterFuture ... [18:40:48.663] - result already collected: FutureResult [18:40:48.663] result() for ClusterFuture ... done [18:40:48.663] result() for ClusterFuture ... [18:40:48.663] - result already collected: FutureResult [18:40:48.664] result() for ClusterFuture ... done [18:40:48.664] result() for ClusterFuture ... [18:40:48.664] - result already collected: FutureResult [18:40:48.664] result() for ClusterFuture ... done [18:40:48.664] result() for ClusterFuture ... [18:40:48.664] - result already collected: FutureResult [18:40:48.664] result() for ClusterFuture ... done [18:40:48.665] - relayed: [n=2] TRUE, FALSE [18:40:48.665] - queued futures: [n=2] TRUE, FALSE [18:40:48.665] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:40:48.665] length: 1 (resolved future 1) [18:40:48.665] Future #2 [18:40:48.666] result() for ClusterFuture ... [18:40:48.666] - result already collected: FutureResult [18:40:48.666] result() for ClusterFuture ... done [18:40:48.666] result() for ClusterFuture ... [18:40:48.666] - result already collected: FutureResult [18:40:48.666] result() for ClusterFuture ... done [18:40:48.667] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:40:48.667] - nx: 2 [18:40:48.667] - relay: TRUE [18:40:48.667] - stdout: TRUE [18:40:48.667] - signal: TRUE [18:40:48.667] - resignal: FALSE [18:40:48.667] - force: TRUE [18:40:48.668] - relayed: [n=2] TRUE, FALSE [18:40:48.668] - queued futures: [n=2] TRUE, FALSE [18:40:48.668] - until=2 [18:40:48.668] - relaying element #2 [18:40:48.668] result() for ClusterFuture ... [18:40:48.668] - result already collected: FutureResult [18:40:48.669] result() for ClusterFuture ... done [18:40:48.669] result() for ClusterFuture ... [18:40:48.669] - result already collected: FutureResult [18:40:48.669] result() for ClusterFuture ... done [18:40:48.669] result() for ClusterFuture ... [18:40:48.669] - result already collected: FutureResult [18:40:48.670] result() for ClusterFuture ... done [18:40:48.670] result() for ClusterFuture ... [18:40:48.670] - result already collected: FutureResult [18:40:48.670] result() for ClusterFuture ... done [18:40:48.670] - relayed: [n=2] TRUE, TRUE [18:40:48.670] - queued futures: [n=2] TRUE, TRUE [18:40:48.671] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:40:48.671] length: 0 (resolved future 2) [18:40:48.671] Relaying remaining futures [18:40:48.671] signalConditionsASAP(NULL, pos=0) ... [18:40:48.671] - nx: 2 [18:40:48.671] - relay: TRUE [18:40:48.671] - stdout: TRUE [18:40:48.672] - signal: TRUE [18:40:48.672] - resignal: FALSE [18:40:48.672] - force: TRUE [18:40:48.672] - relayed: [n=2] TRUE, TRUE [18:40:48.672] - queued futures: [n=2] TRUE, TRUE - flush all [18:40:48.673] - relayed: [n=2] TRUE, TRUE [18:40:48.673] - queued futures: [n=2] TRUE, TRUE [18:40:48.673] signalConditionsASAP(NULL, pos=0) ... done [18:40:48.673] resolve() on list ... DONE [18:40:48.673] result() for ClusterFuture ... [18:40:48.673] - result already collected: FutureResult [18:40:48.673] result() for ClusterFuture ... done [18:40:48.674] result() for ClusterFuture ... [18:40:48.674] - result already collected: FutureResult [18:40:48.674] result() for ClusterFuture ... done [18:40:48.674] result() for ClusterFuture ... [18:40:48.674] - result already collected: FutureResult [18:40:48.674] result() for ClusterFuture ... done [18:40:48.675] result() for ClusterFuture ... [18:40:48.675] - result already collected: FutureResult [18:40:48.675] result() for ClusterFuture ... done [18:40:48.675] - Number of value chunks collected: 2 [18:40:48.675] Resolving 2 futures (chunks) ... DONE [18:40:48.675] Reducing values from 2 chunks ... [18:40:48.676] - Number of values collected after concatenation: 2 [18:40:48.676] - Number of values expected: 2 [18:40:48.676] Reducing values from 2 chunks ... DONE [18:40:48.676] future_lapply() ... DONE [[1]] ...future.X_jj 1 3 7 2 1 1 [[2]] ...future.X_jj 2 4 6 8 1 1 1 1 [18:40:48.677] getGlobalsAndPackagesXApply() ... [18:40:48.677] - future.globals: TRUE [18:40:48.677] getGlobalsAndPackages() ... [18:40:48.677] Searching for globals... [18:40:48.721] - globals found: [59] 'FUN', 'if', '==', 'c', 'list.names', '{', '<-', '[', 'as.list', 'substitute', '-', '&&', 'length', 'is.list', '!', 'is.null', 'names', 'return', 'seq_along', 'vapply', 'switch', '+', 'is.symbol', 'as.character', 'deparse', '[<-', 'missing', 'match', 'match.arg', '!=', 'warning', 'list', '[[', 'paste', 'stop', 'integer', 'for', 'is.factor', 'anyNA', 'options', 'on.exit', 'factor', '(', '||', 'levels', 'as.integer', 'which', 'is.na', 'is.na<-', '>', 'prod', '$', '.Machine', '*', 'names<-', 'array', 'tabulate', 'class', 'class<-' [18:40:48.721] Searching for globals ... DONE [18:40:48.722] Resolving globals: FALSE [18:40:48.724] The total size of the 1 globals is 31.30 KiB (32048 bytes) [18:40:48.724] The total size of the 1 globals exported for future expression ('FUN(X = structure(c(1, 2, 3, 4, 1, 6, 7, 8), dim = c(2L, 4L)))') is 31.30 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (31.30 KiB of class 'function') [18:40:48.725] - globals: [1] 'FUN' [18:40:48.725] [18:40:48.725] getGlobalsAndPackages() ... DONE [18:40:48.725] - globals found/used: [n=1] 'FUN' [18:40:48.725] - needed namespaces: [n=0] [18:40:48.725] Finding globals ... DONE [18:40:48.726] - use_args: TRUE [18:40:48.726] - Getting '...' globals ... [18:40:48.726] resolve() on list ... [18:40:48.726] recursive: 0 [18:40:48.726] length: 1 [18:40:48.727] elements: '...' [18:40:48.727] length: 0 (resolved future 1) [18:40:48.727] resolve() on list ... DONE [18:40:48.727] - '...' content: [n=0] [18:40:48.727] List of 1 [18:40:48.727] $ ...: list() [18:40:48.727] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:48.727] - attr(*, "where")=List of 1 [18:40:48.727] ..$ ...: [18:40:48.727] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:48.727] - attr(*, "resolved")= logi TRUE [18:40:48.727] - attr(*, "total_size")= num NA [18:40:48.732] - Getting '...' globals ... DONE [18:40:48.732] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:40:48.733] List of 2 [18:40:48.733] $ ...future.FUN:function (..., exclude = if (useNA == "no") c(NA, NaN), useNA = c("no", [18:40:48.733] "ifany", "always"), dnn = list.names(...), deparse.level = 1) [18:40:48.733] $ ... : list() [18:40:48.733] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:48.733] - attr(*, "where")=List of 2 [18:40:48.733] ..$ ...future.FUN: [18:40:48.733] ..$ ... : [18:40:48.733] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:48.733] - attr(*, "resolved")= logi FALSE [18:40:48.733] - attr(*, "total_size")= int 65967 [18:40:48.736] Packages to be attached in all futures: [n=0] [18:40:48.736] getGlobalsAndPackagesXApply() ... DONE [18:40:48.738] future_lapply() ... [18:40:48.782] Number of chunks: 2 [18:40:48.783] getGlobalsAndPackagesXApply() ... [18:40:48.783] - future.globals: with names 'list()' [18:40:48.783] - use_args: TRUE [18:40:48.783] Globals to be used in all futures (chunks): [n=2] '...', '...future.FUN' [18:40:48.783] List of 2 [18:40:48.783] $ ... : list() [18:40:48.783] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:48.783] $ ...future.FUN:function (..., exclude = if (useNA == "no") c(NA, NaN), useNA = c("no", [18:40:48.783] "ifany", "always"), dnn = list.names(...), deparse.level = 1) [18:40:48.783] - attr(*, "where")=List of 2 [18:40:48.783] ..$ ... : [18:40:48.783] ..$ ...future.FUN: [18:40:48.783] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:48.783] - attr(*, "resolved")= logi FALSE [18:40:48.783] - attr(*, "total_size")= num NA [18:40:48.787] Packages to be attached in all futures: [n=0] [18:40:48.788] getGlobalsAndPackagesXApply() ... DONE [18:40:48.788] Number of futures (= number of chunks): 2 [18:40:48.788] Launching 2 futures (chunks) ... [18:40:48.788] Chunk #1 of 2 ... [18:40:48.788] - Adjusted option 'future.globals.maxSize': Inf -> 2 * Inf = Inf (bytes) [18:40:48.789] - seeds: [18:40:48.789] - All globals exported: [n=5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:48.789] getGlobalsAndPackages() ... [18:40:48.789] - globals passed as-is: [5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:48.789] Resolving globals: FALSE [18:40:48.789] Tweak future expression to call with '...' arguments ... [18:40:48.790] { [18:40:48.790] do.call(function(...) { [18:40:48.790] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:48.790] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:48.790] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:48.790] on.exit(options(oopts), add = TRUE) [18:40:48.790] } [18:40:48.790] { [18:40:48.790] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:48.790] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:48.790] ...future.FUN(...future.X_jj, ...) [18:40:48.790] }) [18:40:48.790] } [18:40:48.790] }, args = future.call.arguments) [18:40:48.790] } [18:40:48.790] Tweak future expression to call with '...' arguments ... DONE [18:40:48.791] - globals: [5] 'future.call.arguments', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:48.791] [18:40:48.791] getGlobalsAndPackages() ... DONE [18:40:48.791] run() for 'Future' ... [18:40:48.791] - state: 'created' [18:40:48.792] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:40:48.807] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:40:48.807] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:40:48.808] - Field: 'node' [18:40:48.808] - Field: 'label' [18:40:48.808] - Field: 'local' [18:40:48.808] - Field: 'owner' [18:40:48.808] - Field: 'envir' [18:40:48.808] - Field: 'workers' [18:40:48.809] - Field: 'packages' [18:40:48.809] - Field: 'gc' [18:40:48.809] - Field: 'conditions' [18:40:48.809] - Field: 'persistent' [18:40:48.809] - Field: 'expr' [18:40:48.809] - Field: 'uuid' [18:40:48.810] - Field: 'seed' [18:40:48.810] - Field: 'version' [18:40:48.810] - Field: 'result' [18:40:48.810] - Field: 'asynchronous' [18:40:48.810] - Field: 'calls' [18:40:48.810] - Field: 'globals' [18:40:48.811] - Field: 'stdout' [18:40:48.811] - Field: 'earlySignal' [18:40:48.811] - Field: 'lazy' [18:40:48.811] - Field: 'state' [18:40:48.811] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:40:48.811] - Launch lazy future ... [18:40:48.812] Packages needed by the future expression (n = 0): [18:40:48.812] Packages needed by future strategies (n = 0): [18:40:48.813] { [18:40:48.813] { [18:40:48.813] { [18:40:48.813] ...future.startTime <- base::Sys.time() [18:40:48.813] { [18:40:48.813] { [18:40:48.813] { [18:40:48.813] { [18:40:48.813] base::local({ [18:40:48.813] has_future <- base::requireNamespace("future", [18:40:48.813] quietly = TRUE) [18:40:48.813] if (has_future) { [18:40:48.813] ns <- base::getNamespace("future") [18:40:48.813] version <- ns[[".package"]][["version"]] [18:40:48.813] if (is.null(version)) [18:40:48.813] version <- utils::packageVersion("future") [18:40:48.813] } [18:40:48.813] else { [18:40:48.813] version <- NULL [18:40:48.813] } [18:40:48.813] if (!has_future || version < "1.8.0") { [18:40:48.813] info <- base::c(r_version = base::gsub("R version ", [18:40:48.813] "", base::R.version$version.string), [18:40:48.813] platform = base::sprintf("%s (%s-bit)", [18:40:48.813] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:40:48.813] os = base::paste(base::Sys.info()[base::c("sysname", [18:40:48.813] "release", "version")], collapse = " "), [18:40:48.813] hostname = base::Sys.info()[["nodename"]]) [18:40:48.813] info <- base::sprintf("%s: %s", base::names(info), [18:40:48.813] info) [18:40:48.813] info <- base::paste(info, collapse = "; ") [18:40:48.813] if (!has_future) { [18:40:48.813] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:40:48.813] info) [18:40:48.813] } [18:40:48.813] else { [18:40:48.813] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:40:48.813] info, version) [18:40:48.813] } [18:40:48.813] base::stop(msg) [18:40:48.813] } [18:40:48.813] }) [18:40:48.813] } [18:40:48.813] ...future.mc.cores.old <- base::getOption("mc.cores") [18:40:48.813] base::options(mc.cores = 1L) [18:40:48.813] } [18:40:48.813] ...future.strategy.old <- future::plan("list") [18:40:48.813] options(future.plan = NULL) [18:40:48.813] Sys.unsetenv("R_FUTURE_PLAN") [18:40:48.813] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:40:48.813] } [18:40:48.813] ...future.workdir <- getwd() [18:40:48.813] } [18:40:48.813] ...future.oldOptions <- base::as.list(base::.Options) [18:40:48.813] ...future.oldEnvVars <- base::Sys.getenv() [18:40:48.813] } [18:40:48.813] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:40:48.813] future.globals.maxSize = Inf, future.globals.method = NULL, [18:40:48.813] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:40:48.813] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:40:48.813] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:40:48.813] future.stdout.windows.reencode = NULL, width = 80L) [18:40:48.813] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:40:48.813] base::names(...future.oldOptions)) [18:40:48.813] } [18:40:48.813] if (FALSE) { [18:40:48.813] } [18:40:48.813] else { [18:40:48.813] if (TRUE) { [18:40:48.813] ...future.stdout <- base::rawConnection(base::raw(0L), [18:40:48.813] open = "w") [18:40:48.813] } [18:40:48.813] else { [18:40:48.813] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:40:48.813] windows = "NUL", "/dev/null"), open = "w") [18:40:48.813] } [18:40:48.813] base::sink(...future.stdout, type = "output", split = FALSE) [18:40:48.813] base::on.exit(if (!base::is.null(...future.stdout)) { [18:40:48.813] base::sink(type = "output", split = FALSE) [18:40:48.813] base::close(...future.stdout) [18:40:48.813] }, add = TRUE) [18:40:48.813] } [18:40:48.813] ...future.frame <- base::sys.nframe() [18:40:48.813] ...future.conditions <- base::list() [18:40:48.813] ...future.rng <- base::globalenv()$.Random.seed [18:40:48.813] if (FALSE) { [18:40:48.813] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:40:48.813] "...future.value", "...future.globalenv.names", ".Random.seed") [18:40:48.813] } [18:40:48.813] ...future.result <- base::tryCatch({ [18:40:48.813] base::withCallingHandlers({ [18:40:48.813] ...future.value <- base::withVisible(base::local({ [18:40:48.813] ...future.makeSendCondition <- base::local({ [18:40:48.813] sendCondition <- NULL [18:40:48.813] function(frame = 1L) { [18:40:48.813] if (is.function(sendCondition)) [18:40:48.813] return(sendCondition) [18:40:48.813] ns <- getNamespace("parallel") [18:40:48.813] if (exists("sendData", mode = "function", [18:40:48.813] envir = ns)) { [18:40:48.813] parallel_sendData <- get("sendData", mode = "function", [18:40:48.813] envir = ns) [18:40:48.813] envir <- sys.frame(frame) [18:40:48.813] master <- NULL [18:40:48.813] while (!identical(envir, .GlobalEnv) && [18:40:48.813] !identical(envir, emptyenv())) { [18:40:48.813] if (exists("master", mode = "list", envir = envir, [18:40:48.813] inherits = FALSE)) { [18:40:48.813] master <- get("master", mode = "list", [18:40:48.813] envir = envir, inherits = FALSE) [18:40:48.813] if (inherits(master, c("SOCKnode", [18:40:48.813] "SOCK0node"))) { [18:40:48.813] sendCondition <<- function(cond) { [18:40:48.813] data <- list(type = "VALUE", value = cond, [18:40:48.813] success = TRUE) [18:40:48.813] parallel_sendData(master, data) [18:40:48.813] } [18:40:48.813] return(sendCondition) [18:40:48.813] } [18:40:48.813] } [18:40:48.813] frame <- frame + 1L [18:40:48.813] envir <- sys.frame(frame) [18:40:48.813] } [18:40:48.813] } [18:40:48.813] sendCondition <<- function(cond) NULL [18:40:48.813] } [18:40:48.813] }) [18:40:48.813] withCallingHandlers({ [18:40:48.813] { [18:40:48.813] do.call(function(...) { [18:40:48.813] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:48.813] if (!identical(...future.globals.maxSize.org, [18:40:48.813] ...future.globals.maxSize)) { [18:40:48.813] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:48.813] on.exit(options(oopts), add = TRUE) [18:40:48.813] } [18:40:48.813] { [18:40:48.813] lapply(seq_along(...future.elements_ii), [18:40:48.813] FUN = function(jj) { [18:40:48.813] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:48.813] ...future.FUN(...future.X_jj, ...) [18:40:48.813] }) [18:40:48.813] } [18:40:48.813] }, args = future.call.arguments) [18:40:48.813] } [18:40:48.813] }, immediateCondition = function(cond) { [18:40:48.813] sendCondition <- ...future.makeSendCondition() [18:40:48.813] sendCondition(cond) [18:40:48.813] muffleCondition <- function (cond, pattern = "^muffle") [18:40:48.813] { [18:40:48.813] inherits <- base::inherits [18:40:48.813] invokeRestart <- base::invokeRestart [18:40:48.813] is.null <- base::is.null [18:40:48.813] muffled <- FALSE [18:40:48.813] if (inherits(cond, "message")) { [18:40:48.813] muffled <- grepl(pattern, "muffleMessage") [18:40:48.813] if (muffled) [18:40:48.813] invokeRestart("muffleMessage") [18:40:48.813] } [18:40:48.813] else if (inherits(cond, "warning")) { [18:40:48.813] muffled <- grepl(pattern, "muffleWarning") [18:40:48.813] if (muffled) [18:40:48.813] invokeRestart("muffleWarning") [18:40:48.813] } [18:40:48.813] else if (inherits(cond, "condition")) { [18:40:48.813] if (!is.null(pattern)) { [18:40:48.813] computeRestarts <- base::computeRestarts [18:40:48.813] grepl <- base::grepl [18:40:48.813] restarts <- computeRestarts(cond) [18:40:48.813] for (restart in restarts) { [18:40:48.813] name <- restart$name [18:40:48.813] if (is.null(name)) [18:40:48.813] next [18:40:48.813] if (!grepl(pattern, name)) [18:40:48.813] next [18:40:48.813] invokeRestart(restart) [18:40:48.813] muffled <- TRUE [18:40:48.813] break [18:40:48.813] } [18:40:48.813] } [18:40:48.813] } [18:40:48.813] invisible(muffled) [18:40:48.813] } [18:40:48.813] muffleCondition(cond) [18:40:48.813] }) [18:40:48.813] })) [18:40:48.813] future::FutureResult(value = ...future.value$value, [18:40:48.813] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:40:48.813] ...future.rng), globalenv = if (FALSE) [18:40:48.813] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:40:48.813] ...future.globalenv.names)) [18:40:48.813] else NULL, started = ...future.startTime, version = "1.8") [18:40:48.813] }, condition = base::local({ [18:40:48.813] c <- base::c [18:40:48.813] inherits <- base::inherits [18:40:48.813] invokeRestart <- base::invokeRestart [18:40:48.813] length <- base::length [18:40:48.813] list <- base::list [18:40:48.813] seq.int <- base::seq.int [18:40:48.813] signalCondition <- base::signalCondition [18:40:48.813] sys.calls <- base::sys.calls [18:40:48.813] `[[` <- base::`[[` [18:40:48.813] `+` <- base::`+` [18:40:48.813] `<<-` <- base::`<<-` [18:40:48.813] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:40:48.813] calls[seq.int(from = from + 12L, to = length(calls) - [18:40:48.813] 3L)] [18:40:48.813] } [18:40:48.813] function(cond) { [18:40:48.813] is_error <- inherits(cond, "error") [18:40:48.813] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:40:48.813] NULL) [18:40:48.813] if (is_error) { [18:40:48.813] sessionInformation <- function() { [18:40:48.813] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:40:48.813] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:40:48.813] search = base::search(), system = base::Sys.info()) [18:40:48.813] } [18:40:48.813] ...future.conditions[[length(...future.conditions) + [18:40:48.813] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:40:48.813] cond$call), session = sessionInformation(), [18:40:48.813] timestamp = base::Sys.time(), signaled = 0L) [18:40:48.813] signalCondition(cond) [18:40:48.813] } [18:40:48.813] else if (!ignore && TRUE && inherits(cond, c("condition", [18:40:48.813] "immediateCondition"))) { [18:40:48.813] signal <- TRUE && inherits(cond, "immediateCondition") [18:40:48.813] ...future.conditions[[length(...future.conditions) + [18:40:48.813] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:40:48.813] if (TRUE && !signal) { [18:40:48.813] muffleCondition <- function (cond, pattern = "^muffle") [18:40:48.813] { [18:40:48.813] inherits <- base::inherits [18:40:48.813] invokeRestart <- base::invokeRestart [18:40:48.813] is.null <- base::is.null [18:40:48.813] muffled <- FALSE [18:40:48.813] if (inherits(cond, "message")) { [18:40:48.813] muffled <- grepl(pattern, "muffleMessage") [18:40:48.813] if (muffled) [18:40:48.813] invokeRestart("muffleMessage") [18:40:48.813] } [18:40:48.813] else if (inherits(cond, "warning")) { [18:40:48.813] muffled <- grepl(pattern, "muffleWarning") [18:40:48.813] if (muffled) [18:40:48.813] invokeRestart("muffleWarning") [18:40:48.813] } [18:40:48.813] else if (inherits(cond, "condition")) { [18:40:48.813] if (!is.null(pattern)) { [18:40:48.813] computeRestarts <- base::computeRestarts [18:40:48.813] grepl <- base::grepl [18:40:48.813] restarts <- computeRestarts(cond) [18:40:48.813] for (restart in restarts) { [18:40:48.813] name <- restart$name [18:40:48.813] if (is.null(name)) [18:40:48.813] next [18:40:48.813] if (!grepl(pattern, name)) [18:40:48.813] next [18:40:48.813] invokeRestart(restart) [18:40:48.813] muffled <- TRUE [18:40:48.813] break [18:40:48.813] } [18:40:48.813] } [18:40:48.813] } [18:40:48.813] invisible(muffled) [18:40:48.813] } [18:40:48.813] muffleCondition(cond, pattern = "^muffle") [18:40:48.813] } [18:40:48.813] } [18:40:48.813] else { [18:40:48.813] if (TRUE) { [18:40:48.813] muffleCondition <- function (cond, pattern = "^muffle") [18:40:48.813] { [18:40:48.813] inherits <- base::inherits [18:40:48.813] invokeRestart <- base::invokeRestart [18:40:48.813] is.null <- base::is.null [18:40:48.813] muffled <- FALSE [18:40:48.813] if (inherits(cond, "message")) { [18:40:48.813] muffled <- grepl(pattern, "muffleMessage") [18:40:48.813] if (muffled) [18:40:48.813] invokeRestart("muffleMessage") [18:40:48.813] } [18:40:48.813] else if (inherits(cond, "warning")) { [18:40:48.813] muffled <- grepl(pattern, "muffleWarning") [18:40:48.813] if (muffled) [18:40:48.813] invokeRestart("muffleWarning") [18:40:48.813] } [18:40:48.813] else if (inherits(cond, "condition")) { [18:40:48.813] if (!is.null(pattern)) { [18:40:48.813] computeRestarts <- base::computeRestarts [18:40:48.813] grepl <- base::grepl [18:40:48.813] restarts <- computeRestarts(cond) [18:40:48.813] for (restart in restarts) { [18:40:48.813] name <- restart$name [18:40:48.813] if (is.null(name)) [18:40:48.813] next [18:40:48.813] if (!grepl(pattern, name)) [18:40:48.813] next [18:40:48.813] invokeRestart(restart) [18:40:48.813] muffled <- TRUE [18:40:48.813] break [18:40:48.813] } [18:40:48.813] } [18:40:48.813] } [18:40:48.813] invisible(muffled) [18:40:48.813] } [18:40:48.813] muffleCondition(cond, pattern = "^muffle") [18:40:48.813] } [18:40:48.813] } [18:40:48.813] } [18:40:48.813] })) [18:40:48.813] }, error = function(ex) { [18:40:48.813] base::structure(base::list(value = NULL, visible = NULL, [18:40:48.813] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:40:48.813] ...future.rng), started = ...future.startTime, [18:40:48.813] finished = Sys.time(), session_uuid = NA_character_, [18:40:48.813] version = "1.8"), class = "FutureResult") [18:40:48.813] }, finally = { [18:40:48.813] if (!identical(...future.workdir, getwd())) [18:40:48.813] setwd(...future.workdir) [18:40:48.813] { [18:40:48.813] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:40:48.813] ...future.oldOptions$nwarnings <- NULL [18:40:48.813] } [18:40:48.813] base::options(...future.oldOptions) [18:40:48.813] if (.Platform$OS.type == "windows") { [18:40:48.813] old_names <- names(...future.oldEnvVars) [18:40:48.813] envs <- base::Sys.getenv() [18:40:48.813] names <- names(envs) [18:40:48.813] common <- intersect(names, old_names) [18:40:48.813] added <- setdiff(names, old_names) [18:40:48.813] removed <- setdiff(old_names, names) [18:40:48.813] changed <- common[...future.oldEnvVars[common] != [18:40:48.813] envs[common]] [18:40:48.813] NAMES <- toupper(changed) [18:40:48.813] args <- list() [18:40:48.813] for (kk in seq_along(NAMES)) { [18:40:48.813] name <- changed[[kk]] [18:40:48.813] NAME <- NAMES[[kk]] [18:40:48.813] if (name != NAME && is.element(NAME, old_names)) [18:40:48.813] next [18:40:48.813] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:48.813] } [18:40:48.813] NAMES <- toupper(added) [18:40:48.813] for (kk in seq_along(NAMES)) { [18:40:48.813] name <- added[[kk]] [18:40:48.813] NAME <- NAMES[[kk]] [18:40:48.813] if (name != NAME && is.element(NAME, old_names)) [18:40:48.813] next [18:40:48.813] args[[name]] <- "" [18:40:48.813] } [18:40:48.813] NAMES <- toupper(removed) [18:40:48.813] for (kk in seq_along(NAMES)) { [18:40:48.813] name <- removed[[kk]] [18:40:48.813] NAME <- NAMES[[kk]] [18:40:48.813] if (name != NAME && is.element(NAME, old_names)) [18:40:48.813] next [18:40:48.813] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:48.813] } [18:40:48.813] if (length(args) > 0) [18:40:48.813] base::do.call(base::Sys.setenv, args = args) [18:40:48.813] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:40:48.813] } [18:40:48.813] else { [18:40:48.813] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:40:48.813] } [18:40:48.813] { [18:40:48.813] if (base::length(...future.futureOptionsAdded) > [18:40:48.813] 0L) { [18:40:48.813] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:40:48.813] base::names(opts) <- ...future.futureOptionsAdded [18:40:48.813] base::options(opts) [18:40:48.813] } [18:40:48.813] { [18:40:48.813] { [18:40:48.813] base::options(mc.cores = ...future.mc.cores.old) [18:40:48.813] NULL [18:40:48.813] } [18:40:48.813] options(future.plan = NULL) [18:40:48.813] if (is.na(NA_character_)) [18:40:48.813] Sys.unsetenv("R_FUTURE_PLAN") [18:40:48.813] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:40:48.813] future::plan(...future.strategy.old, .cleanup = FALSE, [18:40:48.813] .init = FALSE) [18:40:48.813] } [18:40:48.813] } [18:40:48.813] } [18:40:48.813] }) [18:40:48.813] if (TRUE) { [18:40:48.813] base::sink(type = "output", split = FALSE) [18:40:48.813] if (TRUE) { [18:40:48.813] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:40:48.813] } [18:40:48.813] else { [18:40:48.813] ...future.result["stdout"] <- base::list(NULL) [18:40:48.813] } [18:40:48.813] base::close(...future.stdout) [18:40:48.813] ...future.stdout <- NULL [18:40:48.813] } [18:40:48.813] ...future.result$conditions <- ...future.conditions [18:40:48.813] ...future.result$finished <- base::Sys.time() [18:40:48.813] ...future.result [18:40:48.813] } [18:40:48.818] Exporting 5 global objects (31.96 KiB) to cluster node #1 ... [18:40:48.818] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:40:48.819] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:40:48.819] Exporting '...future.FUN' (31.30 KiB) to cluster node #1 ... [18:40:48.820] Exporting '...future.FUN' (31.30 KiB) to cluster node #1 ... DONE [18:40:48.820] Exporting '...future.elements_ii' (71 bytes) to cluster node #1 ... [18:40:48.821] Exporting '...future.elements_ii' (71 bytes) to cluster node #1 ... DONE [18:40:48.821] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:40:48.821] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:40:48.821] Exporting '...future.globals.maxSize' (39 bytes) to cluster node #1 ... [18:40:48.822] Exporting '...future.globals.maxSize' (39 bytes) to cluster node #1 ... DONE [18:40:48.822] Exporting 5 global objects (31.96 KiB) to cluster node #1 ... DONE [18:40:48.823] MultisessionFuture started [18:40:48.823] - Launch lazy future ... done [18:40:48.823] run() for 'MultisessionFuture' ... done [18:40:48.823] Created future: [18:40:48.837] receiveMessageFromWorker() for ClusterFuture ... [18:40:48.837] - Validating connection of MultisessionFuture [18:40:48.837] - received message: FutureResult [18:40:48.838] - Received FutureResult [18:40:48.838] - Erased future from FutureRegistry [18:40:48.838] result() for ClusterFuture ... [18:40:48.838] - result already collected: FutureResult [18:40:48.838] result() for ClusterFuture ... done [18:40:48.838] receiveMessageFromWorker() for ClusterFuture ... done [18:40:48.823] MultisessionFuture: [18:40:48.823] Label: 'future_apply-1' [18:40:48.823] Expression: [18:40:48.823] { [18:40:48.823] do.call(function(...) { [18:40:48.823] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:48.823] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:48.823] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:48.823] on.exit(options(oopts), add = TRUE) [18:40:48.823] } [18:40:48.823] { [18:40:48.823] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:48.823] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:48.823] ...future.FUN(...future.X_jj, ...) [18:40:48.823] }) [18:40:48.823] } [18:40:48.823] }, args = future.call.arguments) [18:40:48.823] } [18:40:48.823] Lazy evaluation: FALSE [18:40:48.823] Asynchronous evaluation: TRUE [18:40:48.823] Local evaluation: TRUE [18:40:48.823] Environment: R_GlobalEnv [18:40:48.823] Capture standard output: TRUE [18:40:48.823] Capture condition classes: 'condition' (excluding 'nothing') [18:40:48.823] Globals: 5 objects totaling 31.53 KiB (DotDotDotList 'future.call.arguments' of 97 bytes, function '...future.FUN' of 31.30 KiB, list '...future.elements_ii' of 71 bytes, NULL '...future.seeds_ii' of 27 bytes, numeric '...future.globals.maxSize' of 39 bytes) [18:40:48.823] Packages: [18:40:48.823] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:40:48.823] Resolved: TRUE [18:40:48.823] Value: [18:40:48.823] Conditions captured: [18:40:48.823] Early signaling: FALSE [18:40:48.823] Owner process: 2171382a-9202-bc7d-80d6-248e0cb487f4 [18:40:48.823] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:40:48.839] Chunk #1 of 2 ... DONE [18:40:48.839] Chunk #2 of 2 ... [18:40:48.839] - Adjusted option 'future.globals.maxSize': Inf -> 2 * Inf = Inf (bytes) [18:40:48.839] - seeds: [18:40:48.839] - All globals exported: [n=5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:48.840] getGlobalsAndPackages() ... [18:40:48.840] - globals passed as-is: [5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:48.840] Resolving globals: FALSE [18:40:48.840] Tweak future expression to call with '...' arguments ... [18:40:48.840] { [18:40:48.840] do.call(function(...) { [18:40:48.840] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:48.840] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:48.840] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:48.840] on.exit(options(oopts), add = TRUE) [18:40:48.840] } [18:40:48.840] { [18:40:48.840] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:48.840] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:48.840] ...future.FUN(...future.X_jj, ...) [18:40:48.840] }) [18:40:48.840] } [18:40:48.840] }, args = future.call.arguments) [18:40:48.840] } [18:40:48.841] Tweak future expression to call with '...' arguments ... DONE [18:40:48.841] - globals: [5] 'future.call.arguments', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:48.842] [18:40:48.842] getGlobalsAndPackages() ... DONE [18:40:48.842] run() for 'Future' ... [18:40:48.842] - state: 'created' [18:40:48.843] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:40:48.858] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:40:48.858] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:40:48.859] - Field: 'node' [18:40:48.859] - Field: 'label' [18:40:48.859] - Field: 'local' [18:40:48.859] - Field: 'owner' [18:40:48.859] - Field: 'envir' [18:40:48.860] - Field: 'workers' [18:40:48.860] - Field: 'packages' [18:40:48.860] - Field: 'gc' [18:40:48.860] - Field: 'conditions' [18:40:48.860] - Field: 'persistent' [18:40:48.860] - Field: 'expr' [18:40:48.861] - Field: 'uuid' [18:40:48.861] - Field: 'seed' [18:40:48.861] - Field: 'version' [18:40:48.861] - Field: 'result' [18:40:48.861] - Field: 'asynchronous' [18:40:48.862] - Field: 'calls' [18:40:48.862] - Field: 'globals' [18:40:48.862] - Field: 'stdout' [18:40:48.862] - Field: 'earlySignal' [18:40:48.862] - Field: 'lazy' [18:40:48.862] - Field: 'state' [18:40:48.863] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:40:48.863] - Launch lazy future ... [18:40:48.863] Packages needed by the future expression (n = 0): [18:40:48.863] Packages needed by future strategies (n = 0): [18:40:48.864] { [18:40:48.864] { [18:40:48.864] { [18:40:48.864] ...future.startTime <- base::Sys.time() [18:40:48.864] { [18:40:48.864] { [18:40:48.864] { [18:40:48.864] { [18:40:48.864] base::local({ [18:40:48.864] has_future <- base::requireNamespace("future", [18:40:48.864] quietly = TRUE) [18:40:48.864] if (has_future) { [18:40:48.864] ns <- base::getNamespace("future") [18:40:48.864] version <- ns[[".package"]][["version"]] [18:40:48.864] if (is.null(version)) [18:40:48.864] version <- utils::packageVersion("future") [18:40:48.864] } [18:40:48.864] else { [18:40:48.864] version <- NULL [18:40:48.864] } [18:40:48.864] if (!has_future || version < "1.8.0") { [18:40:48.864] info <- base::c(r_version = base::gsub("R version ", [18:40:48.864] "", base::R.version$version.string), [18:40:48.864] platform = base::sprintf("%s (%s-bit)", [18:40:48.864] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:40:48.864] os = base::paste(base::Sys.info()[base::c("sysname", [18:40:48.864] "release", "version")], collapse = " "), [18:40:48.864] hostname = base::Sys.info()[["nodename"]]) [18:40:48.864] info <- base::sprintf("%s: %s", base::names(info), [18:40:48.864] info) [18:40:48.864] info <- base::paste(info, collapse = "; ") [18:40:48.864] if (!has_future) { [18:40:48.864] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:40:48.864] info) [18:40:48.864] } [18:40:48.864] else { [18:40:48.864] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:40:48.864] info, version) [18:40:48.864] } [18:40:48.864] base::stop(msg) [18:40:48.864] } [18:40:48.864] }) [18:40:48.864] } [18:40:48.864] ...future.mc.cores.old <- base::getOption("mc.cores") [18:40:48.864] base::options(mc.cores = 1L) [18:40:48.864] } [18:40:48.864] ...future.strategy.old <- future::plan("list") [18:40:48.864] options(future.plan = NULL) [18:40:48.864] Sys.unsetenv("R_FUTURE_PLAN") [18:40:48.864] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:40:48.864] } [18:40:48.864] ...future.workdir <- getwd() [18:40:48.864] } [18:40:48.864] ...future.oldOptions <- base::as.list(base::.Options) [18:40:48.864] ...future.oldEnvVars <- base::Sys.getenv() [18:40:48.864] } [18:40:48.864] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:40:48.864] future.globals.maxSize = Inf, future.globals.method = NULL, [18:40:48.864] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:40:48.864] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:40:48.864] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:40:48.864] future.stdout.windows.reencode = NULL, width = 80L) [18:40:48.864] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:40:48.864] base::names(...future.oldOptions)) [18:40:48.864] } [18:40:48.864] if (FALSE) { [18:40:48.864] } [18:40:48.864] else { [18:40:48.864] if (TRUE) { [18:40:48.864] ...future.stdout <- base::rawConnection(base::raw(0L), [18:40:48.864] open = "w") [18:40:48.864] } [18:40:48.864] else { [18:40:48.864] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:40:48.864] windows = "NUL", "/dev/null"), open = "w") [18:40:48.864] } [18:40:48.864] base::sink(...future.stdout, type = "output", split = FALSE) [18:40:48.864] base::on.exit(if (!base::is.null(...future.stdout)) { [18:40:48.864] base::sink(type = "output", split = FALSE) [18:40:48.864] base::close(...future.stdout) [18:40:48.864] }, add = TRUE) [18:40:48.864] } [18:40:48.864] ...future.frame <- base::sys.nframe() [18:40:48.864] ...future.conditions <- base::list() [18:40:48.864] ...future.rng <- base::globalenv()$.Random.seed [18:40:48.864] if (FALSE) { [18:40:48.864] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:40:48.864] "...future.value", "...future.globalenv.names", ".Random.seed") [18:40:48.864] } [18:40:48.864] ...future.result <- base::tryCatch({ [18:40:48.864] base::withCallingHandlers({ [18:40:48.864] ...future.value <- base::withVisible(base::local({ [18:40:48.864] ...future.makeSendCondition <- base::local({ [18:40:48.864] sendCondition <- NULL [18:40:48.864] function(frame = 1L) { [18:40:48.864] if (is.function(sendCondition)) [18:40:48.864] return(sendCondition) [18:40:48.864] ns <- getNamespace("parallel") [18:40:48.864] if (exists("sendData", mode = "function", [18:40:48.864] envir = ns)) { [18:40:48.864] parallel_sendData <- get("sendData", mode = "function", [18:40:48.864] envir = ns) [18:40:48.864] envir <- sys.frame(frame) [18:40:48.864] master <- NULL [18:40:48.864] while (!identical(envir, .GlobalEnv) && [18:40:48.864] !identical(envir, emptyenv())) { [18:40:48.864] if (exists("master", mode = "list", envir = envir, [18:40:48.864] inherits = FALSE)) { [18:40:48.864] master <- get("master", mode = "list", [18:40:48.864] envir = envir, inherits = FALSE) [18:40:48.864] if (inherits(master, c("SOCKnode", [18:40:48.864] "SOCK0node"))) { [18:40:48.864] sendCondition <<- function(cond) { [18:40:48.864] data <- list(type = "VALUE", value = cond, [18:40:48.864] success = TRUE) [18:40:48.864] parallel_sendData(master, data) [18:40:48.864] } [18:40:48.864] return(sendCondition) [18:40:48.864] } [18:40:48.864] } [18:40:48.864] frame <- frame + 1L [18:40:48.864] envir <- sys.frame(frame) [18:40:48.864] } [18:40:48.864] } [18:40:48.864] sendCondition <<- function(cond) NULL [18:40:48.864] } [18:40:48.864] }) [18:40:48.864] withCallingHandlers({ [18:40:48.864] { [18:40:48.864] do.call(function(...) { [18:40:48.864] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:48.864] if (!identical(...future.globals.maxSize.org, [18:40:48.864] ...future.globals.maxSize)) { [18:40:48.864] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:48.864] on.exit(options(oopts), add = TRUE) [18:40:48.864] } [18:40:48.864] { [18:40:48.864] lapply(seq_along(...future.elements_ii), [18:40:48.864] FUN = function(jj) { [18:40:48.864] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:48.864] ...future.FUN(...future.X_jj, ...) [18:40:48.864] }) [18:40:48.864] } [18:40:48.864] }, args = future.call.arguments) [18:40:48.864] } [18:40:48.864] }, immediateCondition = function(cond) { [18:40:48.864] sendCondition <- ...future.makeSendCondition() [18:40:48.864] sendCondition(cond) [18:40:48.864] muffleCondition <- function (cond, pattern = "^muffle") [18:40:48.864] { [18:40:48.864] inherits <- base::inherits [18:40:48.864] invokeRestart <- base::invokeRestart [18:40:48.864] is.null <- base::is.null [18:40:48.864] muffled <- FALSE [18:40:48.864] if (inherits(cond, "message")) { [18:40:48.864] muffled <- grepl(pattern, "muffleMessage") [18:40:48.864] if (muffled) [18:40:48.864] invokeRestart("muffleMessage") [18:40:48.864] } [18:40:48.864] else if (inherits(cond, "warning")) { [18:40:48.864] muffled <- grepl(pattern, "muffleWarning") [18:40:48.864] if (muffled) [18:40:48.864] invokeRestart("muffleWarning") [18:40:48.864] } [18:40:48.864] else if (inherits(cond, "condition")) { [18:40:48.864] if (!is.null(pattern)) { [18:40:48.864] computeRestarts <- base::computeRestarts [18:40:48.864] grepl <- base::grepl [18:40:48.864] restarts <- computeRestarts(cond) [18:40:48.864] for (restart in restarts) { [18:40:48.864] name <- restart$name [18:40:48.864] if (is.null(name)) [18:40:48.864] next [18:40:48.864] if (!grepl(pattern, name)) [18:40:48.864] next [18:40:48.864] invokeRestart(restart) [18:40:48.864] muffled <- TRUE [18:40:48.864] break [18:40:48.864] } [18:40:48.864] } [18:40:48.864] } [18:40:48.864] invisible(muffled) [18:40:48.864] } [18:40:48.864] muffleCondition(cond) [18:40:48.864] }) [18:40:48.864] })) [18:40:48.864] future::FutureResult(value = ...future.value$value, [18:40:48.864] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:40:48.864] ...future.rng), globalenv = if (FALSE) [18:40:48.864] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:40:48.864] ...future.globalenv.names)) [18:40:48.864] else NULL, started = ...future.startTime, version = "1.8") [18:40:48.864] }, condition = base::local({ [18:40:48.864] c <- base::c [18:40:48.864] inherits <- base::inherits [18:40:48.864] invokeRestart <- base::invokeRestart [18:40:48.864] length <- base::length [18:40:48.864] list <- base::list [18:40:48.864] seq.int <- base::seq.int [18:40:48.864] signalCondition <- base::signalCondition [18:40:48.864] sys.calls <- base::sys.calls [18:40:48.864] `[[` <- base::`[[` [18:40:48.864] `+` <- base::`+` [18:40:48.864] `<<-` <- base::`<<-` [18:40:48.864] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:40:48.864] calls[seq.int(from = from + 12L, to = length(calls) - [18:40:48.864] 3L)] [18:40:48.864] } [18:40:48.864] function(cond) { [18:40:48.864] is_error <- inherits(cond, "error") [18:40:48.864] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:40:48.864] NULL) [18:40:48.864] if (is_error) { [18:40:48.864] sessionInformation <- function() { [18:40:48.864] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:40:48.864] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:40:48.864] search = base::search(), system = base::Sys.info()) [18:40:48.864] } [18:40:48.864] ...future.conditions[[length(...future.conditions) + [18:40:48.864] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:40:48.864] cond$call), session = sessionInformation(), [18:40:48.864] timestamp = base::Sys.time(), signaled = 0L) [18:40:48.864] signalCondition(cond) [18:40:48.864] } [18:40:48.864] else if (!ignore && TRUE && inherits(cond, c("condition", [18:40:48.864] "immediateCondition"))) { [18:40:48.864] signal <- TRUE && inherits(cond, "immediateCondition") [18:40:48.864] ...future.conditions[[length(...future.conditions) + [18:40:48.864] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:40:48.864] if (TRUE && !signal) { [18:40:48.864] muffleCondition <- function (cond, pattern = "^muffle") [18:40:48.864] { [18:40:48.864] inherits <- base::inherits [18:40:48.864] invokeRestart <- base::invokeRestart [18:40:48.864] is.null <- base::is.null [18:40:48.864] muffled <- FALSE [18:40:48.864] if (inherits(cond, "message")) { [18:40:48.864] muffled <- grepl(pattern, "muffleMessage") [18:40:48.864] if (muffled) [18:40:48.864] invokeRestart("muffleMessage") [18:40:48.864] } [18:40:48.864] else if (inherits(cond, "warning")) { [18:40:48.864] muffled <- grepl(pattern, "muffleWarning") [18:40:48.864] if (muffled) [18:40:48.864] invokeRestart("muffleWarning") [18:40:48.864] } [18:40:48.864] else if (inherits(cond, "condition")) { [18:40:48.864] if (!is.null(pattern)) { [18:40:48.864] computeRestarts <- base::computeRestarts [18:40:48.864] grepl <- base::grepl [18:40:48.864] restarts <- computeRestarts(cond) [18:40:48.864] for (restart in restarts) { [18:40:48.864] name <- restart$name [18:40:48.864] if (is.null(name)) [18:40:48.864] next [18:40:48.864] if (!grepl(pattern, name)) [18:40:48.864] next [18:40:48.864] invokeRestart(restart) [18:40:48.864] muffled <- TRUE [18:40:48.864] break [18:40:48.864] } [18:40:48.864] } [18:40:48.864] } [18:40:48.864] invisible(muffled) [18:40:48.864] } [18:40:48.864] muffleCondition(cond, pattern = "^muffle") [18:40:48.864] } [18:40:48.864] } [18:40:48.864] else { [18:40:48.864] if (TRUE) { [18:40:48.864] muffleCondition <- function (cond, pattern = "^muffle") [18:40:48.864] { [18:40:48.864] inherits <- base::inherits [18:40:48.864] invokeRestart <- base::invokeRestart [18:40:48.864] is.null <- base::is.null [18:40:48.864] muffled <- FALSE [18:40:48.864] if (inherits(cond, "message")) { [18:40:48.864] muffled <- grepl(pattern, "muffleMessage") [18:40:48.864] if (muffled) [18:40:48.864] invokeRestart("muffleMessage") [18:40:48.864] } [18:40:48.864] else if (inherits(cond, "warning")) { [18:40:48.864] muffled <- grepl(pattern, "muffleWarning") [18:40:48.864] if (muffled) [18:40:48.864] invokeRestart("muffleWarning") [18:40:48.864] } [18:40:48.864] else if (inherits(cond, "condition")) { [18:40:48.864] if (!is.null(pattern)) { [18:40:48.864] computeRestarts <- base::computeRestarts [18:40:48.864] grepl <- base::grepl [18:40:48.864] restarts <- computeRestarts(cond) [18:40:48.864] for (restart in restarts) { [18:40:48.864] name <- restart$name [18:40:48.864] if (is.null(name)) [18:40:48.864] next [18:40:48.864] if (!grepl(pattern, name)) [18:40:48.864] next [18:40:48.864] invokeRestart(restart) [18:40:48.864] muffled <- TRUE [18:40:48.864] break [18:40:48.864] } [18:40:48.864] } [18:40:48.864] } [18:40:48.864] invisible(muffled) [18:40:48.864] } [18:40:48.864] muffleCondition(cond, pattern = "^muffle") [18:40:48.864] } [18:40:48.864] } [18:40:48.864] } [18:40:48.864] })) [18:40:48.864] }, error = function(ex) { [18:40:48.864] base::structure(base::list(value = NULL, visible = NULL, [18:40:48.864] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:40:48.864] ...future.rng), started = ...future.startTime, [18:40:48.864] finished = Sys.time(), session_uuid = NA_character_, [18:40:48.864] version = "1.8"), class = "FutureResult") [18:40:48.864] }, finally = { [18:40:48.864] if (!identical(...future.workdir, getwd())) [18:40:48.864] setwd(...future.workdir) [18:40:48.864] { [18:40:48.864] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:40:48.864] ...future.oldOptions$nwarnings <- NULL [18:40:48.864] } [18:40:48.864] base::options(...future.oldOptions) [18:40:48.864] if (.Platform$OS.type == "windows") { [18:40:48.864] old_names <- names(...future.oldEnvVars) [18:40:48.864] envs <- base::Sys.getenv() [18:40:48.864] names <- names(envs) [18:40:48.864] common <- intersect(names, old_names) [18:40:48.864] added <- setdiff(names, old_names) [18:40:48.864] removed <- setdiff(old_names, names) [18:40:48.864] changed <- common[...future.oldEnvVars[common] != [18:40:48.864] envs[common]] [18:40:48.864] NAMES <- toupper(changed) [18:40:48.864] args <- list() [18:40:48.864] for (kk in seq_along(NAMES)) { [18:40:48.864] name <- changed[[kk]] [18:40:48.864] NAME <- NAMES[[kk]] [18:40:48.864] if (name != NAME && is.element(NAME, old_names)) [18:40:48.864] next [18:40:48.864] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:48.864] } [18:40:48.864] NAMES <- toupper(added) [18:40:48.864] for (kk in seq_along(NAMES)) { [18:40:48.864] name <- added[[kk]] [18:40:48.864] NAME <- NAMES[[kk]] [18:40:48.864] if (name != NAME && is.element(NAME, old_names)) [18:40:48.864] next [18:40:48.864] args[[name]] <- "" [18:40:48.864] } [18:40:48.864] NAMES <- toupper(removed) [18:40:48.864] for (kk in seq_along(NAMES)) { [18:40:48.864] name <- removed[[kk]] [18:40:48.864] NAME <- NAMES[[kk]] [18:40:48.864] if (name != NAME && is.element(NAME, old_names)) [18:40:48.864] next [18:40:48.864] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:48.864] } [18:40:48.864] if (length(args) > 0) [18:40:48.864] base::do.call(base::Sys.setenv, args = args) [18:40:48.864] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:40:48.864] } [18:40:48.864] else { [18:40:48.864] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:40:48.864] } [18:40:48.864] { [18:40:48.864] if (base::length(...future.futureOptionsAdded) > [18:40:48.864] 0L) { [18:40:48.864] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:40:48.864] base::names(opts) <- ...future.futureOptionsAdded [18:40:48.864] base::options(opts) [18:40:48.864] } [18:40:48.864] { [18:40:48.864] { [18:40:48.864] base::options(mc.cores = ...future.mc.cores.old) [18:40:48.864] NULL [18:40:48.864] } [18:40:48.864] options(future.plan = NULL) [18:40:48.864] if (is.na(NA_character_)) [18:40:48.864] Sys.unsetenv("R_FUTURE_PLAN") [18:40:48.864] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:40:48.864] future::plan(...future.strategy.old, .cleanup = FALSE, [18:40:48.864] .init = FALSE) [18:40:48.864] } [18:40:48.864] } [18:40:48.864] } [18:40:48.864] }) [18:40:48.864] if (TRUE) { [18:40:48.864] base::sink(type = "output", split = FALSE) [18:40:48.864] if (TRUE) { [18:40:48.864] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:40:48.864] } [18:40:48.864] else { [18:40:48.864] ...future.result["stdout"] <- base::list(NULL) [18:40:48.864] } [18:40:48.864] base::close(...future.stdout) [18:40:48.864] ...future.stdout <- NULL [18:40:48.864] } [18:40:48.864] ...future.result$conditions <- ...future.conditions [18:40:48.864] ...future.result$finished <- base::Sys.time() [18:40:48.864] ...future.result [18:40:48.864] } [18:40:48.869] Exporting 5 global objects (31.96 KiB) to cluster node #1 ... [18:40:48.870] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:40:48.870] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:40:48.870] Exporting '...future.FUN' (31.30 KiB) to cluster node #1 ... [18:40:48.871] Exporting '...future.FUN' (31.30 KiB) to cluster node #1 ... DONE [18:40:48.872] Exporting '...future.elements_ii' (71 bytes) to cluster node #1 ... [18:40:48.872] Exporting '...future.elements_ii' (71 bytes) to cluster node #1 ... DONE [18:40:48.872] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:40:48.872] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:40:48.873] Exporting '...future.globals.maxSize' (39 bytes) to cluster node #1 ... [18:40:48.873] Exporting '...future.globals.maxSize' (39 bytes) to cluster node #1 ... DONE [18:40:48.873] Exporting 5 global objects (31.96 KiB) to cluster node #1 ... DONE [18:40:48.876] MultisessionFuture started [18:40:48.876] - Launch lazy future ... done [18:40:48.876] run() for 'MultisessionFuture' ... done [18:40:48.876] Created future: [18:40:48.891] receiveMessageFromWorker() for ClusterFuture ... [18:40:48.892] - Validating connection of MultisessionFuture [18:40:48.892] - received message: FutureResult [18:40:48.892] - Received FutureResult [18:40:48.892] - Erased future from FutureRegistry [18:40:48.892] result() for ClusterFuture ... [18:40:48.893] - result already collected: FutureResult [18:40:48.893] result() for ClusterFuture ... done [18:40:48.893] receiveMessageFromWorker() for ClusterFuture ... done [18:40:48.876] MultisessionFuture: [18:40:48.876] Label: 'future_apply-2' [18:40:48.876] Expression: [18:40:48.876] { [18:40:48.876] do.call(function(...) { [18:40:48.876] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:48.876] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:48.876] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:48.876] on.exit(options(oopts), add = TRUE) [18:40:48.876] } [18:40:48.876] { [18:40:48.876] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:48.876] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:48.876] ...future.FUN(...future.X_jj, ...) [18:40:48.876] }) [18:40:48.876] } [18:40:48.876] }, args = future.call.arguments) [18:40:48.876] } [18:40:48.876] Lazy evaluation: FALSE [18:40:48.876] Asynchronous evaluation: TRUE [18:40:48.876] Local evaluation: TRUE [18:40:48.876] Environment: R_GlobalEnv [18:40:48.876] Capture standard output: TRUE [18:40:48.876] Capture condition classes: 'condition' (excluding 'nothing') [18:40:48.876] Globals: 5 objects totaling 31.53 KiB (DotDotDotList 'future.call.arguments' of 97 bytes, function '...future.FUN' of 31.30 KiB, list '...future.elements_ii' of 71 bytes, NULL '...future.seeds_ii' of 27 bytes, numeric '...future.globals.maxSize' of 39 bytes) [18:40:48.876] Packages: [18:40:48.876] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:40:48.876] Resolved: TRUE [18:40:48.876] Value: [18:40:48.876] Conditions captured: [18:40:48.876] Early signaling: FALSE [18:40:48.876] Owner process: 2171382a-9202-bc7d-80d6-248e0cb487f4 [18:40:48.876] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:40:48.893] Chunk #2 of 2 ... DONE [18:40:48.894] Launching 2 futures (chunks) ... DONE [18:40:48.894] Resolving 2 futures (chunks) ... [18:40:48.894] resolve() on list ... [18:40:48.894] recursive: 0 [18:40:48.894] length: 2 [18:40:48.894] [18:40:48.894] Future #1 [18:40:48.895] result() for ClusterFuture ... [18:40:48.895] - result already collected: FutureResult [18:40:48.895] result() for ClusterFuture ... done [18:40:48.895] result() for ClusterFuture ... [18:40:48.895] - result already collected: FutureResult [18:40:48.895] result() for ClusterFuture ... done [18:40:48.896] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:40:48.896] - nx: 2 [18:40:48.896] - relay: TRUE [18:40:48.896] - stdout: TRUE [18:40:48.896] - signal: TRUE [18:40:48.896] - resignal: FALSE [18:40:48.896] - force: TRUE [18:40:48.897] - relayed: [n=2] FALSE, FALSE [18:40:48.897] - queued futures: [n=2] FALSE, FALSE [18:40:48.897] - until=1 [18:40:48.897] - relaying element #1 [18:40:48.897] result() for ClusterFuture ... [18:40:48.897] - result already collected: FutureResult [18:40:48.898] result() for ClusterFuture ... done [18:40:48.898] result() for ClusterFuture ... [18:40:48.898] - result already collected: FutureResult [18:40:48.898] result() for ClusterFuture ... done [18:40:48.898] result() for ClusterFuture ... [18:40:48.898] - result already collected: FutureResult [18:40:48.899] result() for ClusterFuture ... done [18:40:48.899] result() for ClusterFuture ... [18:40:48.899] - result already collected: FutureResult [18:40:48.899] result() for ClusterFuture ... done [18:40:48.899] - relayed: [n=2] TRUE, FALSE [18:40:48.899] - queued futures: [n=2] TRUE, FALSE [18:40:48.899] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:40:48.900] length: 1 (resolved future 1) [18:40:48.900] Future #2 [18:40:48.900] result() for ClusterFuture ... [18:40:48.900] - result already collected: FutureResult [18:40:48.900] result() for ClusterFuture ... done [18:40:48.900] result() for ClusterFuture ... [18:40:48.901] - result already collected: FutureResult [18:40:48.901] result() for ClusterFuture ... done [18:40:48.901] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:40:48.901] - nx: 2 [18:40:48.901] - relay: TRUE [18:40:48.901] - stdout: TRUE [18:40:48.901] - signal: TRUE [18:40:48.902] - resignal: FALSE [18:40:48.902] - force: TRUE [18:40:48.902] - relayed: [n=2] TRUE, FALSE [18:40:48.902] - queued futures: [n=2] TRUE, FALSE [18:40:48.902] - until=2 [18:40:48.902] - relaying element #2 [18:40:48.903] result() for ClusterFuture ... [18:40:48.903] - result already collected: FutureResult [18:40:48.903] result() for ClusterFuture ... done [18:40:48.903] result() for ClusterFuture ... [18:40:48.903] - result already collected: FutureResult [18:40:48.903] result() for ClusterFuture ... done [18:40:48.903] result() for ClusterFuture ... [18:40:48.904] - result already collected: FutureResult [18:40:48.904] result() for ClusterFuture ... done [18:40:48.904] result() for ClusterFuture ... [18:40:48.904] - result already collected: FutureResult [18:40:48.904] result() for ClusterFuture ... done [18:40:48.904] - relayed: [n=2] TRUE, TRUE [18:40:48.905] - queued futures: [n=2] TRUE, TRUE [18:40:48.905] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:40:48.905] length: 0 (resolved future 2) [18:40:48.905] Relaying remaining futures [18:40:48.905] signalConditionsASAP(NULL, pos=0) ... [18:40:48.905] - nx: 2 [18:40:48.905] - relay: TRUE [18:40:48.906] - stdout: TRUE [18:40:48.906] - signal: TRUE [18:40:48.906] - resignal: FALSE [18:40:48.906] - force: TRUE [18:40:48.906] - relayed: [n=2] TRUE, TRUE [18:40:48.906] - queued futures: [n=2] TRUE, TRUE - flush all [18:40:48.907] - relayed: [n=2] TRUE, TRUE [18:40:48.907] - queued futures: [n=2] TRUE, TRUE [18:40:48.907] signalConditionsASAP(NULL, pos=0) ... done [18:40:48.907] resolve() on list ... DONE [18:40:48.907] result() for ClusterFuture ... [18:40:48.907] - result already collected: FutureResult [18:40:48.908] result() for ClusterFuture ... done [18:40:48.908] result() for ClusterFuture ... [18:40:48.908] - result already collected: FutureResult [18:40:48.908] result() for ClusterFuture ... done [18:40:48.908] result() for ClusterFuture ... [18:40:48.908] - result already collected: FutureResult [18:40:48.908] result() for ClusterFuture ... done [18:40:48.909] result() for ClusterFuture ... [18:40:48.909] - result already collected: FutureResult [18:40:48.909] result() for ClusterFuture ... done [18:40:48.909] - Number of value chunks collected: 2 [18:40:48.909] Resolving 2 futures (chunks) ... DONE [18:40:48.909] Reducing values from 2 chunks ... [18:40:48.910] - Number of values collected after concatenation: 2 [18:40:48.910] - Number of values expected: 2 [18:40:48.910] Reducing values from 2 chunks ... DONE [18:40:48.910] future_lapply() ... DONE [[1]] ...future.X_jj 1 3 7 2 1 1 [[2]] ...future.X_jj 2 4 6 8 1 1 1 1 [18:40:48.911] getGlobalsAndPackagesXApply() ... [18:40:48.911] - future.globals: TRUE [18:40:48.911] getGlobalsAndPackages() ... [18:40:48.911] Searching for globals... [18:40:48.913] - globals found: [2] 'FUN', 'UseMethod' [18:40:48.913] Searching for globals ... DONE [18:40:48.913] Resolving globals: FALSE [18:40:48.914] The total size of the 1 globals is 311 bytes (311 bytes) [18:40:48.914] The total size of the 1 globals exported for future expression ('FUN(X = structure(c(1, 2, 3, 4, 1, 6, 7, 8), dim = c(2L, 4L)))') is 311 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (311 bytes of class 'function') [18:40:48.914] - globals: [1] 'FUN' [18:40:48.915] - packages: [1] 'stats' [18:40:48.915] getGlobalsAndPackages() ... DONE [18:40:48.915] - globals found/used: [n=1] 'FUN' [18:40:48.915] - needed namespaces: [n=1] 'stats' [18:40:48.915] Finding globals ... DONE [18:40:48.915] - use_args: TRUE [18:40:48.916] - Getting '...' globals ... [18:40:48.916] resolve() on list ... [18:40:48.916] recursive: 0 [18:40:48.916] length: 1 [18:40:48.916] elements: '...' [18:40:48.917] length: 0 (resolved future 1) [18:40:48.917] resolve() on list ... DONE [18:40:48.917] - '...' content: [n=0] [18:40:48.917] List of 1 [18:40:48.917] $ ...: list() [18:40:48.917] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:48.917] - attr(*, "where")=List of 1 [18:40:48.917] ..$ ...: [18:40:48.917] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:48.917] - attr(*, "resolved")= logi TRUE [18:40:48.917] - attr(*, "total_size")= num NA [18:40:48.920] - Getting '...' globals ... DONE [18:40:48.920] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:40:48.920] List of 2 [18:40:48.920] $ ...future.FUN:function (x, ...) [18:40:48.920] $ ... : list() [18:40:48.920] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:48.920] - attr(*, "where")=List of 2 [18:40:48.920] ..$ ...future.FUN: [18:40:48.920] ..$ ... : [18:40:48.920] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:48.920] - attr(*, "resolved")= logi FALSE [18:40:48.920] - attr(*, "total_size")= int 2586 [18:40:48.924] Packages to be attached in all futures: [n=1] 'stats' [18:40:48.924] getGlobalsAndPackagesXApply() ... DONE [18:40:48.926] future_lapply() ... [18:40:48.929] Number of chunks: 2 [18:40:48.929] getGlobalsAndPackagesXApply() ... [18:40:48.929] - future.globals: with names 'list()' [18:40:48.929] - use_args: TRUE [18:40:48.930] Globals to be used in all futures (chunks): [n=2] '...', '...future.FUN' [18:40:48.930] List of 2 [18:40:48.930] $ ... : list() [18:40:48.930] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:48.930] $ ...future.FUN:function (x, ...) [18:40:48.930] - attr(*, "where")=List of 2 [18:40:48.930] ..$ ... : [18:40:48.930] ..$ ...future.FUN: [18:40:48.930] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:48.930] - attr(*, "resolved")= logi FALSE [18:40:48.930] - attr(*, "total_size")= num NA [18:40:48.933] Packages to be attached in all futures: [n=1] 'stats' [18:40:48.933] getGlobalsAndPackagesXApply() ... DONE [18:40:48.934] Number of futures (= number of chunks): 2 [18:40:48.934] Launching 2 futures (chunks) ... [18:40:48.934] Chunk #1 of 2 ... [18:40:48.934] - Adjusted option 'future.globals.maxSize': Inf -> 2 * Inf = Inf (bytes) [18:40:48.934] - seeds: [18:40:48.935] - All globals exported: [n=5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:48.935] getGlobalsAndPackages() ... [18:40:48.935] - globals passed as-is: [5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:48.935] Resolving globals: FALSE [18:40:48.935] Tweak future expression to call with '...' arguments ... [18:40:48.935] { [18:40:48.935] do.call(function(...) { [18:40:48.935] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:48.935] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:48.935] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:48.935] on.exit(options(oopts), add = TRUE) [18:40:48.935] } [18:40:48.935] { [18:40:48.935] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:48.935] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:48.935] ...future.FUN(...future.X_jj, ...) [18:40:48.935] }) [18:40:48.935] } [18:40:48.935] }, args = future.call.arguments) [18:40:48.935] } [18:40:48.936] Tweak future expression to call with '...' arguments ... DONE [18:40:48.937] - globals: [5] 'future.call.arguments', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:48.937] - packages: [1] 'stats' [18:40:48.937] getGlobalsAndPackages() ... DONE [18:40:48.937] run() for 'Future' ... [18:40:48.938] - state: 'created' [18:40:48.938] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:40:48.953] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:40:48.953] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:40:48.953] - Field: 'node' [18:40:48.953] - Field: 'label' [18:40:48.953] - Field: 'local' [18:40:48.954] - Field: 'owner' [18:40:48.954] - Field: 'envir' [18:40:48.954] - Field: 'workers' [18:40:48.954] - Field: 'packages' [18:40:48.954] - Field: 'gc' [18:40:48.954] - Field: 'conditions' [18:40:48.955] - Field: 'persistent' [18:40:48.955] - Field: 'expr' [18:40:48.955] - Field: 'uuid' [18:40:48.955] - Field: 'seed' [18:40:48.955] - Field: 'version' [18:40:48.955] - Field: 'result' [18:40:48.956] - Field: 'asynchronous' [18:40:48.956] - Field: 'calls' [18:40:48.956] - Field: 'globals' [18:40:48.956] - Field: 'stdout' [18:40:48.956] - Field: 'earlySignal' [18:40:48.956] - Field: 'lazy' [18:40:48.957] - Field: 'state' [18:40:48.957] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:40:48.957] - Launch lazy future ... [18:40:48.957] Packages needed by the future expression (n = 1): 'stats' [18:40:48.957] Packages needed by future strategies (n = 0): [18:40:48.958] { [18:40:48.958] { [18:40:48.958] { [18:40:48.958] ...future.startTime <- base::Sys.time() [18:40:48.958] { [18:40:48.958] { [18:40:48.958] { [18:40:48.958] { [18:40:48.958] { [18:40:48.958] base::local({ [18:40:48.958] has_future <- base::requireNamespace("future", [18:40:48.958] quietly = TRUE) [18:40:48.958] if (has_future) { [18:40:48.958] ns <- base::getNamespace("future") [18:40:48.958] version <- ns[[".package"]][["version"]] [18:40:48.958] if (is.null(version)) [18:40:48.958] version <- utils::packageVersion("future") [18:40:48.958] } [18:40:48.958] else { [18:40:48.958] version <- NULL [18:40:48.958] } [18:40:48.958] if (!has_future || version < "1.8.0") { [18:40:48.958] info <- base::c(r_version = base::gsub("R version ", [18:40:48.958] "", base::R.version$version.string), [18:40:48.958] platform = base::sprintf("%s (%s-bit)", [18:40:48.958] base::R.version$platform, 8 * [18:40:48.958] base::.Machine$sizeof.pointer), [18:40:48.958] os = base::paste(base::Sys.info()[base::c("sysname", [18:40:48.958] "release", "version")], collapse = " "), [18:40:48.958] hostname = base::Sys.info()[["nodename"]]) [18:40:48.958] info <- base::sprintf("%s: %s", base::names(info), [18:40:48.958] info) [18:40:48.958] info <- base::paste(info, collapse = "; ") [18:40:48.958] if (!has_future) { [18:40:48.958] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:40:48.958] info) [18:40:48.958] } [18:40:48.958] else { [18:40:48.958] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:40:48.958] info, version) [18:40:48.958] } [18:40:48.958] base::stop(msg) [18:40:48.958] } [18:40:48.958] }) [18:40:48.958] } [18:40:48.958] ...future.mc.cores.old <- base::getOption("mc.cores") [18:40:48.958] base::options(mc.cores = 1L) [18:40:48.958] } [18:40:48.958] base::local({ [18:40:48.958] for (pkg in "stats") { [18:40:48.958] base::loadNamespace(pkg) [18:40:48.958] base::library(pkg, character.only = TRUE) [18:40:48.958] } [18:40:48.958] }) [18:40:48.958] } [18:40:48.958] ...future.strategy.old <- future::plan("list") [18:40:48.958] options(future.plan = NULL) [18:40:48.958] Sys.unsetenv("R_FUTURE_PLAN") [18:40:48.958] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:40:48.958] } [18:40:48.958] ...future.workdir <- getwd() [18:40:48.958] } [18:40:48.958] ...future.oldOptions <- base::as.list(base::.Options) [18:40:48.958] ...future.oldEnvVars <- base::Sys.getenv() [18:40:48.958] } [18:40:48.958] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:40:48.958] future.globals.maxSize = Inf, future.globals.method = NULL, [18:40:48.958] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:40:48.958] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:40:48.958] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:40:48.958] future.stdout.windows.reencode = NULL, width = 80L) [18:40:48.958] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:40:48.958] base::names(...future.oldOptions)) [18:40:48.958] } [18:40:48.958] if (FALSE) { [18:40:48.958] } [18:40:48.958] else { [18:40:48.958] if (TRUE) { [18:40:48.958] ...future.stdout <- base::rawConnection(base::raw(0L), [18:40:48.958] open = "w") [18:40:48.958] } [18:40:48.958] else { [18:40:48.958] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:40:48.958] windows = "NUL", "/dev/null"), open = "w") [18:40:48.958] } [18:40:48.958] base::sink(...future.stdout, type = "output", split = FALSE) [18:40:48.958] base::on.exit(if (!base::is.null(...future.stdout)) { [18:40:48.958] base::sink(type = "output", split = FALSE) [18:40:48.958] base::close(...future.stdout) [18:40:48.958] }, add = TRUE) [18:40:48.958] } [18:40:48.958] ...future.frame <- base::sys.nframe() [18:40:48.958] ...future.conditions <- base::list() [18:40:48.958] ...future.rng <- base::globalenv()$.Random.seed [18:40:48.958] if (FALSE) { [18:40:48.958] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:40:48.958] "...future.value", "...future.globalenv.names", ".Random.seed") [18:40:48.958] } [18:40:48.958] ...future.result <- base::tryCatch({ [18:40:48.958] base::withCallingHandlers({ [18:40:48.958] ...future.value <- base::withVisible(base::local({ [18:40:48.958] ...future.makeSendCondition <- base::local({ [18:40:48.958] sendCondition <- NULL [18:40:48.958] function(frame = 1L) { [18:40:48.958] if (is.function(sendCondition)) [18:40:48.958] return(sendCondition) [18:40:48.958] ns <- getNamespace("parallel") [18:40:48.958] if (exists("sendData", mode = "function", [18:40:48.958] envir = ns)) { [18:40:48.958] parallel_sendData <- get("sendData", mode = "function", [18:40:48.958] envir = ns) [18:40:48.958] envir <- sys.frame(frame) [18:40:48.958] master <- NULL [18:40:48.958] while (!identical(envir, .GlobalEnv) && [18:40:48.958] !identical(envir, emptyenv())) { [18:40:48.958] if (exists("master", mode = "list", envir = envir, [18:40:48.958] inherits = FALSE)) { [18:40:48.958] master <- get("master", mode = "list", [18:40:48.958] envir = envir, inherits = FALSE) [18:40:48.958] if (inherits(master, c("SOCKnode", [18:40:48.958] "SOCK0node"))) { [18:40:48.958] sendCondition <<- function(cond) { [18:40:48.958] data <- list(type = "VALUE", value = cond, [18:40:48.958] success = TRUE) [18:40:48.958] parallel_sendData(master, data) [18:40:48.958] } [18:40:48.958] return(sendCondition) [18:40:48.958] } [18:40:48.958] } [18:40:48.958] frame <- frame + 1L [18:40:48.958] envir <- sys.frame(frame) [18:40:48.958] } [18:40:48.958] } [18:40:48.958] sendCondition <<- function(cond) NULL [18:40:48.958] } [18:40:48.958] }) [18:40:48.958] withCallingHandlers({ [18:40:48.958] { [18:40:48.958] do.call(function(...) { [18:40:48.958] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:48.958] if (!identical(...future.globals.maxSize.org, [18:40:48.958] ...future.globals.maxSize)) { [18:40:48.958] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:48.958] on.exit(options(oopts), add = TRUE) [18:40:48.958] } [18:40:48.958] { [18:40:48.958] lapply(seq_along(...future.elements_ii), [18:40:48.958] FUN = function(jj) { [18:40:48.958] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:48.958] ...future.FUN(...future.X_jj, ...) [18:40:48.958] }) [18:40:48.958] } [18:40:48.958] }, args = future.call.arguments) [18:40:48.958] } [18:40:48.958] }, immediateCondition = function(cond) { [18:40:48.958] sendCondition <- ...future.makeSendCondition() [18:40:48.958] sendCondition(cond) [18:40:48.958] muffleCondition <- function (cond, pattern = "^muffle") [18:40:48.958] { [18:40:48.958] inherits <- base::inherits [18:40:48.958] invokeRestart <- base::invokeRestart [18:40:48.958] is.null <- base::is.null [18:40:48.958] muffled <- FALSE [18:40:48.958] if (inherits(cond, "message")) { [18:40:48.958] muffled <- grepl(pattern, "muffleMessage") [18:40:48.958] if (muffled) [18:40:48.958] invokeRestart("muffleMessage") [18:40:48.958] } [18:40:48.958] else if (inherits(cond, "warning")) { [18:40:48.958] muffled <- grepl(pattern, "muffleWarning") [18:40:48.958] if (muffled) [18:40:48.958] invokeRestart("muffleWarning") [18:40:48.958] } [18:40:48.958] else if (inherits(cond, "condition")) { [18:40:48.958] if (!is.null(pattern)) { [18:40:48.958] computeRestarts <- base::computeRestarts [18:40:48.958] grepl <- base::grepl [18:40:48.958] restarts <- computeRestarts(cond) [18:40:48.958] for (restart in restarts) { [18:40:48.958] name <- restart$name [18:40:48.958] if (is.null(name)) [18:40:48.958] next [18:40:48.958] if (!grepl(pattern, name)) [18:40:48.958] next [18:40:48.958] invokeRestart(restart) [18:40:48.958] muffled <- TRUE [18:40:48.958] break [18:40:48.958] } [18:40:48.958] } [18:40:48.958] } [18:40:48.958] invisible(muffled) [18:40:48.958] } [18:40:48.958] muffleCondition(cond) [18:40:48.958] }) [18:40:48.958] })) [18:40:48.958] future::FutureResult(value = ...future.value$value, [18:40:48.958] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:40:48.958] ...future.rng), globalenv = if (FALSE) [18:40:48.958] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:40:48.958] ...future.globalenv.names)) [18:40:48.958] else NULL, started = ...future.startTime, version = "1.8") [18:40:48.958] }, condition = base::local({ [18:40:48.958] c <- base::c [18:40:48.958] inherits <- base::inherits [18:40:48.958] invokeRestart <- base::invokeRestart [18:40:48.958] length <- base::length [18:40:48.958] list <- base::list [18:40:48.958] seq.int <- base::seq.int [18:40:48.958] signalCondition <- base::signalCondition [18:40:48.958] sys.calls <- base::sys.calls [18:40:48.958] `[[` <- base::`[[` [18:40:48.958] `+` <- base::`+` [18:40:48.958] `<<-` <- base::`<<-` [18:40:48.958] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:40:48.958] calls[seq.int(from = from + 12L, to = length(calls) - [18:40:48.958] 3L)] [18:40:48.958] } [18:40:48.958] function(cond) { [18:40:48.958] is_error <- inherits(cond, "error") [18:40:48.958] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:40:48.958] NULL) [18:40:48.958] if (is_error) { [18:40:48.958] sessionInformation <- function() { [18:40:48.958] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:40:48.958] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:40:48.958] search = base::search(), system = base::Sys.info()) [18:40:48.958] } [18:40:48.958] ...future.conditions[[length(...future.conditions) + [18:40:48.958] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:40:48.958] cond$call), session = sessionInformation(), [18:40:48.958] timestamp = base::Sys.time(), signaled = 0L) [18:40:48.958] signalCondition(cond) [18:40:48.958] } [18:40:48.958] else if (!ignore && TRUE && inherits(cond, c("condition", [18:40:48.958] "immediateCondition"))) { [18:40:48.958] signal <- TRUE && inherits(cond, "immediateCondition") [18:40:48.958] ...future.conditions[[length(...future.conditions) + [18:40:48.958] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:40:48.958] if (TRUE && !signal) { [18:40:48.958] muffleCondition <- function (cond, pattern = "^muffle") [18:40:48.958] { [18:40:48.958] inherits <- base::inherits [18:40:48.958] invokeRestart <- base::invokeRestart [18:40:48.958] is.null <- base::is.null [18:40:48.958] muffled <- FALSE [18:40:48.958] if (inherits(cond, "message")) { [18:40:48.958] muffled <- grepl(pattern, "muffleMessage") [18:40:48.958] if (muffled) [18:40:48.958] invokeRestart("muffleMessage") [18:40:48.958] } [18:40:48.958] else if (inherits(cond, "warning")) { [18:40:48.958] muffled <- grepl(pattern, "muffleWarning") [18:40:48.958] if (muffled) [18:40:48.958] invokeRestart("muffleWarning") [18:40:48.958] } [18:40:48.958] else if (inherits(cond, "condition")) { [18:40:48.958] if (!is.null(pattern)) { [18:40:48.958] computeRestarts <- base::computeRestarts [18:40:48.958] grepl <- base::grepl [18:40:48.958] restarts <- computeRestarts(cond) [18:40:48.958] for (restart in restarts) { [18:40:48.958] name <- restart$name [18:40:48.958] if (is.null(name)) [18:40:48.958] next [18:40:48.958] if (!grepl(pattern, name)) [18:40:48.958] next [18:40:48.958] invokeRestart(restart) [18:40:48.958] muffled <- TRUE [18:40:48.958] break [18:40:48.958] } [18:40:48.958] } [18:40:48.958] } [18:40:48.958] invisible(muffled) [18:40:48.958] } [18:40:48.958] muffleCondition(cond, pattern = "^muffle") [18:40:48.958] } [18:40:48.958] } [18:40:48.958] else { [18:40:48.958] if (TRUE) { [18:40:48.958] muffleCondition <- function (cond, pattern = "^muffle") [18:40:48.958] { [18:40:48.958] inherits <- base::inherits [18:40:48.958] invokeRestart <- base::invokeRestart [18:40:48.958] is.null <- base::is.null [18:40:48.958] muffled <- FALSE [18:40:48.958] if (inherits(cond, "message")) { [18:40:48.958] muffled <- grepl(pattern, "muffleMessage") [18:40:48.958] if (muffled) [18:40:48.958] invokeRestart("muffleMessage") [18:40:48.958] } [18:40:48.958] else if (inherits(cond, "warning")) { [18:40:48.958] muffled <- grepl(pattern, "muffleWarning") [18:40:48.958] if (muffled) [18:40:48.958] invokeRestart("muffleWarning") [18:40:48.958] } [18:40:48.958] else if (inherits(cond, "condition")) { [18:40:48.958] if (!is.null(pattern)) { [18:40:48.958] computeRestarts <- base::computeRestarts [18:40:48.958] grepl <- base::grepl [18:40:48.958] restarts <- computeRestarts(cond) [18:40:48.958] for (restart in restarts) { [18:40:48.958] name <- restart$name [18:40:48.958] if (is.null(name)) [18:40:48.958] next [18:40:48.958] if (!grepl(pattern, name)) [18:40:48.958] next [18:40:48.958] invokeRestart(restart) [18:40:48.958] muffled <- TRUE [18:40:48.958] break [18:40:48.958] } [18:40:48.958] } [18:40:48.958] } [18:40:48.958] invisible(muffled) [18:40:48.958] } [18:40:48.958] muffleCondition(cond, pattern = "^muffle") [18:40:48.958] } [18:40:48.958] } [18:40:48.958] } [18:40:48.958] })) [18:40:48.958] }, error = function(ex) { [18:40:48.958] base::structure(base::list(value = NULL, visible = NULL, [18:40:48.958] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:40:48.958] ...future.rng), started = ...future.startTime, [18:40:48.958] finished = Sys.time(), session_uuid = NA_character_, [18:40:48.958] version = "1.8"), class = "FutureResult") [18:40:48.958] }, finally = { [18:40:48.958] if (!identical(...future.workdir, getwd())) [18:40:48.958] setwd(...future.workdir) [18:40:48.958] { [18:40:48.958] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:40:48.958] ...future.oldOptions$nwarnings <- NULL [18:40:48.958] } [18:40:48.958] base::options(...future.oldOptions) [18:40:48.958] if (.Platform$OS.type == "windows") { [18:40:48.958] old_names <- names(...future.oldEnvVars) [18:40:48.958] envs <- base::Sys.getenv() [18:40:48.958] names <- names(envs) [18:40:48.958] common <- intersect(names, old_names) [18:40:48.958] added <- setdiff(names, old_names) [18:40:48.958] removed <- setdiff(old_names, names) [18:40:48.958] changed <- common[...future.oldEnvVars[common] != [18:40:48.958] envs[common]] [18:40:48.958] NAMES <- toupper(changed) [18:40:48.958] args <- list() [18:40:48.958] for (kk in seq_along(NAMES)) { [18:40:48.958] name <- changed[[kk]] [18:40:48.958] NAME <- NAMES[[kk]] [18:40:48.958] if (name != NAME && is.element(NAME, old_names)) [18:40:48.958] next [18:40:48.958] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:48.958] } [18:40:48.958] NAMES <- toupper(added) [18:40:48.958] for (kk in seq_along(NAMES)) { [18:40:48.958] name <- added[[kk]] [18:40:48.958] NAME <- NAMES[[kk]] [18:40:48.958] if (name != NAME && is.element(NAME, old_names)) [18:40:48.958] next [18:40:48.958] args[[name]] <- "" [18:40:48.958] } [18:40:48.958] NAMES <- toupper(removed) [18:40:48.958] for (kk in seq_along(NAMES)) { [18:40:48.958] name <- removed[[kk]] [18:40:48.958] NAME <- NAMES[[kk]] [18:40:48.958] if (name != NAME && is.element(NAME, old_names)) [18:40:48.958] next [18:40:48.958] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:48.958] } [18:40:48.958] if (length(args) > 0) [18:40:48.958] base::do.call(base::Sys.setenv, args = args) [18:40:48.958] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:40:48.958] } [18:40:48.958] else { [18:40:48.958] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:40:48.958] } [18:40:48.958] { [18:40:48.958] if (base::length(...future.futureOptionsAdded) > [18:40:48.958] 0L) { [18:40:48.958] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:40:48.958] base::names(opts) <- ...future.futureOptionsAdded [18:40:48.958] base::options(opts) [18:40:48.958] } [18:40:48.958] { [18:40:48.958] { [18:40:48.958] base::options(mc.cores = ...future.mc.cores.old) [18:40:48.958] NULL [18:40:48.958] } [18:40:48.958] options(future.plan = NULL) [18:40:48.958] if (is.na(NA_character_)) [18:40:48.958] Sys.unsetenv("R_FUTURE_PLAN") [18:40:48.958] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:40:48.958] future::plan(...future.strategy.old, .cleanup = FALSE, [18:40:48.958] .init = FALSE) [18:40:48.958] } [18:40:48.958] } [18:40:48.958] } [18:40:48.958] }) [18:40:48.958] if (TRUE) { [18:40:48.958] base::sink(type = "output", split = FALSE) [18:40:48.958] if (TRUE) { [18:40:48.958] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:40:48.958] } [18:40:48.958] else { [18:40:48.958] ...future.result["stdout"] <- base::list(NULL) [18:40:48.958] } [18:40:48.958] base::close(...future.stdout) [18:40:48.958] ...future.stdout <- NULL [18:40:48.958] } [18:40:48.958] ...future.result$conditions <- ...future.conditions [18:40:48.958] ...future.result$finished <- base::Sys.time() [18:40:48.958] ...future.result [18:40:48.958] } [18:40:48.963] Exporting 5 global objects (0.98 KiB) to cluster node #1 ... [18:40:48.964] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:40:48.964] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:40:48.964] Exporting '...future.FUN' (311 bytes) to cluster node #1 ... [18:40:48.965] Exporting '...future.FUN' (311 bytes) to cluster node #1 ... DONE [18:40:48.965] Exporting '...future.elements_ii' (71 bytes) to cluster node #1 ... [18:40:48.965] Exporting '...future.elements_ii' (71 bytes) to cluster node #1 ... DONE [18:40:48.965] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:40:48.966] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:40:48.966] Exporting '...future.globals.maxSize' (39 bytes) to cluster node #1 ... [18:40:48.966] Exporting '...future.globals.maxSize' (39 bytes) to cluster node #1 ... DONE [18:40:48.966] Exporting 5 global objects (0.98 KiB) to cluster node #1 ... DONE [18:40:48.967] MultisessionFuture started [18:40:48.967] - Launch lazy future ... done [18:40:48.967] run() for 'MultisessionFuture' ... done [18:40:48.968] Created future: [18:40:48.985] receiveMessageFromWorker() for ClusterFuture ... [18:40:48.985] - Validating connection of MultisessionFuture [18:40:48.985] - received message: FutureResult [18:40:48.985] - Received FutureResult [18:40:48.986] - Erased future from FutureRegistry [18:40:48.986] result() for ClusterFuture ... [18:40:48.986] - result already collected: FutureResult [18:40:48.986] result() for ClusterFuture ... done [18:40:48.986] receiveMessageFromWorker() for ClusterFuture ... done [18:40:48.968] MultisessionFuture: [18:40:48.968] Label: 'future_apply-1' [18:40:48.968] Expression: [18:40:48.968] { [18:40:48.968] do.call(function(...) { [18:40:48.968] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:48.968] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:48.968] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:48.968] on.exit(options(oopts), add = TRUE) [18:40:48.968] } [18:40:48.968] { [18:40:48.968] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:48.968] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:48.968] ...future.FUN(...future.X_jj, ...) [18:40:48.968] }) [18:40:48.968] } [18:40:48.968] }, args = future.call.arguments) [18:40:48.968] } [18:40:48.968] Lazy evaluation: FALSE [18:40:48.968] Asynchronous evaluation: TRUE [18:40:48.968] Local evaluation: TRUE [18:40:48.968] Environment: R_GlobalEnv [18:40:48.968] Capture standard output: TRUE [18:40:48.968] Capture condition classes: 'condition' (excluding 'nothing') [18:40:48.968] Globals: 5 objects totaling 545 bytes (DotDotDotList 'future.call.arguments' of 97 bytes, function '...future.FUN' of 311 bytes, list '...future.elements_ii' of 71 bytes, NULL '...future.seeds_ii' of 27 bytes, numeric '...future.globals.maxSize' of 39 bytes) [18:40:48.968] Packages: 1 packages ('stats') [18:40:48.968] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:40:48.968] Resolved: TRUE [18:40:48.968] Value: [18:40:48.968] Conditions captured: [18:40:48.968] Early signaling: FALSE [18:40:48.968] Owner process: 2171382a-9202-bc7d-80d6-248e0cb487f4 [18:40:48.968] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:40:48.987] Chunk #1 of 2 ... DONE [18:40:48.987] Chunk #2 of 2 ... [18:40:48.987] - Adjusted option 'future.globals.maxSize': Inf -> 2 * Inf = Inf (bytes) [18:40:48.987] - seeds: [18:40:48.987] - All globals exported: [n=5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:48.988] getGlobalsAndPackages() ... [18:40:48.988] - globals passed as-is: [5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:48.988] Resolving globals: FALSE [18:40:48.988] Tweak future expression to call with '...' arguments ... [18:40:48.988] { [18:40:48.988] do.call(function(...) { [18:40:48.988] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:48.988] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:48.988] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:48.988] on.exit(options(oopts), add = TRUE) [18:40:48.988] } [18:40:48.988] { [18:40:48.988] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:48.988] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:48.988] ...future.FUN(...future.X_jj, ...) [18:40:48.988] }) [18:40:48.988] } [18:40:48.988] }, args = future.call.arguments) [18:40:48.988] } [18:40:48.989] Tweak future expression to call with '...' arguments ... DONE [18:40:48.989] - globals: [5] 'future.call.arguments', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:48.989] - packages: [1] 'stats' [18:40:48.990] getGlobalsAndPackages() ... DONE [18:40:48.990] run() for 'Future' ... [18:40:48.990] - state: 'created' [18:40:48.990] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:40:49.005] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:40:49.006] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:40:49.006] - Field: 'node' [18:40:49.006] - Field: 'label' [18:40:49.006] - Field: 'local' [18:40:49.006] - Field: 'owner' [18:40:49.007] - Field: 'envir' [18:40:49.007] - Field: 'workers' [18:40:49.007] - Field: 'packages' [18:40:49.007] - Field: 'gc' [18:40:49.007] - Field: 'conditions' [18:40:49.007] - Field: 'persistent' [18:40:49.008] - Field: 'expr' [18:40:49.008] - Field: 'uuid' [18:40:49.008] - Field: 'seed' [18:40:49.008] - Field: 'version' [18:40:49.008] - Field: 'result' [18:40:49.008] - Field: 'asynchronous' [18:40:49.009] - Field: 'calls' [18:40:49.009] - Field: 'globals' [18:40:49.009] - Field: 'stdout' [18:40:49.009] - Field: 'earlySignal' [18:40:49.009] - Field: 'lazy' [18:40:49.009] - Field: 'state' [18:40:49.010] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:40:49.010] - Launch lazy future ... [18:40:49.010] Packages needed by the future expression (n = 1): 'stats' [18:40:49.010] Packages needed by future strategies (n = 0): [18:40:49.011] { [18:40:49.011] { [18:40:49.011] { [18:40:49.011] ...future.startTime <- base::Sys.time() [18:40:49.011] { [18:40:49.011] { [18:40:49.011] { [18:40:49.011] { [18:40:49.011] { [18:40:49.011] base::local({ [18:40:49.011] has_future <- base::requireNamespace("future", [18:40:49.011] quietly = TRUE) [18:40:49.011] if (has_future) { [18:40:49.011] ns <- base::getNamespace("future") [18:40:49.011] version <- ns[[".package"]][["version"]] [18:40:49.011] if (is.null(version)) [18:40:49.011] version <- utils::packageVersion("future") [18:40:49.011] } [18:40:49.011] else { [18:40:49.011] version <- NULL [18:40:49.011] } [18:40:49.011] if (!has_future || version < "1.8.0") { [18:40:49.011] info <- base::c(r_version = base::gsub("R version ", [18:40:49.011] "", base::R.version$version.string), [18:40:49.011] platform = base::sprintf("%s (%s-bit)", [18:40:49.011] base::R.version$platform, 8 * [18:40:49.011] base::.Machine$sizeof.pointer), [18:40:49.011] os = base::paste(base::Sys.info()[base::c("sysname", [18:40:49.011] "release", "version")], collapse = " "), [18:40:49.011] hostname = base::Sys.info()[["nodename"]]) [18:40:49.011] info <- base::sprintf("%s: %s", base::names(info), [18:40:49.011] info) [18:40:49.011] info <- base::paste(info, collapse = "; ") [18:40:49.011] if (!has_future) { [18:40:49.011] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:40:49.011] info) [18:40:49.011] } [18:40:49.011] else { [18:40:49.011] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:40:49.011] info, version) [18:40:49.011] } [18:40:49.011] base::stop(msg) [18:40:49.011] } [18:40:49.011] }) [18:40:49.011] } [18:40:49.011] ...future.mc.cores.old <- base::getOption("mc.cores") [18:40:49.011] base::options(mc.cores = 1L) [18:40:49.011] } [18:40:49.011] base::local({ [18:40:49.011] for (pkg in "stats") { [18:40:49.011] base::loadNamespace(pkg) [18:40:49.011] base::library(pkg, character.only = TRUE) [18:40:49.011] } [18:40:49.011] }) [18:40:49.011] } [18:40:49.011] ...future.strategy.old <- future::plan("list") [18:40:49.011] options(future.plan = NULL) [18:40:49.011] Sys.unsetenv("R_FUTURE_PLAN") [18:40:49.011] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:40:49.011] } [18:40:49.011] ...future.workdir <- getwd() [18:40:49.011] } [18:40:49.011] ...future.oldOptions <- base::as.list(base::.Options) [18:40:49.011] ...future.oldEnvVars <- base::Sys.getenv() [18:40:49.011] } [18:40:49.011] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:40:49.011] future.globals.maxSize = Inf, future.globals.method = NULL, [18:40:49.011] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:40:49.011] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:40:49.011] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:40:49.011] future.stdout.windows.reencode = NULL, width = 80L) [18:40:49.011] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:40:49.011] base::names(...future.oldOptions)) [18:40:49.011] } [18:40:49.011] if (FALSE) { [18:40:49.011] } [18:40:49.011] else { [18:40:49.011] if (TRUE) { [18:40:49.011] ...future.stdout <- base::rawConnection(base::raw(0L), [18:40:49.011] open = "w") [18:40:49.011] } [18:40:49.011] else { [18:40:49.011] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:40:49.011] windows = "NUL", "/dev/null"), open = "w") [18:40:49.011] } [18:40:49.011] base::sink(...future.stdout, type = "output", split = FALSE) [18:40:49.011] base::on.exit(if (!base::is.null(...future.stdout)) { [18:40:49.011] base::sink(type = "output", split = FALSE) [18:40:49.011] base::close(...future.stdout) [18:40:49.011] }, add = TRUE) [18:40:49.011] } [18:40:49.011] ...future.frame <- base::sys.nframe() [18:40:49.011] ...future.conditions <- base::list() [18:40:49.011] ...future.rng <- base::globalenv()$.Random.seed [18:40:49.011] if (FALSE) { [18:40:49.011] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:40:49.011] "...future.value", "...future.globalenv.names", ".Random.seed") [18:40:49.011] } [18:40:49.011] ...future.result <- base::tryCatch({ [18:40:49.011] base::withCallingHandlers({ [18:40:49.011] ...future.value <- base::withVisible(base::local({ [18:40:49.011] ...future.makeSendCondition <- base::local({ [18:40:49.011] sendCondition <- NULL [18:40:49.011] function(frame = 1L) { [18:40:49.011] if (is.function(sendCondition)) [18:40:49.011] return(sendCondition) [18:40:49.011] ns <- getNamespace("parallel") [18:40:49.011] if (exists("sendData", mode = "function", [18:40:49.011] envir = ns)) { [18:40:49.011] parallel_sendData <- get("sendData", mode = "function", [18:40:49.011] envir = ns) [18:40:49.011] envir <- sys.frame(frame) [18:40:49.011] master <- NULL [18:40:49.011] while (!identical(envir, .GlobalEnv) && [18:40:49.011] !identical(envir, emptyenv())) { [18:40:49.011] if (exists("master", mode = "list", envir = envir, [18:40:49.011] inherits = FALSE)) { [18:40:49.011] master <- get("master", mode = "list", [18:40:49.011] envir = envir, inherits = FALSE) [18:40:49.011] if (inherits(master, c("SOCKnode", [18:40:49.011] "SOCK0node"))) { [18:40:49.011] sendCondition <<- function(cond) { [18:40:49.011] data <- list(type = "VALUE", value = cond, [18:40:49.011] success = TRUE) [18:40:49.011] parallel_sendData(master, data) [18:40:49.011] } [18:40:49.011] return(sendCondition) [18:40:49.011] } [18:40:49.011] } [18:40:49.011] frame <- frame + 1L [18:40:49.011] envir <- sys.frame(frame) [18:40:49.011] } [18:40:49.011] } [18:40:49.011] sendCondition <<- function(cond) NULL [18:40:49.011] } [18:40:49.011] }) [18:40:49.011] withCallingHandlers({ [18:40:49.011] { [18:40:49.011] do.call(function(...) { [18:40:49.011] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:49.011] if (!identical(...future.globals.maxSize.org, [18:40:49.011] ...future.globals.maxSize)) { [18:40:49.011] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:49.011] on.exit(options(oopts), add = TRUE) [18:40:49.011] } [18:40:49.011] { [18:40:49.011] lapply(seq_along(...future.elements_ii), [18:40:49.011] FUN = function(jj) { [18:40:49.011] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:49.011] ...future.FUN(...future.X_jj, ...) [18:40:49.011] }) [18:40:49.011] } [18:40:49.011] }, args = future.call.arguments) [18:40:49.011] } [18:40:49.011] }, immediateCondition = function(cond) { [18:40:49.011] sendCondition <- ...future.makeSendCondition() [18:40:49.011] sendCondition(cond) [18:40:49.011] muffleCondition <- function (cond, pattern = "^muffle") [18:40:49.011] { [18:40:49.011] inherits <- base::inherits [18:40:49.011] invokeRestart <- base::invokeRestart [18:40:49.011] is.null <- base::is.null [18:40:49.011] muffled <- FALSE [18:40:49.011] if (inherits(cond, "message")) { [18:40:49.011] muffled <- grepl(pattern, "muffleMessage") [18:40:49.011] if (muffled) [18:40:49.011] invokeRestart("muffleMessage") [18:40:49.011] } [18:40:49.011] else if (inherits(cond, "warning")) { [18:40:49.011] muffled <- grepl(pattern, "muffleWarning") [18:40:49.011] if (muffled) [18:40:49.011] invokeRestart("muffleWarning") [18:40:49.011] } [18:40:49.011] else if (inherits(cond, "condition")) { [18:40:49.011] if (!is.null(pattern)) { [18:40:49.011] computeRestarts <- base::computeRestarts [18:40:49.011] grepl <- base::grepl [18:40:49.011] restarts <- computeRestarts(cond) [18:40:49.011] for (restart in restarts) { [18:40:49.011] name <- restart$name [18:40:49.011] if (is.null(name)) [18:40:49.011] next [18:40:49.011] if (!grepl(pattern, name)) [18:40:49.011] next [18:40:49.011] invokeRestart(restart) [18:40:49.011] muffled <- TRUE [18:40:49.011] break [18:40:49.011] } [18:40:49.011] } [18:40:49.011] } [18:40:49.011] invisible(muffled) [18:40:49.011] } [18:40:49.011] muffleCondition(cond) [18:40:49.011] }) [18:40:49.011] })) [18:40:49.011] future::FutureResult(value = ...future.value$value, [18:40:49.011] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:40:49.011] ...future.rng), globalenv = if (FALSE) [18:40:49.011] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:40:49.011] ...future.globalenv.names)) [18:40:49.011] else NULL, started = ...future.startTime, version = "1.8") [18:40:49.011] }, condition = base::local({ [18:40:49.011] c <- base::c [18:40:49.011] inherits <- base::inherits [18:40:49.011] invokeRestart <- base::invokeRestart [18:40:49.011] length <- base::length [18:40:49.011] list <- base::list [18:40:49.011] seq.int <- base::seq.int [18:40:49.011] signalCondition <- base::signalCondition [18:40:49.011] sys.calls <- base::sys.calls [18:40:49.011] `[[` <- base::`[[` [18:40:49.011] `+` <- base::`+` [18:40:49.011] `<<-` <- base::`<<-` [18:40:49.011] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:40:49.011] calls[seq.int(from = from + 12L, to = length(calls) - [18:40:49.011] 3L)] [18:40:49.011] } [18:40:49.011] function(cond) { [18:40:49.011] is_error <- inherits(cond, "error") [18:40:49.011] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:40:49.011] NULL) [18:40:49.011] if (is_error) { [18:40:49.011] sessionInformation <- function() { [18:40:49.011] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:40:49.011] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:40:49.011] search = base::search(), system = base::Sys.info()) [18:40:49.011] } [18:40:49.011] ...future.conditions[[length(...future.conditions) + [18:40:49.011] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:40:49.011] cond$call), session = sessionInformation(), [18:40:49.011] timestamp = base::Sys.time(), signaled = 0L) [18:40:49.011] signalCondition(cond) [18:40:49.011] } [18:40:49.011] else if (!ignore && TRUE && inherits(cond, c("condition", [18:40:49.011] "immediateCondition"))) { [18:40:49.011] signal <- TRUE && inherits(cond, "immediateCondition") [18:40:49.011] ...future.conditions[[length(...future.conditions) + [18:40:49.011] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:40:49.011] if (TRUE && !signal) { [18:40:49.011] muffleCondition <- function (cond, pattern = "^muffle") [18:40:49.011] { [18:40:49.011] inherits <- base::inherits [18:40:49.011] invokeRestart <- base::invokeRestart [18:40:49.011] is.null <- base::is.null [18:40:49.011] muffled <- FALSE [18:40:49.011] if (inherits(cond, "message")) { [18:40:49.011] muffled <- grepl(pattern, "muffleMessage") [18:40:49.011] if (muffled) [18:40:49.011] invokeRestart("muffleMessage") [18:40:49.011] } [18:40:49.011] else if (inherits(cond, "warning")) { [18:40:49.011] muffled <- grepl(pattern, "muffleWarning") [18:40:49.011] if (muffled) [18:40:49.011] invokeRestart("muffleWarning") [18:40:49.011] } [18:40:49.011] else if (inherits(cond, "condition")) { [18:40:49.011] if (!is.null(pattern)) { [18:40:49.011] computeRestarts <- base::computeRestarts [18:40:49.011] grepl <- base::grepl [18:40:49.011] restarts <- computeRestarts(cond) [18:40:49.011] for (restart in restarts) { [18:40:49.011] name <- restart$name [18:40:49.011] if (is.null(name)) [18:40:49.011] next [18:40:49.011] if (!grepl(pattern, name)) [18:40:49.011] next [18:40:49.011] invokeRestart(restart) [18:40:49.011] muffled <- TRUE [18:40:49.011] break [18:40:49.011] } [18:40:49.011] } [18:40:49.011] } [18:40:49.011] invisible(muffled) [18:40:49.011] } [18:40:49.011] muffleCondition(cond, pattern = "^muffle") [18:40:49.011] } [18:40:49.011] } [18:40:49.011] else { [18:40:49.011] if (TRUE) { [18:40:49.011] muffleCondition <- function (cond, pattern = "^muffle") [18:40:49.011] { [18:40:49.011] inherits <- base::inherits [18:40:49.011] invokeRestart <- base::invokeRestart [18:40:49.011] is.null <- base::is.null [18:40:49.011] muffled <- FALSE [18:40:49.011] if (inherits(cond, "message")) { [18:40:49.011] muffled <- grepl(pattern, "muffleMessage") [18:40:49.011] if (muffled) [18:40:49.011] invokeRestart("muffleMessage") [18:40:49.011] } [18:40:49.011] else if (inherits(cond, "warning")) { [18:40:49.011] muffled <- grepl(pattern, "muffleWarning") [18:40:49.011] if (muffled) [18:40:49.011] invokeRestart("muffleWarning") [18:40:49.011] } [18:40:49.011] else if (inherits(cond, "condition")) { [18:40:49.011] if (!is.null(pattern)) { [18:40:49.011] computeRestarts <- base::computeRestarts [18:40:49.011] grepl <- base::grepl [18:40:49.011] restarts <- computeRestarts(cond) [18:40:49.011] for (restart in restarts) { [18:40:49.011] name <- restart$name [18:40:49.011] if (is.null(name)) [18:40:49.011] next [18:40:49.011] if (!grepl(pattern, name)) [18:40:49.011] next [18:40:49.011] invokeRestart(restart) [18:40:49.011] muffled <- TRUE [18:40:49.011] break [18:40:49.011] } [18:40:49.011] } [18:40:49.011] } [18:40:49.011] invisible(muffled) [18:40:49.011] } [18:40:49.011] muffleCondition(cond, pattern = "^muffle") [18:40:49.011] } [18:40:49.011] } [18:40:49.011] } [18:40:49.011] })) [18:40:49.011] }, error = function(ex) { [18:40:49.011] base::structure(base::list(value = NULL, visible = NULL, [18:40:49.011] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:40:49.011] ...future.rng), started = ...future.startTime, [18:40:49.011] finished = Sys.time(), session_uuid = NA_character_, [18:40:49.011] version = "1.8"), class = "FutureResult") [18:40:49.011] }, finally = { [18:40:49.011] if (!identical(...future.workdir, getwd())) [18:40:49.011] setwd(...future.workdir) [18:40:49.011] { [18:40:49.011] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:40:49.011] ...future.oldOptions$nwarnings <- NULL [18:40:49.011] } [18:40:49.011] base::options(...future.oldOptions) [18:40:49.011] if (.Platform$OS.type == "windows") { [18:40:49.011] old_names <- names(...future.oldEnvVars) [18:40:49.011] envs <- base::Sys.getenv() [18:40:49.011] names <- names(envs) [18:40:49.011] common <- intersect(names, old_names) [18:40:49.011] added <- setdiff(names, old_names) [18:40:49.011] removed <- setdiff(old_names, names) [18:40:49.011] changed <- common[...future.oldEnvVars[common] != [18:40:49.011] envs[common]] [18:40:49.011] NAMES <- toupper(changed) [18:40:49.011] args <- list() [18:40:49.011] for (kk in seq_along(NAMES)) { [18:40:49.011] name <- changed[[kk]] [18:40:49.011] NAME <- NAMES[[kk]] [18:40:49.011] if (name != NAME && is.element(NAME, old_names)) [18:40:49.011] next [18:40:49.011] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:49.011] } [18:40:49.011] NAMES <- toupper(added) [18:40:49.011] for (kk in seq_along(NAMES)) { [18:40:49.011] name <- added[[kk]] [18:40:49.011] NAME <- NAMES[[kk]] [18:40:49.011] if (name != NAME && is.element(NAME, old_names)) [18:40:49.011] next [18:40:49.011] args[[name]] <- "" [18:40:49.011] } [18:40:49.011] NAMES <- toupper(removed) [18:40:49.011] for (kk in seq_along(NAMES)) { [18:40:49.011] name <- removed[[kk]] [18:40:49.011] NAME <- NAMES[[kk]] [18:40:49.011] if (name != NAME && is.element(NAME, old_names)) [18:40:49.011] next [18:40:49.011] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:49.011] } [18:40:49.011] if (length(args) > 0) [18:40:49.011] base::do.call(base::Sys.setenv, args = args) [18:40:49.011] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:40:49.011] } [18:40:49.011] else { [18:40:49.011] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:40:49.011] } [18:40:49.011] { [18:40:49.011] if (base::length(...future.futureOptionsAdded) > [18:40:49.011] 0L) { [18:40:49.011] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:40:49.011] base::names(opts) <- ...future.futureOptionsAdded [18:40:49.011] base::options(opts) [18:40:49.011] } [18:40:49.011] { [18:40:49.011] { [18:40:49.011] base::options(mc.cores = ...future.mc.cores.old) [18:40:49.011] NULL [18:40:49.011] } [18:40:49.011] options(future.plan = NULL) [18:40:49.011] if (is.na(NA_character_)) [18:40:49.011] Sys.unsetenv("R_FUTURE_PLAN") [18:40:49.011] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:40:49.011] future::plan(...future.strategy.old, .cleanup = FALSE, [18:40:49.011] .init = FALSE) [18:40:49.011] } [18:40:49.011] } [18:40:49.011] } [18:40:49.011] }) [18:40:49.011] if (TRUE) { [18:40:49.011] base::sink(type = "output", split = FALSE) [18:40:49.011] if (TRUE) { [18:40:49.011] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:40:49.011] } [18:40:49.011] else { [18:40:49.011] ...future.result["stdout"] <- base::list(NULL) [18:40:49.011] } [18:40:49.011] base::close(...future.stdout) [18:40:49.011] ...future.stdout <- NULL [18:40:49.011] } [18:40:49.011] ...future.result$conditions <- ...future.conditions [18:40:49.011] ...future.result$finished <- base::Sys.time() [18:40:49.011] ...future.result [18:40:49.011] } [18:40:49.016] Exporting 5 global objects (0.98 KiB) to cluster node #1 ... [18:40:49.016] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:40:49.017] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:40:49.017] Exporting '...future.FUN' (311 bytes) to cluster node #1 ... [18:40:49.017] Exporting '...future.FUN' (311 bytes) to cluster node #1 ... DONE [18:40:49.018] Exporting '...future.elements_ii' (71 bytes) to cluster node #1 ... [18:40:49.018] Exporting '...future.elements_ii' (71 bytes) to cluster node #1 ... DONE [18:40:49.018] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:40:49.018] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:40:49.019] Exporting '...future.globals.maxSize' (39 bytes) to cluster node #1 ... [18:40:49.019] Exporting '...future.globals.maxSize' (39 bytes) to cluster node #1 ... DONE [18:40:49.019] Exporting 5 global objects (0.98 KiB) to cluster node #1 ... DONE [18:40:49.020] MultisessionFuture started [18:40:49.020] - Launch lazy future ... done [18:40:49.020] run() for 'MultisessionFuture' ... done [18:40:49.020] Created future: [18:40:49.035] receiveMessageFromWorker() for ClusterFuture ... [18:40:49.035] - Validating connection of MultisessionFuture [18:40:49.036] - received message: FutureResult [18:40:49.036] - Received FutureResult [18:40:49.036] - Erased future from FutureRegistry [18:40:49.036] result() for ClusterFuture ... [18:40:49.036] - result already collected: FutureResult [18:40:49.037] result() for ClusterFuture ... done [18:40:49.037] receiveMessageFromWorker() for ClusterFuture ... done [18:40:49.021] MultisessionFuture: [18:40:49.021] Label: 'future_apply-2' [18:40:49.021] Expression: [18:40:49.021] { [18:40:49.021] do.call(function(...) { [18:40:49.021] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:49.021] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:49.021] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:49.021] on.exit(options(oopts), add = TRUE) [18:40:49.021] } [18:40:49.021] { [18:40:49.021] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:49.021] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:49.021] ...future.FUN(...future.X_jj, ...) [18:40:49.021] }) [18:40:49.021] } [18:40:49.021] }, args = future.call.arguments) [18:40:49.021] } [18:40:49.021] Lazy evaluation: FALSE [18:40:49.021] Asynchronous evaluation: TRUE [18:40:49.021] Local evaluation: TRUE [18:40:49.021] Environment: R_GlobalEnv [18:40:49.021] Capture standard output: TRUE [18:40:49.021] Capture condition classes: 'condition' (excluding 'nothing') [18:40:49.021] Globals: 5 objects totaling 545 bytes (DotDotDotList 'future.call.arguments' of 97 bytes, function '...future.FUN' of 311 bytes, list '...future.elements_ii' of 71 bytes, NULL '...future.seeds_ii' of 27 bytes, numeric '...future.globals.maxSize' of 39 bytes) [18:40:49.021] Packages: 1 packages ('stats') [18:40:49.021] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:40:49.021] Resolved: TRUE [18:40:49.021] Value: [18:40:49.021] Conditions captured: [18:40:49.021] Early signaling: FALSE [18:40:49.021] Owner process: 2171382a-9202-bc7d-80d6-248e0cb487f4 [18:40:49.021] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:40:49.037] Chunk #2 of 2 ... DONE [18:40:49.037] Launching 2 futures (chunks) ... DONE [18:40:49.038] Resolving 2 futures (chunks) ... [18:40:49.038] resolve() on list ... [18:40:49.038] recursive: 0 [18:40:49.038] length: 2 [18:40:49.038] [18:40:49.038] Future #1 [18:40:49.038] result() for ClusterFuture ... [18:40:49.039] - result already collected: FutureResult [18:40:49.039] result() for ClusterFuture ... done [18:40:49.039] result() for ClusterFuture ... [18:40:49.039] - result already collected: FutureResult [18:40:49.039] result() for ClusterFuture ... done [18:40:49.039] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:40:49.040] - nx: 2 [18:40:49.040] - relay: TRUE [18:40:49.040] - stdout: TRUE [18:40:49.040] - signal: TRUE [18:40:49.040] - resignal: FALSE [18:40:49.040] - force: TRUE [18:40:49.040] - relayed: [n=2] FALSE, FALSE [18:40:49.041] - queued futures: [n=2] FALSE, FALSE [18:40:49.041] - until=1 [18:40:49.041] - relaying element #1 [18:40:49.041] result() for ClusterFuture ... [18:40:49.041] - result already collected: FutureResult [18:40:49.041] result() for ClusterFuture ... done [18:40:49.042] result() for ClusterFuture ... [18:40:49.042] - result already collected: FutureResult [18:40:49.042] result() for ClusterFuture ... done [18:40:49.042] result() for ClusterFuture ... [18:40:49.042] - result already collected: FutureResult [18:40:49.042] result() for ClusterFuture ... done [18:40:49.043] result() for ClusterFuture ... [18:40:49.043] - result already collected: FutureResult [18:40:49.043] result() for ClusterFuture ... done [18:40:49.043] - relayed: [n=2] TRUE, FALSE [18:40:49.043] - queued futures: [n=2] TRUE, FALSE [18:40:49.043] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:40:49.044] length: 1 (resolved future 1) [18:40:49.044] Future #2 [18:40:49.044] result() for ClusterFuture ... [18:40:49.044] - result already collected: FutureResult [18:40:49.044] result() for ClusterFuture ... done [18:40:49.044] result() for ClusterFuture ... [18:40:49.044] - result already collected: FutureResult [18:40:49.045] result() for ClusterFuture ... done [18:40:49.045] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:40:49.045] - nx: 2 [18:40:49.045] - relay: TRUE [18:40:49.045] - stdout: TRUE [18:40:49.046] - signal: TRUE [18:40:49.046] - resignal: FALSE [18:40:49.046] - force: TRUE [18:40:49.046] - relayed: [n=2] TRUE, FALSE [18:40:49.046] - queued futures: [n=2] TRUE, FALSE [18:40:49.046] - until=2 [18:40:49.047] - relaying element #2 [18:40:49.047] result() for ClusterFuture ... [18:40:49.047] - result already collected: FutureResult [18:40:49.047] result() for ClusterFuture ... done [18:40:49.047] result() for ClusterFuture ... [18:40:49.047] - result already collected: FutureResult [18:40:49.047] result() for ClusterFuture ... done [18:40:49.048] result() for ClusterFuture ... [18:40:49.048] - result already collected: FutureResult [18:40:49.048] result() for ClusterFuture ... done [18:40:49.048] result() for ClusterFuture ... [18:40:49.048] - result already collected: FutureResult [18:40:49.048] result() for ClusterFuture ... done [18:40:49.049] - relayed: [n=2] TRUE, TRUE [18:40:49.049] - queued futures: [n=2] TRUE, TRUE [18:40:49.049] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:40:49.049] length: 0 (resolved future 2) [18:40:49.049] Relaying remaining futures [18:40:49.050] signalConditionsASAP(NULL, pos=0) ... [18:40:49.050] - nx: 2 [18:40:49.050] - relay: TRUE [18:40:49.050] - stdout: TRUE [18:40:49.050] - signal: TRUE [18:40:49.050] - resignal: FALSE [18:40:49.051] - force: TRUE [18:40:49.051] - relayed: [n=2] TRUE, TRUE [18:40:49.051] - queued futures: [n=2] TRUE, TRUE - flush all [18:40:49.051] - relayed: [n=2] TRUE, TRUE [18:40:49.051] - queued futures: [n=2] TRUE, TRUE [18:40:49.051] signalConditionsASAP(NULL, pos=0) ... done [18:40:49.052] resolve() on list ... DONE [18:40:49.052] result() for ClusterFuture ... [18:40:49.052] - result already collected: FutureResult [18:40:49.052] result() for ClusterFuture ... done [18:40:49.052] result() for ClusterFuture ... [18:40:49.052] - result already collected: FutureResult [18:40:49.053] result() for ClusterFuture ... done [18:40:49.053] result() for ClusterFuture ... [18:40:49.053] - result already collected: FutureResult [18:40:49.053] result() for ClusterFuture ... done [18:40:49.053] result() for ClusterFuture ... [18:40:49.053] - result already collected: FutureResult [18:40:49.053] result() for ClusterFuture ... done [18:40:49.054] - Number of value chunks collected: 2 [18:40:49.054] Resolving 2 futures (chunks) ... DONE [18:40:49.054] Reducing values from 2 chunks ... [18:40:49.054] - Number of values collected after concatenation: 2 [18:40:49.054] - Number of values expected: 2 [18:40:49.054] Reducing values from 2 chunks ... DONE [18:40:49.055] future_lapply() ... DONE [,1] [,2] 0% 1 2.0 25% 1 3.5 50% 2 5.0 75% 4 6.5 100% 7 8.0 [18:40:49.055] getGlobalsAndPackagesXApply() ... [18:40:49.055] - future.globals: TRUE [18:40:49.056] getGlobalsAndPackages() ... [18:40:49.056] Searching for globals... [18:40:49.057] - globals found: [1] 'FUN' [18:40:49.057] Searching for globals ... DONE [18:40:49.057] Resolving globals: FALSE [18:40:49.058] The total size of the 1 globals is 185 bytes (185 bytes) [18:40:49.058] The total size of the 1 globals exported for future expression ('FUN(X = structure(c(3, 3, 3, 3, 3, 3, 3, 3, 4, 3, 2, 1, 2, 3,; 4, 5), dim = c(8L, 2L), dimnames = list(row = NULL, col = c("x1",; "x2"))))') 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:40:49.059] - globals: [1] 'FUN' [18:40:49.059] [18:40:49.059] getGlobalsAndPackages() ... DONE [18:40:49.059] - globals found/used: [n=1] 'FUN' [18:40:49.059] - needed namespaces: [n=0] [18:40:49.059] Finding globals ... DONE [18:40:49.060] - use_args: TRUE [18:40:49.060] - Getting '...' globals ... [18:40:49.060] resolve() on list ... [18:40:49.060] recursive: 0 [18:40:49.061] length: 1 [18:40:49.061] elements: '...' [18:40:49.061] length: 0 (resolved future 1) [18:40:49.061] resolve() on list ... DONE [18:40:49.061] - '...' content: [n=0] [18:40:49.061] List of 1 [18:40:49.061] $ ...: list() [18:40:49.061] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:49.061] - attr(*, "where")=List of 1 [18:40:49.061] ..$ ...: [18:40:49.061] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:49.061] - attr(*, "resolved")= logi TRUE [18:40:49.061] - attr(*, "total_size")= num NA [18:40:49.066] - Getting '...' globals ... DONE [18:40:49.067] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:40:49.067] List of 2 [18:40:49.067] $ ...future.FUN:function (x) [18:40:49.067] $ ... : list() [18:40:49.067] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:49.067] - attr(*, "where")=List of 2 [18:40:49.067] ..$ ...future.FUN: [18:40:49.067] ..$ ... : [18:40:49.067] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:49.067] - attr(*, "resolved")= logi FALSE [18:40:49.067] - attr(*, "total_size")= int 2624 [18:40:49.070] Packages to be attached in all futures: [n=0] [18:40:49.071] getGlobalsAndPackagesXApply() ... DONE [18:40:49.073] future_lapply() ... [18:40:49.076] Number of chunks: 2 [18:40:49.076] getGlobalsAndPackagesXApply() ... [18:40:49.076] - future.globals: with names 'list()' [18:40:49.076] - use_args: TRUE [18:40:49.076] Globals to be used in all futures (chunks): [n=2] '...', '...future.FUN' [18:40:49.077] List of 2 [18:40:49.077] $ ... : list() [18:40:49.077] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:49.077] $ ...future.FUN:function (x) [18:40:49.077] - attr(*, "where")=List of 2 [18:40:49.077] ..$ ... : [18:40:49.077] ..$ ...future.FUN: [18:40:49.077] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:49.077] - attr(*, "resolved")= logi FALSE [18:40:49.077] - attr(*, "total_size")= num NA [18:40:49.081] Packages to be attached in all futures: [n=0] [18:40:49.081] getGlobalsAndPackagesXApply() ... DONE [18:40:49.081] Number of futures (= number of chunks): 2 [18:40:49.081] Launching 2 futures (chunks) ... [18:40:49.081] Chunk #1 of 2 ... [18:40:49.082] - Adjusted option 'future.globals.maxSize': Inf -> 2 * Inf = Inf (bytes) [18:40:49.082] - seeds: [18:40:49.082] - All globals exported: [n=5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:49.082] getGlobalsAndPackages() ... [18:40:49.082] - globals passed as-is: [5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:49.082] Resolving globals: FALSE [18:40:49.083] Tweak future expression to call with '...' arguments ... [18:40:49.083] { [18:40:49.083] do.call(function(...) { [18:40:49.083] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:49.083] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:49.083] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:49.083] on.exit(options(oopts), add = TRUE) [18:40:49.083] } [18:40:49.083] { [18:40:49.083] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:49.083] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:49.083] ...future.FUN(...future.X_jj, ...) [18:40:49.083] }) [18:40:49.083] } [18:40:49.083] }, args = future.call.arguments) [18:40:49.083] } [18:40:49.083] Tweak future expression to call with '...' arguments ... DONE [18:40:49.084] - globals: [5] 'future.call.arguments', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:49.084] [18:40:49.084] getGlobalsAndPackages() ... DONE [18:40:49.084] run() for 'Future' ... [18:40:49.085] - state: 'created' [18:40:49.085] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:40:49.100] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:40:49.100] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:40:49.100] - Field: 'node' [18:40:49.101] - Field: 'label' [18:40:49.101] - Field: 'local' [18:40:49.101] - Field: 'owner' [18:40:49.101] - Field: 'envir' [18:40:49.101] - Field: 'workers' [18:40:49.101] - Field: 'packages' [18:40:49.102] - Field: 'gc' [18:40:49.102] - Field: 'conditions' [18:40:49.102] - Field: 'persistent' [18:40:49.102] - Field: 'expr' [18:40:49.102] - Field: 'uuid' [18:40:49.102] - Field: 'seed' [18:40:49.103] - Field: 'version' [18:40:49.103] - Field: 'result' [18:40:49.103] - Field: 'asynchronous' [18:40:49.103] - Field: 'calls' [18:40:49.103] - Field: 'globals' [18:40:49.103] - Field: 'stdout' [18:40:49.104] - Field: 'earlySignal' [18:40:49.104] - Field: 'lazy' [18:40:49.104] - Field: 'state' [18:40:49.104] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:40:49.104] - Launch lazy future ... [18:40:49.105] Packages needed by the future expression (n = 0): [18:40:49.105] Packages needed by future strategies (n = 0): [18:40:49.105] { [18:40:49.105] { [18:40:49.105] { [18:40:49.105] ...future.startTime <- base::Sys.time() [18:40:49.105] { [18:40:49.105] { [18:40:49.105] { [18:40:49.105] { [18:40:49.105] base::local({ [18:40:49.105] has_future <- base::requireNamespace("future", [18:40:49.105] quietly = TRUE) [18:40:49.105] if (has_future) { [18:40:49.105] ns <- base::getNamespace("future") [18:40:49.105] version <- ns[[".package"]][["version"]] [18:40:49.105] if (is.null(version)) [18:40:49.105] version <- utils::packageVersion("future") [18:40:49.105] } [18:40:49.105] else { [18:40:49.105] version <- NULL [18:40:49.105] } [18:40:49.105] if (!has_future || version < "1.8.0") { [18:40:49.105] info <- base::c(r_version = base::gsub("R version ", [18:40:49.105] "", base::R.version$version.string), [18:40:49.105] platform = base::sprintf("%s (%s-bit)", [18:40:49.105] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:40:49.105] os = base::paste(base::Sys.info()[base::c("sysname", [18:40:49.105] "release", "version")], collapse = " "), [18:40:49.105] hostname = base::Sys.info()[["nodename"]]) [18:40:49.105] info <- base::sprintf("%s: %s", base::names(info), [18:40:49.105] info) [18:40:49.105] info <- base::paste(info, collapse = "; ") [18:40:49.105] if (!has_future) { [18:40:49.105] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:40:49.105] info) [18:40:49.105] } [18:40:49.105] else { [18:40:49.105] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:40:49.105] info, version) [18:40:49.105] } [18:40:49.105] base::stop(msg) [18:40:49.105] } [18:40:49.105] }) [18:40:49.105] } [18:40:49.105] ...future.mc.cores.old <- base::getOption("mc.cores") [18:40:49.105] base::options(mc.cores = 1L) [18:40:49.105] } [18:40:49.105] ...future.strategy.old <- future::plan("list") [18:40:49.105] options(future.plan = NULL) [18:40:49.105] Sys.unsetenv("R_FUTURE_PLAN") [18:40:49.105] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:40:49.105] } [18:40:49.105] ...future.workdir <- getwd() [18:40:49.105] } [18:40:49.105] ...future.oldOptions <- base::as.list(base::.Options) [18:40:49.105] ...future.oldEnvVars <- base::Sys.getenv() [18:40:49.105] } [18:40:49.105] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:40:49.105] future.globals.maxSize = Inf, future.globals.method = NULL, [18:40:49.105] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:40:49.105] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:40:49.105] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:40:49.105] future.stdout.windows.reencode = NULL, width = 80L) [18:40:49.105] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:40:49.105] base::names(...future.oldOptions)) [18:40:49.105] } [18:40:49.105] if (FALSE) { [18:40:49.105] } [18:40:49.105] else { [18:40:49.105] if (TRUE) { [18:40:49.105] ...future.stdout <- base::rawConnection(base::raw(0L), [18:40:49.105] open = "w") [18:40:49.105] } [18:40:49.105] else { [18:40:49.105] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:40:49.105] windows = "NUL", "/dev/null"), open = "w") [18:40:49.105] } [18:40:49.105] base::sink(...future.stdout, type = "output", split = FALSE) [18:40:49.105] base::on.exit(if (!base::is.null(...future.stdout)) { [18:40:49.105] base::sink(type = "output", split = FALSE) [18:40:49.105] base::close(...future.stdout) [18:40:49.105] }, add = TRUE) [18:40:49.105] } [18:40:49.105] ...future.frame <- base::sys.nframe() [18:40:49.105] ...future.conditions <- base::list() [18:40:49.105] ...future.rng <- base::globalenv()$.Random.seed [18:40:49.105] if (FALSE) { [18:40:49.105] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:40:49.105] "...future.value", "...future.globalenv.names", ".Random.seed") [18:40:49.105] } [18:40:49.105] ...future.result <- base::tryCatch({ [18:40:49.105] base::withCallingHandlers({ [18:40:49.105] ...future.value <- base::withVisible(base::local({ [18:40:49.105] ...future.makeSendCondition <- base::local({ [18:40:49.105] sendCondition <- NULL [18:40:49.105] function(frame = 1L) { [18:40:49.105] if (is.function(sendCondition)) [18:40:49.105] return(sendCondition) [18:40:49.105] ns <- getNamespace("parallel") [18:40:49.105] if (exists("sendData", mode = "function", [18:40:49.105] envir = ns)) { [18:40:49.105] parallel_sendData <- get("sendData", mode = "function", [18:40:49.105] envir = ns) [18:40:49.105] envir <- sys.frame(frame) [18:40:49.105] master <- NULL [18:40:49.105] while (!identical(envir, .GlobalEnv) && [18:40:49.105] !identical(envir, emptyenv())) { [18:40:49.105] if (exists("master", mode = "list", envir = envir, [18:40:49.105] inherits = FALSE)) { [18:40:49.105] master <- get("master", mode = "list", [18:40:49.105] envir = envir, inherits = FALSE) [18:40:49.105] if (inherits(master, c("SOCKnode", [18:40:49.105] "SOCK0node"))) { [18:40:49.105] sendCondition <<- function(cond) { [18:40:49.105] data <- list(type = "VALUE", value = cond, [18:40:49.105] success = TRUE) [18:40:49.105] parallel_sendData(master, data) [18:40:49.105] } [18:40:49.105] return(sendCondition) [18:40:49.105] } [18:40:49.105] } [18:40:49.105] frame <- frame + 1L [18:40:49.105] envir <- sys.frame(frame) [18:40:49.105] } [18:40:49.105] } [18:40:49.105] sendCondition <<- function(cond) NULL [18:40:49.105] } [18:40:49.105] }) [18:40:49.105] withCallingHandlers({ [18:40:49.105] { [18:40:49.105] do.call(function(...) { [18:40:49.105] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:49.105] if (!identical(...future.globals.maxSize.org, [18:40:49.105] ...future.globals.maxSize)) { [18:40:49.105] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:49.105] on.exit(options(oopts), add = TRUE) [18:40:49.105] } [18:40:49.105] { [18:40:49.105] lapply(seq_along(...future.elements_ii), [18:40:49.105] FUN = function(jj) { [18:40:49.105] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:49.105] ...future.FUN(...future.X_jj, ...) [18:40:49.105] }) [18:40:49.105] } [18:40:49.105] }, args = future.call.arguments) [18:40:49.105] } [18:40:49.105] }, immediateCondition = function(cond) { [18:40:49.105] sendCondition <- ...future.makeSendCondition() [18:40:49.105] sendCondition(cond) [18:40:49.105] muffleCondition <- function (cond, pattern = "^muffle") [18:40:49.105] { [18:40:49.105] inherits <- base::inherits [18:40:49.105] invokeRestart <- base::invokeRestart [18:40:49.105] is.null <- base::is.null [18:40:49.105] muffled <- FALSE [18:40:49.105] if (inherits(cond, "message")) { [18:40:49.105] muffled <- grepl(pattern, "muffleMessage") [18:40:49.105] if (muffled) [18:40:49.105] invokeRestart("muffleMessage") [18:40:49.105] } [18:40:49.105] else if (inherits(cond, "warning")) { [18:40:49.105] muffled <- grepl(pattern, "muffleWarning") [18:40:49.105] if (muffled) [18:40:49.105] invokeRestart("muffleWarning") [18:40:49.105] } [18:40:49.105] else if (inherits(cond, "condition")) { [18:40:49.105] if (!is.null(pattern)) { [18:40:49.105] computeRestarts <- base::computeRestarts [18:40:49.105] grepl <- base::grepl [18:40:49.105] restarts <- computeRestarts(cond) [18:40:49.105] for (restart in restarts) { [18:40:49.105] name <- restart$name [18:40:49.105] if (is.null(name)) [18:40:49.105] next [18:40:49.105] if (!grepl(pattern, name)) [18:40:49.105] next [18:40:49.105] invokeRestart(restart) [18:40:49.105] muffled <- TRUE [18:40:49.105] break [18:40:49.105] } [18:40:49.105] } [18:40:49.105] } [18:40:49.105] invisible(muffled) [18:40:49.105] } [18:40:49.105] muffleCondition(cond) [18:40:49.105] }) [18:40:49.105] })) [18:40:49.105] future::FutureResult(value = ...future.value$value, [18:40:49.105] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:40:49.105] ...future.rng), globalenv = if (FALSE) [18:40:49.105] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:40:49.105] ...future.globalenv.names)) [18:40:49.105] else NULL, started = ...future.startTime, version = "1.8") [18:40:49.105] }, condition = base::local({ [18:40:49.105] c <- base::c [18:40:49.105] inherits <- base::inherits [18:40:49.105] invokeRestart <- base::invokeRestart [18:40:49.105] length <- base::length [18:40:49.105] list <- base::list [18:40:49.105] seq.int <- base::seq.int [18:40:49.105] signalCondition <- base::signalCondition [18:40:49.105] sys.calls <- base::sys.calls [18:40:49.105] `[[` <- base::`[[` [18:40:49.105] `+` <- base::`+` [18:40:49.105] `<<-` <- base::`<<-` [18:40:49.105] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:40:49.105] calls[seq.int(from = from + 12L, to = length(calls) - [18:40:49.105] 3L)] [18:40:49.105] } [18:40:49.105] function(cond) { [18:40:49.105] is_error <- inherits(cond, "error") [18:40:49.105] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:40:49.105] NULL) [18:40:49.105] if (is_error) { [18:40:49.105] sessionInformation <- function() { [18:40:49.105] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:40:49.105] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:40:49.105] search = base::search(), system = base::Sys.info()) [18:40:49.105] } [18:40:49.105] ...future.conditions[[length(...future.conditions) + [18:40:49.105] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:40:49.105] cond$call), session = sessionInformation(), [18:40:49.105] timestamp = base::Sys.time(), signaled = 0L) [18:40:49.105] signalCondition(cond) [18:40:49.105] } [18:40:49.105] else if (!ignore && TRUE && inherits(cond, c("condition", [18:40:49.105] "immediateCondition"))) { [18:40:49.105] signal <- TRUE && inherits(cond, "immediateCondition") [18:40:49.105] ...future.conditions[[length(...future.conditions) + [18:40:49.105] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:40:49.105] if (TRUE && !signal) { [18:40:49.105] muffleCondition <- function (cond, pattern = "^muffle") [18:40:49.105] { [18:40:49.105] inherits <- base::inherits [18:40:49.105] invokeRestart <- base::invokeRestart [18:40:49.105] is.null <- base::is.null [18:40:49.105] muffled <- FALSE [18:40:49.105] if (inherits(cond, "message")) { [18:40:49.105] muffled <- grepl(pattern, "muffleMessage") [18:40:49.105] if (muffled) [18:40:49.105] invokeRestart("muffleMessage") [18:40:49.105] } [18:40:49.105] else if (inherits(cond, "warning")) { [18:40:49.105] muffled <- grepl(pattern, "muffleWarning") [18:40:49.105] if (muffled) [18:40:49.105] invokeRestart("muffleWarning") [18:40:49.105] } [18:40:49.105] else if (inherits(cond, "condition")) { [18:40:49.105] if (!is.null(pattern)) { [18:40:49.105] computeRestarts <- base::computeRestarts [18:40:49.105] grepl <- base::grepl [18:40:49.105] restarts <- computeRestarts(cond) [18:40:49.105] for (restart in restarts) { [18:40:49.105] name <- restart$name [18:40:49.105] if (is.null(name)) [18:40:49.105] next [18:40:49.105] if (!grepl(pattern, name)) [18:40:49.105] next [18:40:49.105] invokeRestart(restart) [18:40:49.105] muffled <- TRUE [18:40:49.105] break [18:40:49.105] } [18:40:49.105] } [18:40:49.105] } [18:40:49.105] invisible(muffled) [18:40:49.105] } [18:40:49.105] muffleCondition(cond, pattern = "^muffle") [18:40:49.105] } [18:40:49.105] } [18:40:49.105] else { [18:40:49.105] if (TRUE) { [18:40:49.105] muffleCondition <- function (cond, pattern = "^muffle") [18:40:49.105] { [18:40:49.105] inherits <- base::inherits [18:40:49.105] invokeRestart <- base::invokeRestart [18:40:49.105] is.null <- base::is.null [18:40:49.105] muffled <- FALSE [18:40:49.105] if (inherits(cond, "message")) { [18:40:49.105] muffled <- grepl(pattern, "muffleMessage") [18:40:49.105] if (muffled) [18:40:49.105] invokeRestart("muffleMessage") [18:40:49.105] } [18:40:49.105] else if (inherits(cond, "warning")) { [18:40:49.105] muffled <- grepl(pattern, "muffleWarning") [18:40:49.105] if (muffled) [18:40:49.105] invokeRestart("muffleWarning") [18:40:49.105] } [18:40:49.105] else if (inherits(cond, "condition")) { [18:40:49.105] if (!is.null(pattern)) { [18:40:49.105] computeRestarts <- base::computeRestarts [18:40:49.105] grepl <- base::grepl [18:40:49.105] restarts <- computeRestarts(cond) [18:40:49.105] for (restart in restarts) { [18:40:49.105] name <- restart$name [18:40:49.105] if (is.null(name)) [18:40:49.105] next [18:40:49.105] if (!grepl(pattern, name)) [18:40:49.105] next [18:40:49.105] invokeRestart(restart) [18:40:49.105] muffled <- TRUE [18:40:49.105] break [18:40:49.105] } [18:40:49.105] } [18:40:49.105] } [18:40:49.105] invisible(muffled) [18:40:49.105] } [18:40:49.105] muffleCondition(cond, pattern = "^muffle") [18:40:49.105] } [18:40:49.105] } [18:40:49.105] } [18:40:49.105] })) [18:40:49.105] }, error = function(ex) { [18:40:49.105] base::structure(base::list(value = NULL, visible = NULL, [18:40:49.105] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:40:49.105] ...future.rng), started = ...future.startTime, [18:40:49.105] finished = Sys.time(), session_uuid = NA_character_, [18:40:49.105] version = "1.8"), class = "FutureResult") [18:40:49.105] }, finally = { [18:40:49.105] if (!identical(...future.workdir, getwd())) [18:40:49.105] setwd(...future.workdir) [18:40:49.105] { [18:40:49.105] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:40:49.105] ...future.oldOptions$nwarnings <- NULL [18:40:49.105] } [18:40:49.105] base::options(...future.oldOptions) [18:40:49.105] if (.Platform$OS.type == "windows") { [18:40:49.105] old_names <- names(...future.oldEnvVars) [18:40:49.105] envs <- base::Sys.getenv() [18:40:49.105] names <- names(envs) [18:40:49.105] common <- intersect(names, old_names) [18:40:49.105] added <- setdiff(names, old_names) [18:40:49.105] removed <- setdiff(old_names, names) [18:40:49.105] changed <- common[...future.oldEnvVars[common] != [18:40:49.105] envs[common]] [18:40:49.105] NAMES <- toupper(changed) [18:40:49.105] args <- list() [18:40:49.105] for (kk in seq_along(NAMES)) { [18:40:49.105] name <- changed[[kk]] [18:40:49.105] NAME <- NAMES[[kk]] [18:40:49.105] if (name != NAME && is.element(NAME, old_names)) [18:40:49.105] next [18:40:49.105] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:49.105] } [18:40:49.105] NAMES <- toupper(added) [18:40:49.105] for (kk in seq_along(NAMES)) { [18:40:49.105] name <- added[[kk]] [18:40:49.105] NAME <- NAMES[[kk]] [18:40:49.105] if (name != NAME && is.element(NAME, old_names)) [18:40:49.105] next [18:40:49.105] args[[name]] <- "" [18:40:49.105] } [18:40:49.105] NAMES <- toupper(removed) [18:40:49.105] for (kk in seq_along(NAMES)) { [18:40:49.105] name <- removed[[kk]] [18:40:49.105] NAME <- NAMES[[kk]] [18:40:49.105] if (name != NAME && is.element(NAME, old_names)) [18:40:49.105] next [18:40:49.105] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:49.105] } [18:40:49.105] if (length(args) > 0) [18:40:49.105] base::do.call(base::Sys.setenv, args = args) [18:40:49.105] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:40:49.105] } [18:40:49.105] else { [18:40:49.105] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:40:49.105] } [18:40:49.105] { [18:40:49.105] if (base::length(...future.futureOptionsAdded) > [18:40:49.105] 0L) { [18:40:49.105] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:40:49.105] base::names(opts) <- ...future.futureOptionsAdded [18:40:49.105] base::options(opts) [18:40:49.105] } [18:40:49.105] { [18:40:49.105] { [18:40:49.105] base::options(mc.cores = ...future.mc.cores.old) [18:40:49.105] NULL [18:40:49.105] } [18:40:49.105] options(future.plan = NULL) [18:40:49.105] if (is.na(NA_character_)) [18:40:49.105] Sys.unsetenv("R_FUTURE_PLAN") [18:40:49.105] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:40:49.105] future::plan(...future.strategy.old, .cleanup = FALSE, [18:40:49.105] .init = FALSE) [18:40:49.105] } [18:40:49.105] } [18:40:49.105] } [18:40:49.105] }) [18:40:49.105] if (TRUE) { [18:40:49.105] base::sink(type = "output", split = FALSE) [18:40:49.105] if (TRUE) { [18:40:49.105] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:40:49.105] } [18:40:49.105] else { [18:40:49.105] ...future.result["stdout"] <- base::list(NULL) [18:40:49.105] } [18:40:49.105] base::close(...future.stdout) [18:40:49.105] ...future.stdout <- NULL [18:40:49.105] } [18:40:49.105] ...future.result$conditions <- ...future.conditions [18:40:49.105] ...future.result$finished <- base::Sys.time() [18:40:49.105] ...future.result [18:40:49.105] } [18:40:49.110] Exporting 5 global objects (914 bytes) to cluster node #1 ... [18:40:49.111] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:40:49.111] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:40:49.111] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:40:49.112] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:40:49.112] Exporting '...future.elements_ii' (103 bytes) to cluster node #1 ... [18:40:49.112] Exporting '...future.elements_ii' (103 bytes) to cluster node #1 ... DONE [18:40:49.112] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:40:49.113] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:40:49.113] Exporting '...future.globals.maxSize' (39 bytes) to cluster node #1 ... [18:40:49.113] Exporting '...future.globals.maxSize' (39 bytes) to cluster node #1 ... DONE [18:40:49.113] Exporting 5 global objects (914 bytes) to cluster node #1 ... DONE [18:40:49.114] MultisessionFuture started [18:40:49.114] - Launch lazy future ... done [18:40:49.114] run() for 'MultisessionFuture' ... done [18:40:49.114] Created future: [18:40:49.128] receiveMessageFromWorker() for ClusterFuture ... [18:40:49.128] - Validating connection of MultisessionFuture [18:40:49.128] - received message: FutureResult [18:40:49.128] - Received FutureResult [18:40:49.129] - Erased future from FutureRegistry [18:40:49.129] result() for ClusterFuture ... [18:40:49.129] - result already collected: FutureResult [18:40:49.129] result() for ClusterFuture ... done [18:40:49.129] receiveMessageFromWorker() for ClusterFuture ... done [18:40:49.115] MultisessionFuture: [18:40:49.115] Label: 'future_apply-1' [18:40:49.115] Expression: [18:40:49.115] { [18:40:49.115] do.call(function(...) { [18:40:49.115] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:49.115] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:49.115] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:49.115] on.exit(options(oopts), add = TRUE) [18:40:49.115] } [18:40:49.115] { [18:40:49.115] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:49.115] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:49.115] ...future.FUN(...future.X_jj, ...) [18:40:49.115] }) [18:40:49.115] } [18:40:49.115] }, args = future.call.arguments) [18:40:49.115] } [18:40:49.115] Lazy evaluation: FALSE [18:40:49.115] Asynchronous evaluation: TRUE [18:40:49.115] Local evaluation: TRUE [18:40:49.115] Environment: R_GlobalEnv [18:40:49.115] Capture standard output: TRUE [18:40:49.115] Capture condition classes: 'condition' (excluding 'nothing') [18:40:49.115] Globals: 5 objects totaling 451 bytes (DotDotDotList 'future.call.arguments' of 97 bytes, function '...future.FUN' of 185 bytes, list '...future.elements_ii' of 103 bytes, NULL '...future.seeds_ii' of 27 bytes, numeric '...future.globals.maxSize' of 39 bytes) [18:40:49.115] Packages: [18:40:49.115] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:40:49.115] Resolved: TRUE [18:40:49.115] Value: [18:40:49.115] Conditions captured: [18:40:49.115] Early signaling: FALSE [18:40:49.115] Owner process: 2171382a-9202-bc7d-80d6-248e0cb487f4 [18:40:49.115] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:40:49.130] Chunk #1 of 2 ... DONE [18:40:49.130] Chunk #2 of 2 ... [18:40:49.130] - Adjusted option 'future.globals.maxSize': Inf -> 2 * Inf = Inf (bytes) [18:40:49.130] - seeds: [18:40:49.130] - All globals exported: [n=5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:49.130] getGlobalsAndPackages() ... [18:40:49.131] - globals passed as-is: [5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:49.131] Resolving globals: FALSE [18:40:49.131] Tweak future expression to call with '...' arguments ... [18:40:49.131] { [18:40:49.131] do.call(function(...) { [18:40:49.131] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:49.131] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:49.131] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:49.131] on.exit(options(oopts), add = TRUE) [18:40:49.131] } [18:40:49.131] { [18:40:49.131] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:49.131] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:49.131] ...future.FUN(...future.X_jj, ...) [18:40:49.131] }) [18:40:49.131] } [18:40:49.131] }, args = future.call.arguments) [18:40:49.131] } [18:40:49.132] Tweak future expression to call with '...' arguments ... DONE [18:40:49.132] - globals: [5] 'future.call.arguments', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:49.132] [18:40:49.132] getGlobalsAndPackages() ... DONE [18:40:49.133] run() for 'Future' ... [18:40:49.133] - state: 'created' [18:40:49.133] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:40:49.148] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:40:49.149] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:40:49.149] - Field: 'node' [18:40:49.149] - Field: 'label' [18:40:49.149] - Field: 'local' [18:40:49.149] - Field: 'owner' [18:40:49.149] - Field: 'envir' [18:40:49.150] - Field: 'workers' [18:40:49.150] - Field: 'packages' [18:40:49.150] - Field: 'gc' [18:40:49.150] - Field: 'conditions' [18:40:49.150] - Field: 'persistent' [18:40:49.150] - Field: 'expr' [18:40:49.151] - Field: 'uuid' [18:40:49.151] - Field: 'seed' [18:40:49.151] - Field: 'version' [18:40:49.151] - Field: 'result' [18:40:49.151] - Field: 'asynchronous' [18:40:49.151] - Field: 'calls' [18:40:49.152] - Field: 'globals' [18:40:49.152] - Field: 'stdout' [18:40:49.152] - Field: 'earlySignal' [18:40:49.152] - Field: 'lazy' [18:40:49.152] - Field: 'state' [18:40:49.152] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:40:49.153] - Launch lazy future ... [18:40:49.153] Packages needed by the future expression (n = 0): [18:40:49.153] Packages needed by future strategies (n = 0): [18:40:49.154] { [18:40:49.154] { [18:40:49.154] { [18:40:49.154] ...future.startTime <- base::Sys.time() [18:40:49.154] { [18:40:49.154] { [18:40:49.154] { [18:40:49.154] { [18:40:49.154] base::local({ [18:40:49.154] has_future <- base::requireNamespace("future", [18:40:49.154] quietly = TRUE) [18:40:49.154] if (has_future) { [18:40:49.154] ns <- base::getNamespace("future") [18:40:49.154] version <- ns[[".package"]][["version"]] [18:40:49.154] if (is.null(version)) [18:40:49.154] version <- utils::packageVersion("future") [18:40:49.154] } [18:40:49.154] else { [18:40:49.154] version <- NULL [18:40:49.154] } [18:40:49.154] if (!has_future || version < "1.8.0") { [18:40:49.154] info <- base::c(r_version = base::gsub("R version ", [18:40:49.154] "", base::R.version$version.string), [18:40:49.154] platform = base::sprintf("%s (%s-bit)", [18:40:49.154] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:40:49.154] os = base::paste(base::Sys.info()[base::c("sysname", [18:40:49.154] "release", "version")], collapse = " "), [18:40:49.154] hostname = base::Sys.info()[["nodename"]]) [18:40:49.154] info <- base::sprintf("%s: %s", base::names(info), [18:40:49.154] info) [18:40:49.154] info <- base::paste(info, collapse = "; ") [18:40:49.154] if (!has_future) { [18:40:49.154] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:40:49.154] info) [18:40:49.154] } [18:40:49.154] else { [18:40:49.154] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:40:49.154] info, version) [18:40:49.154] } [18:40:49.154] base::stop(msg) [18:40:49.154] } [18:40:49.154] }) [18:40:49.154] } [18:40:49.154] ...future.mc.cores.old <- base::getOption("mc.cores") [18:40:49.154] base::options(mc.cores = 1L) [18:40:49.154] } [18:40:49.154] ...future.strategy.old <- future::plan("list") [18:40:49.154] options(future.plan = NULL) [18:40:49.154] Sys.unsetenv("R_FUTURE_PLAN") [18:40:49.154] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:40:49.154] } [18:40:49.154] ...future.workdir <- getwd() [18:40:49.154] } [18:40:49.154] ...future.oldOptions <- base::as.list(base::.Options) [18:40:49.154] ...future.oldEnvVars <- base::Sys.getenv() [18:40:49.154] } [18:40:49.154] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:40:49.154] future.globals.maxSize = Inf, future.globals.method = NULL, [18:40:49.154] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:40:49.154] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:40:49.154] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:40:49.154] future.stdout.windows.reencode = NULL, width = 80L) [18:40:49.154] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:40:49.154] base::names(...future.oldOptions)) [18:40:49.154] } [18:40:49.154] if (FALSE) { [18:40:49.154] } [18:40:49.154] else { [18:40:49.154] if (TRUE) { [18:40:49.154] ...future.stdout <- base::rawConnection(base::raw(0L), [18:40:49.154] open = "w") [18:40:49.154] } [18:40:49.154] else { [18:40:49.154] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:40:49.154] windows = "NUL", "/dev/null"), open = "w") [18:40:49.154] } [18:40:49.154] base::sink(...future.stdout, type = "output", split = FALSE) [18:40:49.154] base::on.exit(if (!base::is.null(...future.stdout)) { [18:40:49.154] base::sink(type = "output", split = FALSE) [18:40:49.154] base::close(...future.stdout) [18:40:49.154] }, add = TRUE) [18:40:49.154] } [18:40:49.154] ...future.frame <- base::sys.nframe() [18:40:49.154] ...future.conditions <- base::list() [18:40:49.154] ...future.rng <- base::globalenv()$.Random.seed [18:40:49.154] if (FALSE) { [18:40:49.154] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:40:49.154] "...future.value", "...future.globalenv.names", ".Random.seed") [18:40:49.154] } [18:40:49.154] ...future.result <- base::tryCatch({ [18:40:49.154] base::withCallingHandlers({ [18:40:49.154] ...future.value <- base::withVisible(base::local({ [18:40:49.154] ...future.makeSendCondition <- base::local({ [18:40:49.154] sendCondition <- NULL [18:40:49.154] function(frame = 1L) { [18:40:49.154] if (is.function(sendCondition)) [18:40:49.154] return(sendCondition) [18:40:49.154] ns <- getNamespace("parallel") [18:40:49.154] if (exists("sendData", mode = "function", [18:40:49.154] envir = ns)) { [18:40:49.154] parallel_sendData <- get("sendData", mode = "function", [18:40:49.154] envir = ns) [18:40:49.154] envir <- sys.frame(frame) [18:40:49.154] master <- NULL [18:40:49.154] while (!identical(envir, .GlobalEnv) && [18:40:49.154] !identical(envir, emptyenv())) { [18:40:49.154] if (exists("master", mode = "list", envir = envir, [18:40:49.154] inherits = FALSE)) { [18:40:49.154] master <- get("master", mode = "list", [18:40:49.154] envir = envir, inherits = FALSE) [18:40:49.154] if (inherits(master, c("SOCKnode", [18:40:49.154] "SOCK0node"))) { [18:40:49.154] sendCondition <<- function(cond) { [18:40:49.154] data <- list(type = "VALUE", value = cond, [18:40:49.154] success = TRUE) [18:40:49.154] parallel_sendData(master, data) [18:40:49.154] } [18:40:49.154] return(sendCondition) [18:40:49.154] } [18:40:49.154] } [18:40:49.154] frame <- frame + 1L [18:40:49.154] envir <- sys.frame(frame) [18:40:49.154] } [18:40:49.154] } [18:40:49.154] sendCondition <<- function(cond) NULL [18:40:49.154] } [18:40:49.154] }) [18:40:49.154] withCallingHandlers({ [18:40:49.154] { [18:40:49.154] do.call(function(...) { [18:40:49.154] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:49.154] if (!identical(...future.globals.maxSize.org, [18:40:49.154] ...future.globals.maxSize)) { [18:40:49.154] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:49.154] on.exit(options(oopts), add = TRUE) [18:40:49.154] } [18:40:49.154] { [18:40:49.154] lapply(seq_along(...future.elements_ii), [18:40:49.154] FUN = function(jj) { [18:40:49.154] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:49.154] ...future.FUN(...future.X_jj, ...) [18:40:49.154] }) [18:40:49.154] } [18:40:49.154] }, args = future.call.arguments) [18:40:49.154] } [18:40:49.154] }, immediateCondition = function(cond) { [18:40:49.154] sendCondition <- ...future.makeSendCondition() [18:40:49.154] sendCondition(cond) [18:40:49.154] muffleCondition <- function (cond, pattern = "^muffle") [18:40:49.154] { [18:40:49.154] inherits <- base::inherits [18:40:49.154] invokeRestart <- base::invokeRestart [18:40:49.154] is.null <- base::is.null [18:40:49.154] muffled <- FALSE [18:40:49.154] if (inherits(cond, "message")) { [18:40:49.154] muffled <- grepl(pattern, "muffleMessage") [18:40:49.154] if (muffled) [18:40:49.154] invokeRestart("muffleMessage") [18:40:49.154] } [18:40:49.154] else if (inherits(cond, "warning")) { [18:40:49.154] muffled <- grepl(pattern, "muffleWarning") [18:40:49.154] if (muffled) [18:40:49.154] invokeRestart("muffleWarning") [18:40:49.154] } [18:40:49.154] else if (inherits(cond, "condition")) { [18:40:49.154] if (!is.null(pattern)) { [18:40:49.154] computeRestarts <- base::computeRestarts [18:40:49.154] grepl <- base::grepl [18:40:49.154] restarts <- computeRestarts(cond) [18:40:49.154] for (restart in restarts) { [18:40:49.154] name <- restart$name [18:40:49.154] if (is.null(name)) [18:40:49.154] next [18:40:49.154] if (!grepl(pattern, name)) [18:40:49.154] next [18:40:49.154] invokeRestart(restart) [18:40:49.154] muffled <- TRUE [18:40:49.154] break [18:40:49.154] } [18:40:49.154] } [18:40:49.154] } [18:40:49.154] invisible(muffled) [18:40:49.154] } [18:40:49.154] muffleCondition(cond) [18:40:49.154] }) [18:40:49.154] })) [18:40:49.154] future::FutureResult(value = ...future.value$value, [18:40:49.154] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:40:49.154] ...future.rng), globalenv = if (FALSE) [18:40:49.154] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:40:49.154] ...future.globalenv.names)) [18:40:49.154] else NULL, started = ...future.startTime, version = "1.8") [18:40:49.154] }, condition = base::local({ [18:40:49.154] c <- base::c [18:40:49.154] inherits <- base::inherits [18:40:49.154] invokeRestart <- base::invokeRestart [18:40:49.154] length <- base::length [18:40:49.154] list <- base::list [18:40:49.154] seq.int <- base::seq.int [18:40:49.154] signalCondition <- base::signalCondition [18:40:49.154] sys.calls <- base::sys.calls [18:40:49.154] `[[` <- base::`[[` [18:40:49.154] `+` <- base::`+` [18:40:49.154] `<<-` <- base::`<<-` [18:40:49.154] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:40:49.154] calls[seq.int(from = from + 12L, to = length(calls) - [18:40:49.154] 3L)] [18:40:49.154] } [18:40:49.154] function(cond) { [18:40:49.154] is_error <- inherits(cond, "error") [18:40:49.154] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:40:49.154] NULL) [18:40:49.154] if (is_error) { [18:40:49.154] sessionInformation <- function() { [18:40:49.154] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:40:49.154] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:40:49.154] search = base::search(), system = base::Sys.info()) [18:40:49.154] } [18:40:49.154] ...future.conditions[[length(...future.conditions) + [18:40:49.154] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:40:49.154] cond$call), session = sessionInformation(), [18:40:49.154] timestamp = base::Sys.time(), signaled = 0L) [18:40:49.154] signalCondition(cond) [18:40:49.154] } [18:40:49.154] else if (!ignore && TRUE && inherits(cond, c("condition", [18:40:49.154] "immediateCondition"))) { [18:40:49.154] signal <- TRUE && inherits(cond, "immediateCondition") [18:40:49.154] ...future.conditions[[length(...future.conditions) + [18:40:49.154] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:40:49.154] if (TRUE && !signal) { [18:40:49.154] muffleCondition <- function (cond, pattern = "^muffle") [18:40:49.154] { [18:40:49.154] inherits <- base::inherits [18:40:49.154] invokeRestart <- base::invokeRestart [18:40:49.154] is.null <- base::is.null [18:40:49.154] muffled <- FALSE [18:40:49.154] if (inherits(cond, "message")) { [18:40:49.154] muffled <- grepl(pattern, "muffleMessage") [18:40:49.154] if (muffled) [18:40:49.154] invokeRestart("muffleMessage") [18:40:49.154] } [18:40:49.154] else if (inherits(cond, "warning")) { [18:40:49.154] muffled <- grepl(pattern, "muffleWarning") [18:40:49.154] if (muffled) [18:40:49.154] invokeRestart("muffleWarning") [18:40:49.154] } [18:40:49.154] else if (inherits(cond, "condition")) { [18:40:49.154] if (!is.null(pattern)) { [18:40:49.154] computeRestarts <- base::computeRestarts [18:40:49.154] grepl <- base::grepl [18:40:49.154] restarts <- computeRestarts(cond) [18:40:49.154] for (restart in restarts) { [18:40:49.154] name <- restart$name [18:40:49.154] if (is.null(name)) [18:40:49.154] next [18:40:49.154] if (!grepl(pattern, name)) [18:40:49.154] next [18:40:49.154] invokeRestart(restart) [18:40:49.154] muffled <- TRUE [18:40:49.154] break [18:40:49.154] } [18:40:49.154] } [18:40:49.154] } [18:40:49.154] invisible(muffled) [18:40:49.154] } [18:40:49.154] muffleCondition(cond, pattern = "^muffle") [18:40:49.154] } [18:40:49.154] } [18:40:49.154] else { [18:40:49.154] if (TRUE) { [18:40:49.154] muffleCondition <- function (cond, pattern = "^muffle") [18:40:49.154] { [18:40:49.154] inherits <- base::inherits [18:40:49.154] invokeRestart <- base::invokeRestart [18:40:49.154] is.null <- base::is.null [18:40:49.154] muffled <- FALSE [18:40:49.154] if (inherits(cond, "message")) { [18:40:49.154] muffled <- grepl(pattern, "muffleMessage") [18:40:49.154] if (muffled) [18:40:49.154] invokeRestart("muffleMessage") [18:40:49.154] } [18:40:49.154] else if (inherits(cond, "warning")) { [18:40:49.154] muffled <- grepl(pattern, "muffleWarning") [18:40:49.154] if (muffled) [18:40:49.154] invokeRestart("muffleWarning") [18:40:49.154] } [18:40:49.154] else if (inherits(cond, "condition")) { [18:40:49.154] if (!is.null(pattern)) { [18:40:49.154] computeRestarts <- base::computeRestarts [18:40:49.154] grepl <- base::grepl [18:40:49.154] restarts <- computeRestarts(cond) [18:40:49.154] for (restart in restarts) { [18:40:49.154] name <- restart$name [18:40:49.154] if (is.null(name)) [18:40:49.154] next [18:40:49.154] if (!grepl(pattern, name)) [18:40:49.154] next [18:40:49.154] invokeRestart(restart) [18:40:49.154] muffled <- TRUE [18:40:49.154] break [18:40:49.154] } [18:40:49.154] } [18:40:49.154] } [18:40:49.154] invisible(muffled) [18:40:49.154] } [18:40:49.154] muffleCondition(cond, pattern = "^muffle") [18:40:49.154] } [18:40:49.154] } [18:40:49.154] } [18:40:49.154] })) [18:40:49.154] }, error = function(ex) { [18:40:49.154] base::structure(base::list(value = NULL, visible = NULL, [18:40:49.154] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:40:49.154] ...future.rng), started = ...future.startTime, [18:40:49.154] finished = Sys.time(), session_uuid = NA_character_, [18:40:49.154] version = "1.8"), class = "FutureResult") [18:40:49.154] }, finally = { [18:40:49.154] if (!identical(...future.workdir, getwd())) [18:40:49.154] setwd(...future.workdir) [18:40:49.154] { [18:40:49.154] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:40:49.154] ...future.oldOptions$nwarnings <- NULL [18:40:49.154] } [18:40:49.154] base::options(...future.oldOptions) [18:40:49.154] if (.Platform$OS.type == "windows") { [18:40:49.154] old_names <- names(...future.oldEnvVars) [18:40:49.154] envs <- base::Sys.getenv() [18:40:49.154] names <- names(envs) [18:40:49.154] common <- intersect(names, old_names) [18:40:49.154] added <- setdiff(names, old_names) [18:40:49.154] removed <- setdiff(old_names, names) [18:40:49.154] changed <- common[...future.oldEnvVars[common] != [18:40:49.154] envs[common]] [18:40:49.154] NAMES <- toupper(changed) [18:40:49.154] args <- list() [18:40:49.154] for (kk in seq_along(NAMES)) { [18:40:49.154] name <- changed[[kk]] [18:40:49.154] NAME <- NAMES[[kk]] [18:40:49.154] if (name != NAME && is.element(NAME, old_names)) [18:40:49.154] next [18:40:49.154] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:49.154] } [18:40:49.154] NAMES <- toupper(added) [18:40:49.154] for (kk in seq_along(NAMES)) { [18:40:49.154] name <- added[[kk]] [18:40:49.154] NAME <- NAMES[[kk]] [18:40:49.154] if (name != NAME && is.element(NAME, old_names)) [18:40:49.154] next [18:40:49.154] args[[name]] <- "" [18:40:49.154] } [18:40:49.154] NAMES <- toupper(removed) [18:40:49.154] for (kk in seq_along(NAMES)) { [18:40:49.154] name <- removed[[kk]] [18:40:49.154] NAME <- NAMES[[kk]] [18:40:49.154] if (name != NAME && is.element(NAME, old_names)) [18:40:49.154] next [18:40:49.154] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:49.154] } [18:40:49.154] if (length(args) > 0) [18:40:49.154] base::do.call(base::Sys.setenv, args = args) [18:40:49.154] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:40:49.154] } [18:40:49.154] else { [18:40:49.154] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:40:49.154] } [18:40:49.154] { [18:40:49.154] if (base::length(...future.futureOptionsAdded) > [18:40:49.154] 0L) { [18:40:49.154] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:40:49.154] base::names(opts) <- ...future.futureOptionsAdded [18:40:49.154] base::options(opts) [18:40:49.154] } [18:40:49.154] { [18:40:49.154] { [18:40:49.154] base::options(mc.cores = ...future.mc.cores.old) [18:40:49.154] NULL [18:40:49.154] } [18:40:49.154] options(future.plan = NULL) [18:40:49.154] if (is.na(NA_character_)) [18:40:49.154] Sys.unsetenv("R_FUTURE_PLAN") [18:40:49.154] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:40:49.154] future::plan(...future.strategy.old, .cleanup = FALSE, [18:40:49.154] .init = FALSE) [18:40:49.154] } [18:40:49.154] } [18:40:49.154] } [18:40:49.154] }) [18:40:49.154] if (TRUE) { [18:40:49.154] base::sink(type = "output", split = FALSE) [18:40:49.154] if (TRUE) { [18:40:49.154] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:40:49.154] } [18:40:49.154] else { [18:40:49.154] ...future.result["stdout"] <- base::list(NULL) [18:40:49.154] } [18:40:49.154] base::close(...future.stdout) [18:40:49.154] ...future.stdout <- NULL [18:40:49.154] } [18:40:49.154] ...future.result$conditions <- ...future.conditions [18:40:49.154] ...future.result$finished <- base::Sys.time() [18:40:49.154] ...future.result [18:40:49.154] } [18:40:49.159] Exporting 5 global objects (914 bytes) to cluster node #1 ... [18:40:49.159] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:40:49.159] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:40:49.160] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:40:49.160] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:40:49.160] Exporting '...future.elements_ii' (103 bytes) to cluster node #1 ... [18:40:49.160] Exporting '...future.elements_ii' (103 bytes) to cluster node #1 ... DONE [18:40:49.161] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:40:49.161] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:40:49.161] Exporting '...future.globals.maxSize' (39 bytes) to cluster node #1 ... [18:40:49.162] Exporting '...future.globals.maxSize' (39 bytes) to cluster node #1 ... DONE [18:40:49.162] Exporting 5 global objects (914 bytes) to cluster node #1 ... DONE [18:40:49.162] MultisessionFuture started [18:40:49.162] - Launch lazy future ... done [18:40:49.163] run() for 'MultisessionFuture' ... done [18:40:49.163] Created future: [18:40:49.178] receiveMessageFromWorker() for ClusterFuture ... [18:40:49.178] - Validating connection of MultisessionFuture [18:40:49.178] - received message: FutureResult [18:40:49.179] - Received FutureResult [18:40:49.179] - Erased future from FutureRegistry [18:40:49.179] result() for ClusterFuture ... [18:40:49.179] - result already collected: FutureResult [18:40:49.179] result() for ClusterFuture ... done [18:40:49.179] receiveMessageFromWorker() for ClusterFuture ... done [18:40:49.163] MultisessionFuture: [18:40:49.163] Label: 'future_apply-2' [18:40:49.163] Expression: [18:40:49.163] { [18:40:49.163] do.call(function(...) { [18:40:49.163] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:49.163] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:49.163] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:49.163] on.exit(options(oopts), add = TRUE) [18:40:49.163] } [18:40:49.163] { [18:40:49.163] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:49.163] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:49.163] ...future.FUN(...future.X_jj, ...) [18:40:49.163] }) [18:40:49.163] } [18:40:49.163] }, args = future.call.arguments) [18:40:49.163] } [18:40:49.163] Lazy evaluation: FALSE [18:40:49.163] Asynchronous evaluation: TRUE [18:40:49.163] Local evaluation: TRUE [18:40:49.163] Environment: R_GlobalEnv [18:40:49.163] Capture standard output: TRUE [18:40:49.163] Capture condition classes: 'condition' (excluding 'nothing') [18:40:49.163] Globals: 5 objects totaling 451 bytes (DotDotDotList 'future.call.arguments' of 97 bytes, function '...future.FUN' of 185 bytes, list '...future.elements_ii' of 103 bytes, NULL '...future.seeds_ii' of 27 bytes, numeric '...future.globals.maxSize' of 39 bytes) [18:40:49.163] Packages: [18:40:49.163] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:40:49.163] Resolved: TRUE [18:40:49.163] Value: [18:40:49.163] Conditions captured: [18:40:49.163] Early signaling: FALSE [18:40:49.163] Owner process: 2171382a-9202-bc7d-80d6-248e0cb487f4 [18:40:49.163] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:40:49.180] Chunk #2 of 2 ... DONE [18:40:49.180] Launching 2 futures (chunks) ... DONE [18:40:49.180] Resolving 2 futures (chunks) ... [18:40:49.180] resolve() on list ... [18:40:49.180] recursive: 0 [18:40:49.181] length: 2 [18:40:49.181] [18:40:49.181] Future #1 [18:40:49.181] result() for ClusterFuture ... [18:40:49.181] - result already collected: FutureResult [18:40:49.181] result() for ClusterFuture ... done [18:40:49.182] result() for ClusterFuture ... [18:40:49.182] - result already collected: FutureResult [18:40:49.182] result() for ClusterFuture ... done [18:40:49.182] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:40:49.182] - nx: 2 [18:40:49.182] - relay: TRUE [18:40:49.183] - stdout: TRUE [18:40:49.183] - signal: TRUE [18:40:49.183] - resignal: FALSE [18:40:49.183] - force: TRUE [18:40:49.183] - relayed: [n=2] FALSE, FALSE [18:40:49.183] - queued futures: [n=2] FALSE, FALSE [18:40:49.183] - until=1 [18:40:49.184] - relaying element #1 [18:40:49.184] result() for ClusterFuture ... [18:40:49.184] - result already collected: FutureResult [18:40:49.184] result() for ClusterFuture ... done [18:40:49.184] result() for ClusterFuture ... [18:40:49.184] - result already collected: FutureResult [18:40:49.185] result() for ClusterFuture ... done [18:40:49.185] result() for ClusterFuture ... [18:40:49.185] - result already collected: FutureResult [18:40:49.185] result() for ClusterFuture ... done [18:40:49.185] result() for ClusterFuture ... [18:40:49.185] - result already collected: FutureResult [18:40:49.186] result() for ClusterFuture ... done [18:40:49.186] - relayed: [n=2] TRUE, FALSE [18:40:49.186] - queued futures: [n=2] TRUE, FALSE [18:40:49.186] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:40:49.186] length: 1 (resolved future 1) [18:40:49.187] Future #2 [18:40:49.187] result() for ClusterFuture ... [18:40:49.187] - result already collected: FutureResult [18:40:49.187] result() for ClusterFuture ... done [18:40:49.187] result() for ClusterFuture ... [18:40:49.187] - result already collected: FutureResult [18:40:49.188] result() for ClusterFuture ... done [18:40:49.188] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:40:49.188] - nx: 2 [18:40:49.188] - relay: TRUE [18:40:49.188] - stdout: TRUE [18:40:49.188] - signal: TRUE [18:40:49.188] - resignal: FALSE [18:40:49.189] - force: TRUE [18:40:49.189] - relayed: [n=2] TRUE, FALSE [18:40:49.189] - queued futures: [n=2] TRUE, FALSE [18:40:49.189] - until=2 [18:40:49.189] - relaying element #2 [18:40:49.189] result() for ClusterFuture ... [18:40:49.190] - result already collected: FutureResult [18:40:49.190] result() for ClusterFuture ... done [18:40:49.190] result() for ClusterFuture ... [18:40:49.190] - result already collected: FutureResult [18:40:49.190] result() for ClusterFuture ... done [18:40:49.190] result() for ClusterFuture ... [18:40:49.191] - result already collected: FutureResult [18:40:49.191] result() for ClusterFuture ... done [18:40:49.191] result() for ClusterFuture ... [18:40:49.191] - result already collected: FutureResult [18:40:49.191] result() for ClusterFuture ... done [18:40:49.191] - relayed: [n=2] TRUE, TRUE [18:40:49.191] - queued futures: [n=2] TRUE, TRUE [18:40:49.192] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:40:49.192] length: 0 (resolved future 2) [18:40:49.192] Relaying remaining futures [18:40:49.192] signalConditionsASAP(NULL, pos=0) ... [18:40:49.192] - nx: 2 [18:40:49.192] - relay: TRUE [18:40:49.193] - stdout: TRUE [18:40:49.193] - signal: TRUE [18:40:49.193] - resignal: FALSE [18:40:49.193] - force: TRUE [18:40:49.193] - relayed: [n=2] TRUE, TRUE [18:40:49.193] - queued futures: [n=2] TRUE, TRUE - flush all [18:40:49.193] - relayed: [n=2] TRUE, TRUE [18:40:49.194] - queued futures: [n=2] TRUE, TRUE [18:40:49.194] signalConditionsASAP(NULL, pos=0) ... done [18:40:49.194] resolve() on list ... DONE [18:40:49.194] result() for ClusterFuture ... [18:40:49.194] - result already collected: FutureResult [18:40:49.194] result() for ClusterFuture ... done [18:40:49.195] result() for ClusterFuture ... [18:40:49.195] - result already collected: FutureResult [18:40:49.195] result() for ClusterFuture ... done [18:40:49.195] result() for ClusterFuture ... [18:40:49.195] - result already collected: FutureResult [18:40:49.195] result() for ClusterFuture ... done [18:40:49.196] result() for ClusterFuture ... [18:40:49.196] - result already collected: FutureResult [18:40:49.196] result() for ClusterFuture ... done [18:40:49.196] - Number of value chunks collected: 2 [18:40:49.196] Resolving 2 futures (chunks) ... DONE [18:40:49.196] Reducing values from 2 chunks ... [18:40:49.196] - Number of values collected after concatenation: 2 [18:40:49.197] - Number of values expected: 2 [18:40:49.197] Reducing values from 2 chunks ... DONE [18:40:49.197] future_lapply() ... DONE col row x1 x2 [1,] 3 4 [2,] 3 3 [3,] 3 2 [4,] 3 1 [5,] 3 2 [6,] 3 3 [7,] 3 4 [8,] 3 5 [18:40:49.197] getGlobalsAndPackagesXApply() ... [18:40:49.197] - future.globals: TRUE [18:40:49.198] getGlobalsAndPackages() ... [18:40:49.198] Searching for globals... [18:40:49.199] - globals found: [1] 'FUN' [18:40:49.199] Searching for globals ... DONE [18:40:49.199] Resolving globals: FALSE [18:40:49.200] The total size of the 1 globals is 185 bytes (185 bytes) [18:40:49.200] The total size of the 1 globals exported for future expression ('FUN(X = structure(c(3, 3, 3, 3, 3, 3, 3, 3, 4, 3, 2, 1, 2, 3,; 4, 5, 3, 3, 3, 3, 3, 3, 3, 3, 4, 3, 2, 1, 2, 3, 4, 5, 3, 3, 3,; 3, 3, 3, 3, 3, 4, 3, 2, 1, 2, 3, 4, 5), dim = c(8L, 2L, 3L), dimnames = list(; row = NULL, col = c("x1", "x2"), C = c("cop.1", "cop.2",; "cop.3"))))') 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:40:49.201] - globals: [1] 'FUN' [18:40:49.201] [18:40:49.201] getGlobalsAndPackages() ... DONE [18:40:49.201] - globals found/used: [n=1] 'FUN' [18:40:49.201] - needed namespaces: [n=0] [18:40:49.201] Finding globals ... DONE [18:40:49.202] - use_args: TRUE [18:40:49.202] - Getting '...' globals ... [18:40:49.202] resolve() on list ... [18:40:49.202] recursive: 0 [18:40:49.202] length: 1 [18:40:49.203] elements: '...' [18:40:49.203] length: 0 (resolved future 1) [18:40:49.203] resolve() on list ... DONE [18:40:49.203] - '...' content: [n=0] [18:40:49.203] List of 1 [18:40:49.203] $ ...: list() [18:40:49.203] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:49.203] - attr(*, "where")=List of 1 [18:40:49.203] ..$ ...: [18:40:49.203] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:49.203] - attr(*, "resolved")= logi TRUE [18:40:49.203] - attr(*, "total_size")= num NA [18:40:49.206] - Getting '...' globals ... DONE [18:40:49.206] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:40:49.207] List of 2 [18:40:49.207] $ ...future.FUN:function (x) [18:40:49.207] $ ... : list() [18:40:49.207] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:49.207] - attr(*, "where")=List of 2 [18:40:49.207] ..$ ...future.FUN: [18:40:49.207] ..$ ... : [18:40:49.207] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:49.207] - attr(*, "resolved")= logi FALSE [18:40:49.207] - attr(*, "total_size")= int 3563 [18:40:49.210] Packages to be attached in all futures: [n=0] [18:40:49.210] getGlobalsAndPackagesXApply() ... DONE [18:40:49.212] future_lapply() ... [18:40:49.215] Number of chunks: 2 [18:40:49.215] getGlobalsAndPackagesXApply() ... [18:40:49.215] - future.globals: with names 'list()' [18:40:49.216] - use_args: TRUE [18:40:49.216] Globals to be used in all futures (chunks): [n=2] '...', '...future.FUN' [18:40:49.216] List of 2 [18:40:49.216] $ ... : list() [18:40:49.216] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:49.216] $ ...future.FUN:function (x) [18:40:49.216] - attr(*, "where")=List of 2 [18:40:49.216] ..$ ... : [18:40:49.216] ..$ ...future.FUN: [18:40:49.216] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:49.216] - attr(*, "resolved")= logi FALSE [18:40:49.216] - attr(*, "total_size")= num NA [18:40:49.220] Packages to be attached in all futures: [n=0] [18:40:49.220] getGlobalsAndPackagesXApply() ... DONE [18:40:49.221] Number of futures (= number of chunks): 2 [18:40:49.221] Launching 2 futures (chunks) ... [18:40:49.221] Chunk #1 of 2 ... [18:40:49.221] - Adjusted option 'future.globals.maxSize': Inf -> 2 * Inf = Inf (bytes) [18:40:49.221] - seeds: [18:40:49.222] - All globals exported: [n=5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:49.222] getGlobalsAndPackages() ... [18:40:49.222] - globals passed as-is: [5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:49.222] Resolving globals: FALSE [18:40:49.222] Tweak future expression to call with '...' arguments ... [18:40:49.222] { [18:40:49.222] do.call(function(...) { [18:40:49.222] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:49.222] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:49.222] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:49.222] on.exit(options(oopts), add = TRUE) [18:40:49.222] } [18:40:49.222] { [18:40:49.222] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:49.222] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:49.222] ...future.FUN(...future.X_jj, ...) [18:40:49.222] }) [18:40:49.222] } [18:40:49.222] }, args = future.call.arguments) [18:40:49.222] } [18:40:49.223] Tweak future expression to call with '...' arguments ... DONE [18:40:49.223] - globals: [5] 'future.call.arguments', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:49.224] [18:40:49.224] getGlobalsAndPackages() ... DONE [18:40:49.224] run() for 'Future' ... [18:40:49.224] - state: 'created' [18:40:49.225] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:40:49.241] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:40:49.241] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:40:49.241] - Field: 'node' [18:40:49.242] - Field: 'label' [18:40:49.242] - Field: 'local' [18:40:49.242] - Field: 'owner' [18:40:49.242] - Field: 'envir' [18:40:49.242] - Field: 'workers' [18:40:49.242] - Field: 'packages' [18:40:49.243] - Field: 'gc' [18:40:49.243] - Field: 'conditions' [18:40:49.243] - Field: 'persistent' [18:40:49.243] - Field: 'expr' [18:40:49.243] - Field: 'uuid' [18:40:49.243] - Field: 'seed' [18:40:49.244] - Field: 'version' [18:40:49.244] - Field: 'result' [18:40:49.244] - Field: 'asynchronous' [18:40:49.244] - Field: 'calls' [18:40:49.244] - Field: 'globals' [18:40:49.244] - Field: 'stdout' [18:40:49.245] - Field: 'earlySignal' [18:40:49.245] - Field: 'lazy' [18:40:49.245] - Field: 'state' [18:40:49.245] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:40:49.245] - Launch lazy future ... [18:40:49.246] Packages needed by the future expression (n = 0): [18:40:49.246] Packages needed by future strategies (n = 0): [18:40:49.246] { [18:40:49.246] { [18:40:49.246] { [18:40:49.246] ...future.startTime <- base::Sys.time() [18:40:49.246] { [18:40:49.246] { [18:40:49.246] { [18:40:49.246] { [18:40:49.246] base::local({ [18:40:49.246] has_future <- base::requireNamespace("future", [18:40:49.246] quietly = TRUE) [18:40:49.246] if (has_future) { [18:40:49.246] ns <- base::getNamespace("future") [18:40:49.246] version <- ns[[".package"]][["version"]] [18:40:49.246] if (is.null(version)) [18:40:49.246] version <- utils::packageVersion("future") [18:40:49.246] } [18:40:49.246] else { [18:40:49.246] version <- NULL [18:40:49.246] } [18:40:49.246] if (!has_future || version < "1.8.0") { [18:40:49.246] info <- base::c(r_version = base::gsub("R version ", [18:40:49.246] "", base::R.version$version.string), [18:40:49.246] platform = base::sprintf("%s (%s-bit)", [18:40:49.246] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:40:49.246] os = base::paste(base::Sys.info()[base::c("sysname", [18:40:49.246] "release", "version")], collapse = " "), [18:40:49.246] hostname = base::Sys.info()[["nodename"]]) [18:40:49.246] info <- base::sprintf("%s: %s", base::names(info), [18:40:49.246] info) [18:40:49.246] info <- base::paste(info, collapse = "; ") [18:40:49.246] if (!has_future) { [18:40:49.246] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:40:49.246] info) [18:40:49.246] } [18:40:49.246] else { [18:40:49.246] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:40:49.246] info, version) [18:40:49.246] } [18:40:49.246] base::stop(msg) [18:40:49.246] } [18:40:49.246] }) [18:40:49.246] } [18:40:49.246] ...future.mc.cores.old <- base::getOption("mc.cores") [18:40:49.246] base::options(mc.cores = 1L) [18:40:49.246] } [18:40:49.246] ...future.strategy.old <- future::plan("list") [18:40:49.246] options(future.plan = NULL) [18:40:49.246] Sys.unsetenv("R_FUTURE_PLAN") [18:40:49.246] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:40:49.246] } [18:40:49.246] ...future.workdir <- getwd() [18:40:49.246] } [18:40:49.246] ...future.oldOptions <- base::as.list(base::.Options) [18:40:49.246] ...future.oldEnvVars <- base::Sys.getenv() [18:40:49.246] } [18:40:49.246] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:40:49.246] future.globals.maxSize = Inf, future.globals.method = NULL, [18:40:49.246] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:40:49.246] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:40:49.246] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:40:49.246] future.stdout.windows.reencode = NULL, width = 80L) [18:40:49.246] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:40:49.246] base::names(...future.oldOptions)) [18:40:49.246] } [18:40:49.246] if (FALSE) { [18:40:49.246] } [18:40:49.246] else { [18:40:49.246] if (TRUE) { [18:40:49.246] ...future.stdout <- base::rawConnection(base::raw(0L), [18:40:49.246] open = "w") [18:40:49.246] } [18:40:49.246] else { [18:40:49.246] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:40:49.246] windows = "NUL", "/dev/null"), open = "w") [18:40:49.246] } [18:40:49.246] base::sink(...future.stdout, type = "output", split = FALSE) [18:40:49.246] base::on.exit(if (!base::is.null(...future.stdout)) { [18:40:49.246] base::sink(type = "output", split = FALSE) [18:40:49.246] base::close(...future.stdout) [18:40:49.246] }, add = TRUE) [18:40:49.246] } [18:40:49.246] ...future.frame <- base::sys.nframe() [18:40:49.246] ...future.conditions <- base::list() [18:40:49.246] ...future.rng <- base::globalenv()$.Random.seed [18:40:49.246] if (FALSE) { [18:40:49.246] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:40:49.246] "...future.value", "...future.globalenv.names", ".Random.seed") [18:40:49.246] } [18:40:49.246] ...future.result <- base::tryCatch({ [18:40:49.246] base::withCallingHandlers({ [18:40:49.246] ...future.value <- base::withVisible(base::local({ [18:40:49.246] ...future.makeSendCondition <- base::local({ [18:40:49.246] sendCondition <- NULL [18:40:49.246] function(frame = 1L) { [18:40:49.246] if (is.function(sendCondition)) [18:40:49.246] return(sendCondition) [18:40:49.246] ns <- getNamespace("parallel") [18:40:49.246] if (exists("sendData", mode = "function", [18:40:49.246] envir = ns)) { [18:40:49.246] parallel_sendData <- get("sendData", mode = "function", [18:40:49.246] envir = ns) [18:40:49.246] envir <- sys.frame(frame) [18:40:49.246] master <- NULL [18:40:49.246] while (!identical(envir, .GlobalEnv) && [18:40:49.246] !identical(envir, emptyenv())) { [18:40:49.246] if (exists("master", mode = "list", envir = envir, [18:40:49.246] inherits = FALSE)) { [18:40:49.246] master <- get("master", mode = "list", [18:40:49.246] envir = envir, inherits = FALSE) [18:40:49.246] if (inherits(master, c("SOCKnode", [18:40:49.246] "SOCK0node"))) { [18:40:49.246] sendCondition <<- function(cond) { [18:40:49.246] data <- list(type = "VALUE", value = cond, [18:40:49.246] success = TRUE) [18:40:49.246] parallel_sendData(master, data) [18:40:49.246] } [18:40:49.246] return(sendCondition) [18:40:49.246] } [18:40:49.246] } [18:40:49.246] frame <- frame + 1L [18:40:49.246] envir <- sys.frame(frame) [18:40:49.246] } [18:40:49.246] } [18:40:49.246] sendCondition <<- function(cond) NULL [18:40:49.246] } [18:40:49.246] }) [18:40:49.246] withCallingHandlers({ [18:40:49.246] { [18:40:49.246] do.call(function(...) { [18:40:49.246] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:49.246] if (!identical(...future.globals.maxSize.org, [18:40:49.246] ...future.globals.maxSize)) { [18:40:49.246] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:49.246] on.exit(options(oopts), add = TRUE) [18:40:49.246] } [18:40:49.246] { [18:40:49.246] lapply(seq_along(...future.elements_ii), [18:40:49.246] FUN = function(jj) { [18:40:49.246] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:49.246] ...future.FUN(...future.X_jj, ...) [18:40:49.246] }) [18:40:49.246] } [18:40:49.246] }, args = future.call.arguments) [18:40:49.246] } [18:40:49.246] }, immediateCondition = function(cond) { [18:40:49.246] sendCondition <- ...future.makeSendCondition() [18:40:49.246] sendCondition(cond) [18:40:49.246] muffleCondition <- function (cond, pattern = "^muffle") [18:40:49.246] { [18:40:49.246] inherits <- base::inherits [18:40:49.246] invokeRestart <- base::invokeRestart [18:40:49.246] is.null <- base::is.null [18:40:49.246] muffled <- FALSE [18:40:49.246] if (inherits(cond, "message")) { [18:40:49.246] muffled <- grepl(pattern, "muffleMessage") [18:40:49.246] if (muffled) [18:40:49.246] invokeRestart("muffleMessage") [18:40:49.246] } [18:40:49.246] else if (inherits(cond, "warning")) { [18:40:49.246] muffled <- grepl(pattern, "muffleWarning") [18:40:49.246] if (muffled) [18:40:49.246] invokeRestart("muffleWarning") [18:40:49.246] } [18:40:49.246] else if (inherits(cond, "condition")) { [18:40:49.246] if (!is.null(pattern)) { [18:40:49.246] computeRestarts <- base::computeRestarts [18:40:49.246] grepl <- base::grepl [18:40:49.246] restarts <- computeRestarts(cond) [18:40:49.246] for (restart in restarts) { [18:40:49.246] name <- restart$name [18:40:49.246] if (is.null(name)) [18:40:49.246] next [18:40:49.246] if (!grepl(pattern, name)) [18:40:49.246] next [18:40:49.246] invokeRestart(restart) [18:40:49.246] muffled <- TRUE [18:40:49.246] break [18:40:49.246] } [18:40:49.246] } [18:40:49.246] } [18:40:49.246] invisible(muffled) [18:40:49.246] } [18:40:49.246] muffleCondition(cond) [18:40:49.246] }) [18:40:49.246] })) [18:40:49.246] future::FutureResult(value = ...future.value$value, [18:40:49.246] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:40:49.246] ...future.rng), globalenv = if (FALSE) [18:40:49.246] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:40:49.246] ...future.globalenv.names)) [18:40:49.246] else NULL, started = ...future.startTime, version = "1.8") [18:40:49.246] }, condition = base::local({ [18:40:49.246] c <- base::c [18:40:49.246] inherits <- base::inherits [18:40:49.246] invokeRestart <- base::invokeRestart [18:40:49.246] length <- base::length [18:40:49.246] list <- base::list [18:40:49.246] seq.int <- base::seq.int [18:40:49.246] signalCondition <- base::signalCondition [18:40:49.246] sys.calls <- base::sys.calls [18:40:49.246] `[[` <- base::`[[` [18:40:49.246] `+` <- base::`+` [18:40:49.246] `<<-` <- base::`<<-` [18:40:49.246] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:40:49.246] calls[seq.int(from = from + 12L, to = length(calls) - [18:40:49.246] 3L)] [18:40:49.246] } [18:40:49.246] function(cond) { [18:40:49.246] is_error <- inherits(cond, "error") [18:40:49.246] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:40:49.246] NULL) [18:40:49.246] if (is_error) { [18:40:49.246] sessionInformation <- function() { [18:40:49.246] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:40:49.246] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:40:49.246] search = base::search(), system = base::Sys.info()) [18:40:49.246] } [18:40:49.246] ...future.conditions[[length(...future.conditions) + [18:40:49.246] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:40:49.246] cond$call), session = sessionInformation(), [18:40:49.246] timestamp = base::Sys.time(), signaled = 0L) [18:40:49.246] signalCondition(cond) [18:40:49.246] } [18:40:49.246] else if (!ignore && TRUE && inherits(cond, c("condition", [18:40:49.246] "immediateCondition"))) { [18:40:49.246] signal <- TRUE && inherits(cond, "immediateCondition") [18:40:49.246] ...future.conditions[[length(...future.conditions) + [18:40:49.246] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:40:49.246] if (TRUE && !signal) { [18:40:49.246] muffleCondition <- function (cond, pattern = "^muffle") [18:40:49.246] { [18:40:49.246] inherits <- base::inherits [18:40:49.246] invokeRestart <- base::invokeRestart [18:40:49.246] is.null <- base::is.null [18:40:49.246] muffled <- FALSE [18:40:49.246] if (inherits(cond, "message")) { [18:40:49.246] muffled <- grepl(pattern, "muffleMessage") [18:40:49.246] if (muffled) [18:40:49.246] invokeRestart("muffleMessage") [18:40:49.246] } [18:40:49.246] else if (inherits(cond, "warning")) { [18:40:49.246] muffled <- grepl(pattern, "muffleWarning") [18:40:49.246] if (muffled) [18:40:49.246] invokeRestart("muffleWarning") [18:40:49.246] } [18:40:49.246] else if (inherits(cond, "condition")) { [18:40:49.246] if (!is.null(pattern)) { [18:40:49.246] computeRestarts <- base::computeRestarts [18:40:49.246] grepl <- base::grepl [18:40:49.246] restarts <- computeRestarts(cond) [18:40:49.246] for (restart in restarts) { [18:40:49.246] name <- restart$name [18:40:49.246] if (is.null(name)) [18:40:49.246] next [18:40:49.246] if (!grepl(pattern, name)) [18:40:49.246] next [18:40:49.246] invokeRestart(restart) [18:40:49.246] muffled <- TRUE [18:40:49.246] break [18:40:49.246] } [18:40:49.246] } [18:40:49.246] } [18:40:49.246] invisible(muffled) [18:40:49.246] } [18:40:49.246] muffleCondition(cond, pattern = "^muffle") [18:40:49.246] } [18:40:49.246] } [18:40:49.246] else { [18:40:49.246] if (TRUE) { [18:40:49.246] muffleCondition <- function (cond, pattern = "^muffle") [18:40:49.246] { [18:40:49.246] inherits <- base::inherits [18:40:49.246] invokeRestart <- base::invokeRestart [18:40:49.246] is.null <- base::is.null [18:40:49.246] muffled <- FALSE [18:40:49.246] if (inherits(cond, "message")) { [18:40:49.246] muffled <- grepl(pattern, "muffleMessage") [18:40:49.246] if (muffled) [18:40:49.246] invokeRestart("muffleMessage") [18:40:49.246] } [18:40:49.246] else if (inherits(cond, "warning")) { [18:40:49.246] muffled <- grepl(pattern, "muffleWarning") [18:40:49.246] if (muffled) [18:40:49.246] invokeRestart("muffleWarning") [18:40:49.246] } [18:40:49.246] else if (inherits(cond, "condition")) { [18:40:49.246] if (!is.null(pattern)) { [18:40:49.246] computeRestarts <- base::computeRestarts [18:40:49.246] grepl <- base::grepl [18:40:49.246] restarts <- computeRestarts(cond) [18:40:49.246] for (restart in restarts) { [18:40:49.246] name <- restart$name [18:40:49.246] if (is.null(name)) [18:40:49.246] next [18:40:49.246] if (!grepl(pattern, name)) [18:40:49.246] next [18:40:49.246] invokeRestart(restart) [18:40:49.246] muffled <- TRUE [18:40:49.246] break [18:40:49.246] } [18:40:49.246] } [18:40:49.246] } [18:40:49.246] invisible(muffled) [18:40:49.246] } [18:40:49.246] muffleCondition(cond, pattern = "^muffle") [18:40:49.246] } [18:40:49.246] } [18:40:49.246] } [18:40:49.246] })) [18:40:49.246] }, error = function(ex) { [18:40:49.246] base::structure(base::list(value = NULL, visible = NULL, [18:40:49.246] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:40:49.246] ...future.rng), started = ...future.startTime, [18:40:49.246] finished = Sys.time(), session_uuid = NA_character_, [18:40:49.246] version = "1.8"), class = "FutureResult") [18:40:49.246] }, finally = { [18:40:49.246] if (!identical(...future.workdir, getwd())) [18:40:49.246] setwd(...future.workdir) [18:40:49.246] { [18:40:49.246] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:40:49.246] ...future.oldOptions$nwarnings <- NULL [18:40:49.246] } [18:40:49.246] base::options(...future.oldOptions) [18:40:49.246] if (.Platform$OS.type == "windows") { [18:40:49.246] old_names <- names(...future.oldEnvVars) [18:40:49.246] envs <- base::Sys.getenv() [18:40:49.246] names <- names(envs) [18:40:49.246] common <- intersect(names, old_names) [18:40:49.246] added <- setdiff(names, old_names) [18:40:49.246] removed <- setdiff(old_names, names) [18:40:49.246] changed <- common[...future.oldEnvVars[common] != [18:40:49.246] envs[common]] [18:40:49.246] NAMES <- toupper(changed) [18:40:49.246] args <- list() [18:40:49.246] for (kk in seq_along(NAMES)) { [18:40:49.246] name <- changed[[kk]] [18:40:49.246] NAME <- NAMES[[kk]] [18:40:49.246] if (name != NAME && is.element(NAME, old_names)) [18:40:49.246] next [18:40:49.246] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:49.246] } [18:40:49.246] NAMES <- toupper(added) [18:40:49.246] for (kk in seq_along(NAMES)) { [18:40:49.246] name <- added[[kk]] [18:40:49.246] NAME <- NAMES[[kk]] [18:40:49.246] if (name != NAME && is.element(NAME, old_names)) [18:40:49.246] next [18:40:49.246] args[[name]] <- "" [18:40:49.246] } [18:40:49.246] NAMES <- toupper(removed) [18:40:49.246] for (kk in seq_along(NAMES)) { [18:40:49.246] name <- removed[[kk]] [18:40:49.246] NAME <- NAMES[[kk]] [18:40:49.246] if (name != NAME && is.element(NAME, old_names)) [18:40:49.246] next [18:40:49.246] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:49.246] } [18:40:49.246] if (length(args) > 0) [18:40:49.246] base::do.call(base::Sys.setenv, args = args) [18:40:49.246] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:40:49.246] } [18:40:49.246] else { [18:40:49.246] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:40:49.246] } [18:40:49.246] { [18:40:49.246] if (base::length(...future.futureOptionsAdded) > [18:40:49.246] 0L) { [18:40:49.246] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:40:49.246] base::names(opts) <- ...future.futureOptionsAdded [18:40:49.246] base::options(opts) [18:40:49.246] } [18:40:49.246] { [18:40:49.246] { [18:40:49.246] base::options(mc.cores = ...future.mc.cores.old) [18:40:49.246] NULL [18:40:49.246] } [18:40:49.246] options(future.plan = NULL) [18:40:49.246] if (is.na(NA_character_)) [18:40:49.246] Sys.unsetenv("R_FUTURE_PLAN") [18:40:49.246] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:40:49.246] future::plan(...future.strategy.old, .cleanup = FALSE, [18:40:49.246] .init = FALSE) [18:40:49.246] } [18:40:49.246] } [18:40:49.246] } [18:40:49.246] }) [18:40:49.246] if (TRUE) { [18:40:49.246] base::sink(type = "output", split = FALSE) [18:40:49.246] if (TRUE) { [18:40:49.246] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:40:49.246] } [18:40:49.246] else { [18:40:49.246] ...future.result["stdout"] <- base::list(NULL) [18:40:49.246] } [18:40:49.246] base::close(...future.stdout) [18:40:49.246] ...future.stdout <- NULL [18:40:49.246] } [18:40:49.246] ...future.result$conditions <- ...future.conditions [18:40:49.246] ...future.result$finished <- base::Sys.time() [18:40:49.246] ...future.result [18:40:49.246] } [18:40:49.252] Exporting 5 global objects (1.03 KiB) to cluster node #1 ... [18:40:49.252] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:40:49.252] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:40:49.253] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:40:49.253] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:40:49.253] Exporting '...future.elements_ii' (247 bytes) to cluster node #1 ... [18:40:49.253] Exporting '...future.elements_ii' (247 bytes) to cluster node #1 ... DONE [18:40:49.254] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:40:49.254] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:40:49.254] Exporting '...future.globals.maxSize' (39 bytes) to cluster node #1 ... [18:40:49.256] Exporting '...future.globals.maxSize' (39 bytes) to cluster node #1 ... DONE [18:40:49.257] Exporting 5 global objects (1.03 KiB) to cluster node #1 ... DONE [18:40:49.257] MultisessionFuture started [18:40:49.257] - Launch lazy future ... done [18:40:49.258] run() for 'MultisessionFuture' ... done [18:40:49.258] Created future: [18:40:49.273] receiveMessageFromWorker() for ClusterFuture ... [18:40:49.273] - Validating connection of MultisessionFuture [18:40:49.273] - received message: FutureResult [18:40:49.273] - Received FutureResult [18:40:49.273] - Erased future from FutureRegistry [18:40:49.274] result() for ClusterFuture ... [18:40:49.274] - result already collected: FutureResult [18:40:49.274] result() for ClusterFuture ... done [18:40:49.274] receiveMessageFromWorker() for ClusterFuture ... done [18:40:49.258] MultisessionFuture: [18:40:49.258] Label: 'future_apply-1' [18:40:49.258] Expression: [18:40:49.258] { [18:40:49.258] do.call(function(...) { [18:40:49.258] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:49.258] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:49.258] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:49.258] on.exit(options(oopts), add = TRUE) [18:40:49.258] } [18:40:49.258] { [18:40:49.258] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:49.258] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:49.258] ...future.FUN(...future.X_jj, ...) [18:40:49.258] }) [18:40:49.258] } [18:40:49.258] }, args = future.call.arguments) [18:40:49.258] } [18:40:49.258] Lazy evaluation: FALSE [18:40:49.258] Asynchronous evaluation: TRUE [18:40:49.258] Local evaluation: TRUE [18:40:49.258] Environment: R_GlobalEnv [18:40:49.258] Capture standard output: TRUE [18:40:49.258] Capture condition classes: 'condition' (excluding 'nothing') [18:40:49.258] Globals: 5 objects totaling 595 bytes (DotDotDotList 'future.call.arguments' of 97 bytes, function '...future.FUN' of 185 bytes, list '...future.elements_ii' of 247 bytes, NULL '...future.seeds_ii' of 27 bytes, numeric '...future.globals.maxSize' of 39 bytes) [18:40:49.258] Packages: [18:40:49.258] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:40:49.258] Resolved: TRUE [18:40:49.258] Value: [18:40:49.258] Conditions captured: [18:40:49.258] Early signaling: FALSE [18:40:49.258] Owner process: 2171382a-9202-bc7d-80d6-248e0cb487f4 [18:40:49.258] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:40:49.275] Chunk #1 of 2 ... DONE [18:40:49.275] Chunk #2 of 2 ... [18:40:49.275] - Adjusted option 'future.globals.maxSize': Inf -> 2 * Inf = Inf (bytes) [18:40:49.275] - seeds: [18:40:49.275] - All globals exported: [n=5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:49.275] getGlobalsAndPackages() ... [18:40:49.276] - globals passed as-is: [5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:49.276] Resolving globals: FALSE [18:40:49.276] Tweak future expression to call with '...' arguments ... [18:40:49.276] { [18:40:49.276] do.call(function(...) { [18:40:49.276] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:49.276] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:49.276] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:49.276] on.exit(options(oopts), add = TRUE) [18:40:49.276] } [18:40:49.276] { [18:40:49.276] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:49.276] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:49.276] ...future.FUN(...future.X_jj, ...) [18:40:49.276] }) [18:40:49.276] } [18:40:49.276] }, args = future.call.arguments) [18:40:49.276] } [18:40:49.277] Tweak future expression to call with '...' arguments ... DONE [18:40:49.277] - globals: [5] 'future.call.arguments', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:49.277] [18:40:49.277] getGlobalsAndPackages() ... DONE [18:40:49.278] run() for 'Future' ... [18:40:49.278] - state: 'created' [18:40:49.278] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:40:49.293] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:40:49.293] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:40:49.293] - Field: 'node' [18:40:49.293] - Field: 'label' [18:40:49.294] - Field: 'local' [18:40:49.294] - Field: 'owner' [18:40:49.294] - Field: 'envir' [18:40:49.294] - Field: 'workers' [18:40:49.294] - Field: 'packages' [18:40:49.294] - Field: 'gc' [18:40:49.295] - Field: 'conditions' [18:40:49.295] - Field: 'persistent' [18:40:49.295] - Field: 'expr' [18:40:49.295] - Field: 'uuid' [18:40:49.295] - Field: 'seed' [18:40:49.296] - Field: 'version' [18:40:49.296] - Field: 'result' [18:40:49.296] - Field: 'asynchronous' [18:40:49.296] - Field: 'calls' [18:40:49.296] - Field: 'globals' [18:40:49.297] - Field: 'stdout' [18:40:49.297] - Field: 'earlySignal' [18:40:49.297] - Field: 'lazy' [18:40:49.297] - Field: 'state' [18:40:49.297] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:40:49.297] - Launch lazy future ... [18:40:49.298] Packages needed by the future expression (n = 0): [18:40:49.298] Packages needed by future strategies (n = 0): [18:40:49.298] { [18:40:49.298] { [18:40:49.298] { [18:40:49.298] ...future.startTime <- base::Sys.time() [18:40:49.298] { [18:40:49.298] { [18:40:49.298] { [18:40:49.298] { [18:40:49.298] base::local({ [18:40:49.298] has_future <- base::requireNamespace("future", [18:40:49.298] quietly = TRUE) [18:40:49.298] if (has_future) { [18:40:49.298] ns <- base::getNamespace("future") [18:40:49.298] version <- ns[[".package"]][["version"]] [18:40:49.298] if (is.null(version)) [18:40:49.298] version <- utils::packageVersion("future") [18:40:49.298] } [18:40:49.298] else { [18:40:49.298] version <- NULL [18:40:49.298] } [18:40:49.298] if (!has_future || version < "1.8.0") { [18:40:49.298] info <- base::c(r_version = base::gsub("R version ", [18:40:49.298] "", base::R.version$version.string), [18:40:49.298] platform = base::sprintf("%s (%s-bit)", [18:40:49.298] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:40:49.298] os = base::paste(base::Sys.info()[base::c("sysname", [18:40:49.298] "release", "version")], collapse = " "), [18:40:49.298] hostname = base::Sys.info()[["nodename"]]) [18:40:49.298] info <- base::sprintf("%s: %s", base::names(info), [18:40:49.298] info) [18:40:49.298] info <- base::paste(info, collapse = "; ") [18:40:49.298] if (!has_future) { [18:40:49.298] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:40:49.298] info) [18:40:49.298] } [18:40:49.298] else { [18:40:49.298] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:40:49.298] info, version) [18:40:49.298] } [18:40:49.298] base::stop(msg) [18:40:49.298] } [18:40:49.298] }) [18:40:49.298] } [18:40:49.298] ...future.mc.cores.old <- base::getOption("mc.cores") [18:40:49.298] base::options(mc.cores = 1L) [18:40:49.298] } [18:40:49.298] ...future.strategy.old <- future::plan("list") [18:40:49.298] options(future.plan = NULL) [18:40:49.298] Sys.unsetenv("R_FUTURE_PLAN") [18:40:49.298] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:40:49.298] } [18:40:49.298] ...future.workdir <- getwd() [18:40:49.298] } [18:40:49.298] ...future.oldOptions <- base::as.list(base::.Options) [18:40:49.298] ...future.oldEnvVars <- base::Sys.getenv() [18:40:49.298] } [18:40:49.298] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:40:49.298] future.globals.maxSize = Inf, future.globals.method = NULL, [18:40:49.298] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:40:49.298] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:40:49.298] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:40:49.298] future.stdout.windows.reencode = NULL, width = 80L) [18:40:49.298] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:40:49.298] base::names(...future.oldOptions)) [18:40:49.298] } [18:40:49.298] if (FALSE) { [18:40:49.298] } [18:40:49.298] else { [18:40:49.298] if (TRUE) { [18:40:49.298] ...future.stdout <- base::rawConnection(base::raw(0L), [18:40:49.298] open = "w") [18:40:49.298] } [18:40:49.298] else { [18:40:49.298] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:40:49.298] windows = "NUL", "/dev/null"), open = "w") [18:40:49.298] } [18:40:49.298] base::sink(...future.stdout, type = "output", split = FALSE) [18:40:49.298] base::on.exit(if (!base::is.null(...future.stdout)) { [18:40:49.298] base::sink(type = "output", split = FALSE) [18:40:49.298] base::close(...future.stdout) [18:40:49.298] }, add = TRUE) [18:40:49.298] } [18:40:49.298] ...future.frame <- base::sys.nframe() [18:40:49.298] ...future.conditions <- base::list() [18:40:49.298] ...future.rng <- base::globalenv()$.Random.seed [18:40:49.298] if (FALSE) { [18:40:49.298] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:40:49.298] "...future.value", "...future.globalenv.names", ".Random.seed") [18:40:49.298] } [18:40:49.298] ...future.result <- base::tryCatch({ [18:40:49.298] base::withCallingHandlers({ [18:40:49.298] ...future.value <- base::withVisible(base::local({ [18:40:49.298] ...future.makeSendCondition <- base::local({ [18:40:49.298] sendCondition <- NULL [18:40:49.298] function(frame = 1L) { [18:40:49.298] if (is.function(sendCondition)) [18:40:49.298] return(sendCondition) [18:40:49.298] ns <- getNamespace("parallel") [18:40:49.298] if (exists("sendData", mode = "function", [18:40:49.298] envir = ns)) { [18:40:49.298] parallel_sendData <- get("sendData", mode = "function", [18:40:49.298] envir = ns) [18:40:49.298] envir <- sys.frame(frame) [18:40:49.298] master <- NULL [18:40:49.298] while (!identical(envir, .GlobalEnv) && [18:40:49.298] !identical(envir, emptyenv())) { [18:40:49.298] if (exists("master", mode = "list", envir = envir, [18:40:49.298] inherits = FALSE)) { [18:40:49.298] master <- get("master", mode = "list", [18:40:49.298] envir = envir, inherits = FALSE) [18:40:49.298] if (inherits(master, c("SOCKnode", [18:40:49.298] "SOCK0node"))) { [18:40:49.298] sendCondition <<- function(cond) { [18:40:49.298] data <- list(type = "VALUE", value = cond, [18:40:49.298] success = TRUE) [18:40:49.298] parallel_sendData(master, data) [18:40:49.298] } [18:40:49.298] return(sendCondition) [18:40:49.298] } [18:40:49.298] } [18:40:49.298] frame <- frame + 1L [18:40:49.298] envir <- sys.frame(frame) [18:40:49.298] } [18:40:49.298] } [18:40:49.298] sendCondition <<- function(cond) NULL [18:40:49.298] } [18:40:49.298] }) [18:40:49.298] withCallingHandlers({ [18:40:49.298] { [18:40:49.298] do.call(function(...) { [18:40:49.298] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:49.298] if (!identical(...future.globals.maxSize.org, [18:40:49.298] ...future.globals.maxSize)) { [18:40:49.298] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:49.298] on.exit(options(oopts), add = TRUE) [18:40:49.298] } [18:40:49.298] { [18:40:49.298] lapply(seq_along(...future.elements_ii), [18:40:49.298] FUN = function(jj) { [18:40:49.298] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:49.298] ...future.FUN(...future.X_jj, ...) [18:40:49.298] }) [18:40:49.298] } [18:40:49.298] }, args = future.call.arguments) [18:40:49.298] } [18:40:49.298] }, immediateCondition = function(cond) { [18:40:49.298] sendCondition <- ...future.makeSendCondition() [18:40:49.298] sendCondition(cond) [18:40:49.298] muffleCondition <- function (cond, pattern = "^muffle") [18:40:49.298] { [18:40:49.298] inherits <- base::inherits [18:40:49.298] invokeRestart <- base::invokeRestart [18:40:49.298] is.null <- base::is.null [18:40:49.298] muffled <- FALSE [18:40:49.298] if (inherits(cond, "message")) { [18:40:49.298] muffled <- grepl(pattern, "muffleMessage") [18:40:49.298] if (muffled) [18:40:49.298] invokeRestart("muffleMessage") [18:40:49.298] } [18:40:49.298] else if (inherits(cond, "warning")) { [18:40:49.298] muffled <- grepl(pattern, "muffleWarning") [18:40:49.298] if (muffled) [18:40:49.298] invokeRestart("muffleWarning") [18:40:49.298] } [18:40:49.298] else if (inherits(cond, "condition")) { [18:40:49.298] if (!is.null(pattern)) { [18:40:49.298] computeRestarts <- base::computeRestarts [18:40:49.298] grepl <- base::grepl [18:40:49.298] restarts <- computeRestarts(cond) [18:40:49.298] for (restart in restarts) { [18:40:49.298] name <- restart$name [18:40:49.298] if (is.null(name)) [18:40:49.298] next [18:40:49.298] if (!grepl(pattern, name)) [18:40:49.298] next [18:40:49.298] invokeRestart(restart) [18:40:49.298] muffled <- TRUE [18:40:49.298] break [18:40:49.298] } [18:40:49.298] } [18:40:49.298] } [18:40:49.298] invisible(muffled) [18:40:49.298] } [18:40:49.298] muffleCondition(cond) [18:40:49.298] }) [18:40:49.298] })) [18:40:49.298] future::FutureResult(value = ...future.value$value, [18:40:49.298] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:40:49.298] ...future.rng), globalenv = if (FALSE) [18:40:49.298] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:40:49.298] ...future.globalenv.names)) [18:40:49.298] else NULL, started = ...future.startTime, version = "1.8") [18:40:49.298] }, condition = base::local({ [18:40:49.298] c <- base::c [18:40:49.298] inherits <- base::inherits [18:40:49.298] invokeRestart <- base::invokeRestart [18:40:49.298] length <- base::length [18:40:49.298] list <- base::list [18:40:49.298] seq.int <- base::seq.int [18:40:49.298] signalCondition <- base::signalCondition [18:40:49.298] sys.calls <- base::sys.calls [18:40:49.298] `[[` <- base::`[[` [18:40:49.298] `+` <- base::`+` [18:40:49.298] `<<-` <- base::`<<-` [18:40:49.298] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:40:49.298] calls[seq.int(from = from + 12L, to = length(calls) - [18:40:49.298] 3L)] [18:40:49.298] } [18:40:49.298] function(cond) { [18:40:49.298] is_error <- inherits(cond, "error") [18:40:49.298] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:40:49.298] NULL) [18:40:49.298] if (is_error) { [18:40:49.298] sessionInformation <- function() { [18:40:49.298] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:40:49.298] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:40:49.298] search = base::search(), system = base::Sys.info()) [18:40:49.298] } [18:40:49.298] ...future.conditions[[length(...future.conditions) + [18:40:49.298] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:40:49.298] cond$call), session = sessionInformation(), [18:40:49.298] timestamp = base::Sys.time(), signaled = 0L) [18:40:49.298] signalCondition(cond) [18:40:49.298] } [18:40:49.298] else if (!ignore && TRUE && inherits(cond, c("condition", [18:40:49.298] "immediateCondition"))) { [18:40:49.298] signal <- TRUE && inherits(cond, "immediateCondition") [18:40:49.298] ...future.conditions[[length(...future.conditions) + [18:40:49.298] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:40:49.298] if (TRUE && !signal) { [18:40:49.298] muffleCondition <- function (cond, pattern = "^muffle") [18:40:49.298] { [18:40:49.298] inherits <- base::inherits [18:40:49.298] invokeRestart <- base::invokeRestart [18:40:49.298] is.null <- base::is.null [18:40:49.298] muffled <- FALSE [18:40:49.298] if (inherits(cond, "message")) { [18:40:49.298] muffled <- grepl(pattern, "muffleMessage") [18:40:49.298] if (muffled) [18:40:49.298] invokeRestart("muffleMessage") [18:40:49.298] } [18:40:49.298] else if (inherits(cond, "warning")) { [18:40:49.298] muffled <- grepl(pattern, "muffleWarning") [18:40:49.298] if (muffled) [18:40:49.298] invokeRestart("muffleWarning") [18:40:49.298] } [18:40:49.298] else if (inherits(cond, "condition")) { [18:40:49.298] if (!is.null(pattern)) { [18:40:49.298] computeRestarts <- base::computeRestarts [18:40:49.298] grepl <- base::grepl [18:40:49.298] restarts <- computeRestarts(cond) [18:40:49.298] for (restart in restarts) { [18:40:49.298] name <- restart$name [18:40:49.298] if (is.null(name)) [18:40:49.298] next [18:40:49.298] if (!grepl(pattern, name)) [18:40:49.298] next [18:40:49.298] invokeRestart(restart) [18:40:49.298] muffled <- TRUE [18:40:49.298] break [18:40:49.298] } [18:40:49.298] } [18:40:49.298] } [18:40:49.298] invisible(muffled) [18:40:49.298] } [18:40:49.298] muffleCondition(cond, pattern = "^muffle") [18:40:49.298] } [18:40:49.298] } [18:40:49.298] else { [18:40:49.298] if (TRUE) { [18:40:49.298] muffleCondition <- function (cond, pattern = "^muffle") [18:40:49.298] { [18:40:49.298] inherits <- base::inherits [18:40:49.298] invokeRestart <- base::invokeRestart [18:40:49.298] is.null <- base::is.null [18:40:49.298] muffled <- FALSE [18:40:49.298] if (inherits(cond, "message")) { [18:40:49.298] muffled <- grepl(pattern, "muffleMessage") [18:40:49.298] if (muffled) [18:40:49.298] invokeRestart("muffleMessage") [18:40:49.298] } [18:40:49.298] else if (inherits(cond, "warning")) { [18:40:49.298] muffled <- grepl(pattern, "muffleWarning") [18:40:49.298] if (muffled) [18:40:49.298] invokeRestart("muffleWarning") [18:40:49.298] } [18:40:49.298] else if (inherits(cond, "condition")) { [18:40:49.298] if (!is.null(pattern)) { [18:40:49.298] computeRestarts <- base::computeRestarts [18:40:49.298] grepl <- base::grepl [18:40:49.298] restarts <- computeRestarts(cond) [18:40:49.298] for (restart in restarts) { [18:40:49.298] name <- restart$name [18:40:49.298] if (is.null(name)) [18:40:49.298] next [18:40:49.298] if (!grepl(pattern, name)) [18:40:49.298] next [18:40:49.298] invokeRestart(restart) [18:40:49.298] muffled <- TRUE [18:40:49.298] break [18:40:49.298] } [18:40:49.298] } [18:40:49.298] } [18:40:49.298] invisible(muffled) [18:40:49.298] } [18:40:49.298] muffleCondition(cond, pattern = "^muffle") [18:40:49.298] } [18:40:49.298] } [18:40:49.298] } [18:40:49.298] })) [18:40:49.298] }, error = function(ex) { [18:40:49.298] base::structure(base::list(value = NULL, visible = NULL, [18:40:49.298] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:40:49.298] ...future.rng), started = ...future.startTime, [18:40:49.298] finished = Sys.time(), session_uuid = NA_character_, [18:40:49.298] version = "1.8"), class = "FutureResult") [18:40:49.298] }, finally = { [18:40:49.298] if (!identical(...future.workdir, getwd())) [18:40:49.298] setwd(...future.workdir) [18:40:49.298] { [18:40:49.298] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:40:49.298] ...future.oldOptions$nwarnings <- NULL [18:40:49.298] } [18:40:49.298] base::options(...future.oldOptions) [18:40:49.298] if (.Platform$OS.type == "windows") { [18:40:49.298] old_names <- names(...future.oldEnvVars) [18:40:49.298] envs <- base::Sys.getenv() [18:40:49.298] names <- names(envs) [18:40:49.298] common <- intersect(names, old_names) [18:40:49.298] added <- setdiff(names, old_names) [18:40:49.298] removed <- setdiff(old_names, names) [18:40:49.298] changed <- common[...future.oldEnvVars[common] != [18:40:49.298] envs[common]] [18:40:49.298] NAMES <- toupper(changed) [18:40:49.298] args <- list() [18:40:49.298] for (kk in seq_along(NAMES)) { [18:40:49.298] name <- changed[[kk]] [18:40:49.298] NAME <- NAMES[[kk]] [18:40:49.298] if (name != NAME && is.element(NAME, old_names)) [18:40:49.298] next [18:40:49.298] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:49.298] } [18:40:49.298] NAMES <- toupper(added) [18:40:49.298] for (kk in seq_along(NAMES)) { [18:40:49.298] name <- added[[kk]] [18:40:49.298] NAME <- NAMES[[kk]] [18:40:49.298] if (name != NAME && is.element(NAME, old_names)) [18:40:49.298] next [18:40:49.298] args[[name]] <- "" [18:40:49.298] } [18:40:49.298] NAMES <- toupper(removed) [18:40:49.298] for (kk in seq_along(NAMES)) { [18:40:49.298] name <- removed[[kk]] [18:40:49.298] NAME <- NAMES[[kk]] [18:40:49.298] if (name != NAME && is.element(NAME, old_names)) [18:40:49.298] next [18:40:49.298] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:49.298] } [18:40:49.298] if (length(args) > 0) [18:40:49.298] base::do.call(base::Sys.setenv, args = args) [18:40:49.298] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:40:49.298] } [18:40:49.298] else { [18:40:49.298] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:40:49.298] } [18:40:49.298] { [18:40:49.298] if (base::length(...future.futureOptionsAdded) > [18:40:49.298] 0L) { [18:40:49.298] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:40:49.298] base::names(opts) <- ...future.futureOptionsAdded [18:40:49.298] base::options(opts) [18:40:49.298] } [18:40:49.298] { [18:40:49.298] { [18:40:49.298] base::options(mc.cores = ...future.mc.cores.old) [18:40:49.298] NULL [18:40:49.298] } [18:40:49.298] options(future.plan = NULL) [18:40:49.298] if (is.na(NA_character_)) [18:40:49.298] Sys.unsetenv("R_FUTURE_PLAN") [18:40:49.298] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:40:49.298] future::plan(...future.strategy.old, .cleanup = FALSE, [18:40:49.298] .init = FALSE) [18:40:49.298] } [18:40:49.298] } [18:40:49.298] } [18:40:49.298] }) [18:40:49.298] if (TRUE) { [18:40:49.298] base::sink(type = "output", split = FALSE) [18:40:49.298] if (TRUE) { [18:40:49.298] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:40:49.298] } [18:40:49.298] else { [18:40:49.298] ...future.result["stdout"] <- base::list(NULL) [18:40:49.298] } [18:40:49.298] base::close(...future.stdout) [18:40:49.298] ...future.stdout <- NULL [18:40:49.298] } [18:40:49.298] ...future.result$conditions <- ...future.conditions [18:40:49.298] ...future.result$finished <- base::Sys.time() [18:40:49.298] ...future.result [18:40:49.298] } [18:40:49.304] Exporting 5 global objects (1.03 KiB) to cluster node #1 ... [18:40:49.304] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:40:49.304] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:40:49.304] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:40:49.305] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:40:49.305] Exporting '...future.elements_ii' (247 bytes) to cluster node #1 ... [18:40:49.305] Exporting '...future.elements_ii' (247 bytes) to cluster node #1 ... DONE [18:40:49.305] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:40:49.306] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:40:49.306] Exporting '...future.globals.maxSize' (39 bytes) to cluster node #1 ... [18:40:49.306] Exporting '...future.globals.maxSize' (39 bytes) to cluster node #1 ... DONE [18:40:49.307] Exporting 5 global objects (1.03 KiB) to cluster node #1 ... DONE [18:40:49.307] MultisessionFuture started [18:40:49.307] - Launch lazy future ... done [18:40:49.307] run() for 'MultisessionFuture' ... done [18:40:49.308] Created future: [18:40:49.321] receiveMessageFromWorker() for ClusterFuture ... [18:40:49.321] - Validating connection of MultisessionFuture [18:40:49.321] - received message: FutureResult [18:40:49.321] - Received FutureResult [18:40:49.322] - Erased future from FutureRegistry [18:40:49.322] result() for ClusterFuture ... [18:40:49.322] - result already collected: FutureResult [18:40:49.322] result() for ClusterFuture ... done [18:40:49.322] receiveMessageFromWorker() for ClusterFuture ... done [18:40:49.308] MultisessionFuture: [18:40:49.308] Label: 'future_apply-2' [18:40:49.308] Expression: [18:40:49.308] { [18:40:49.308] do.call(function(...) { [18:40:49.308] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:49.308] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:49.308] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:49.308] on.exit(options(oopts), add = TRUE) [18:40:49.308] } [18:40:49.308] { [18:40:49.308] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:49.308] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:49.308] ...future.FUN(...future.X_jj, ...) [18:40:49.308] }) [18:40:49.308] } [18:40:49.308] }, args = future.call.arguments) [18:40:49.308] } [18:40:49.308] Lazy evaluation: FALSE [18:40:49.308] Asynchronous evaluation: TRUE [18:40:49.308] Local evaluation: TRUE [18:40:49.308] Environment: R_GlobalEnv [18:40:49.308] Capture standard output: TRUE [18:40:49.308] Capture condition classes: 'condition' (excluding 'nothing') [18:40:49.308] Globals: 5 objects totaling 595 bytes (DotDotDotList 'future.call.arguments' of 97 bytes, function '...future.FUN' of 185 bytes, list '...future.elements_ii' of 247 bytes, NULL '...future.seeds_ii' of 27 bytes, numeric '...future.globals.maxSize' of 39 bytes) [18:40:49.308] Packages: [18:40:49.308] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:40:49.308] Resolved: TRUE [18:40:49.308] Value: [18:40:49.308] Conditions captured: [18:40:49.308] Early signaling: FALSE [18:40:49.308] Owner process: 2171382a-9202-bc7d-80d6-248e0cb487f4 [18:40:49.308] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:40:49.323] Chunk #2 of 2 ... DONE [18:40:49.323] Launching 2 futures (chunks) ... DONE [18:40:49.323] Resolving 2 futures (chunks) ... [18:40:49.323] resolve() on list ... [18:40:49.323] recursive: 0 [18:40:49.323] length: 2 [18:40:49.324] [18:40:49.324] Future #1 [18:40:49.324] result() for ClusterFuture ... [18:40:49.324] - result already collected: FutureResult [18:40:49.324] result() for ClusterFuture ... done [18:40:49.324] result() for ClusterFuture ... [18:40:49.325] - result already collected: FutureResult [18:40:49.325] result() for ClusterFuture ... done [18:40:49.325] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:40:49.325] - nx: 2 [18:40:49.325] - relay: TRUE [18:40:49.325] - stdout: TRUE [18:40:49.325] - signal: TRUE [18:40:49.326] - resignal: FALSE [18:40:49.326] - force: TRUE [18:40:49.326] - relayed: [n=2] FALSE, FALSE [18:40:49.326] - queued futures: [n=2] FALSE, FALSE [18:40:49.326] - until=1 [18:40:49.326] - relaying element #1 [18:40:49.327] result() for ClusterFuture ... [18:40:49.327] - result already collected: FutureResult [18:40:49.327] result() for ClusterFuture ... done [18:40:49.327] result() for ClusterFuture ... [18:40:49.327] - result already collected: FutureResult [18:40:49.327] result() for ClusterFuture ... done [18:40:49.328] result() for ClusterFuture ... [18:40:49.328] - result already collected: FutureResult [18:40:49.328] result() for ClusterFuture ... done [18:40:49.328] result() for ClusterFuture ... [18:40:49.328] - result already collected: FutureResult [18:40:49.328] result() for ClusterFuture ... done [18:40:49.328] - relayed: [n=2] TRUE, FALSE [18:40:49.329] - queued futures: [n=2] TRUE, FALSE [18:40:49.329] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:40:49.329] length: 1 (resolved future 1) [18:40:49.329] Future #2 [18:40:49.329] result() for ClusterFuture ... [18:40:49.329] - result already collected: FutureResult [18:40:49.330] result() for ClusterFuture ... done [18:40:49.330] result() for ClusterFuture ... [18:40:49.330] - result already collected: FutureResult [18:40:49.330] result() for ClusterFuture ... done [18:40:49.330] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:40:49.330] - nx: 2 [18:40:49.331] - relay: TRUE [18:40:49.331] - stdout: TRUE [18:40:49.331] - signal: TRUE [18:40:49.331] - resignal: FALSE [18:40:49.331] - force: TRUE [18:40:49.331] - relayed: [n=2] TRUE, FALSE [18:40:49.331] - queued futures: [n=2] TRUE, FALSE [18:40:49.332] - until=2 [18:40:49.332] - relaying element #2 [18:40:49.332] result() for ClusterFuture ... [18:40:49.332] - result already collected: FutureResult [18:40:49.332] result() for ClusterFuture ... done [18:40:49.332] result() for ClusterFuture ... [18:40:49.332] - result already collected: FutureResult [18:40:49.333] result() for ClusterFuture ... done [18:40:49.333] result() for ClusterFuture ... [18:40:49.333] - result already collected: FutureResult [18:40:49.333] result() for ClusterFuture ... done [18:40:49.333] result() for ClusterFuture ... [18:40:49.333] - result already collected: FutureResult [18:40:49.334] result() for ClusterFuture ... done [18:40:49.334] - relayed: [n=2] TRUE, TRUE [18:40:49.334] - queued futures: [n=2] TRUE, TRUE [18:40:49.334] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:40:49.334] length: 0 (resolved future 2) [18:40:49.334] Relaying remaining futures [18:40:49.335] signalConditionsASAP(NULL, pos=0) ... [18:40:49.335] - nx: 2 [18:40:49.335] - relay: TRUE [18:40:49.335] - stdout: TRUE [18:40:49.335] - signal: TRUE [18:40:49.335] - resignal: FALSE [18:40:49.335] - force: TRUE [18:40:49.336] - relayed: [n=2] TRUE, TRUE [18:40:49.336] - queued futures: [n=2] TRUE, TRUE - flush all [18:40:49.336] - relayed: [n=2] TRUE, TRUE [18:40:49.336] - queued futures: [n=2] TRUE, TRUE [18:40:49.336] signalConditionsASAP(NULL, pos=0) ... done [18:40:49.336] resolve() on list ... DONE [18:40:49.337] result() for ClusterFuture ... [18:40:49.337] - result already collected: FutureResult [18:40:49.337] result() for ClusterFuture ... done [18:40:49.337] result() for ClusterFuture ... [18:40:49.337] - result already collected: FutureResult [18:40:49.337] result() for ClusterFuture ... done [18:40:49.338] result() for ClusterFuture ... [18:40:49.338] - result already collected: FutureResult [18:40:49.338] result() for ClusterFuture ... done [18:40:49.338] result() for ClusterFuture ... [18:40:49.338] - result already collected: FutureResult [18:40:49.338] result() for ClusterFuture ... done [18:40:49.338] - Number of value chunks collected: 2 [18:40:49.339] Resolving 2 futures (chunks) ... DONE [18:40:49.339] Reducing values from 2 chunks ... [18:40:49.339] - Number of values collected after concatenation: 6 [18:40:49.339] - Number of values expected: 6 [18:40:49.339] Reducing values from 2 chunks ... DONE [18:40:49.339] future_lapply() ... DONE , , C = cop.1 col row x1 x2 [1,] 3 4 [2,] 3 3 [3,] 3 2 [4,] 3 1 [5,] 3 2 [6,] 3 3 [7,] 3 4 [8,] 3 5 , , C = cop.2 col row x1 x2 [1,] 3 4 [2,] 3 3 [3,] 3 2 [4,] 3 1 [5,] 3 2 [6,] 3 3 [7,] 3 4 [8,] 3 5 , , C = cop.3 col row x1 x2 [1,] 3 4 [2,] 3 3 [3,] 3 2 [4,] 3 1 [5,] 3 2 [6,] 3 3 [7,] 3 4 [8,] 3 5 [18:40:49.340] getGlobalsAndPackagesXApply() ... [18:40:49.340] - future.globals: TRUE [18:40:49.340] getGlobalsAndPackages() ... [18:40:49.340] Searching for globals... [18:40:49.342] - globals found: [3] 'FUN', 'seq_len', 'max' [18:40:49.342] Searching for globals ... DONE [18:40:49.342] Resolving globals: FALSE [18:40:49.343] The total size of the 1 globals is 411 bytes (411 bytes) [18:40:49.343] The total size of the 1 globals exported for future expression ('FUN(X = structure(1:24, dim = 2:4))') is 411 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (411 bytes of class 'function') [18:40:49.344] - globals: [1] 'FUN' [18:40:49.344] [18:40:49.344] getGlobalsAndPackages() ... DONE [18:40:49.344] - globals found/used: [n=1] 'FUN' [18:40:49.344] - needed namespaces: [n=0] [18:40:49.344] Finding globals ... DONE [18:40:49.345] - use_args: TRUE [18:40:49.345] - Getting '...' globals ... [18:40:49.345] resolve() on list ... [18:40:49.345] recursive: 0 [18:40:49.345] length: 1 [18:40:49.346] elements: '...' [18:40:49.346] length: 0 (resolved future 1) [18:40:49.346] resolve() on list ... DONE [18:40:49.346] - '...' content: [n=0] [18:40:49.346] List of 1 [18:40:49.346] $ ...: list() [18:40:49.346] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:49.346] - attr(*, "where")=List of 1 [18:40:49.346] ..$ ...: [18:40:49.346] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:49.346] - attr(*, "resolved")= logi TRUE [18:40:49.346] - attr(*, "total_size")= num NA [18:40:49.349] - Getting '...' globals ... DONE [18:40:49.349] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:40:49.350] List of 2 [18:40:49.350] $ ...future.FUN:function (x) [18:40:49.350] $ ... : list() [18:40:49.350] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:49.350] - attr(*, "where")=List of 2 [18:40:49.350] ..$ ...future.FUN: [18:40:49.350] ..$ ... : [18:40:49.350] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:49.350] - attr(*, "resolved")= logi FALSE [18:40:49.350] - attr(*, "total_size")= int 3672 [18:40:49.353] Packages to be attached in all futures: [n=0] [18:40:49.353] getGlobalsAndPackagesXApply() ... DONE [18:40:49.355] future_lapply() ... [18:40:49.358] Number of chunks: 2 [18:40:49.358] getGlobalsAndPackagesXApply() ... [18:40:49.358] - future.globals: with names 'list()' [18:40:49.359] - use_args: TRUE [18:40:49.359] Globals to be used in all futures (chunks): [n=2] '...', '...future.FUN' [18:40:49.359] List of 2 [18:40:49.359] $ ... : list() [18:40:49.359] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:49.359] $ ...future.FUN:function (x) [18:40:49.359] - attr(*, "where")=List of 2 [18:40:49.359] ..$ ... : [18:40:49.359] ..$ ...future.FUN: [18:40:49.359] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:49.359] - attr(*, "resolved")= logi FALSE [18:40:49.359] - attr(*, "total_size")= num NA [18:40:49.362] Packages to be attached in all futures: [n=0] [18:40:49.363] getGlobalsAndPackagesXApply() ... DONE [18:40:49.363] Number of futures (= number of chunks): 2 [18:40:49.363] Launching 2 futures (chunks) ... [18:40:49.363] Chunk #1 of 2 ... [18:40:49.363] - Adjusted option 'future.globals.maxSize': Inf -> 2 * Inf = Inf (bytes) [18:40:49.364] - seeds: [18:40:49.364] - All globals exported: [n=5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:49.364] getGlobalsAndPackages() ... [18:40:49.364] - globals passed as-is: [5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:49.364] Resolving globals: FALSE [18:40:49.364] Tweak future expression to call with '...' arguments ... [18:40:49.365] { [18:40:49.365] do.call(function(...) { [18:40:49.365] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:49.365] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:49.365] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:49.365] on.exit(options(oopts), add = TRUE) [18:40:49.365] } [18:40:49.365] { [18:40:49.365] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:49.365] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:49.365] ...future.FUN(...future.X_jj, ...) [18:40:49.365] }) [18:40:49.365] } [18:40:49.365] }, args = future.call.arguments) [18:40:49.365] } [18:40:49.365] Tweak future expression to call with '...' arguments ... DONE [18:40:49.366] - globals: [5] 'future.call.arguments', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:49.366] [18:40:49.366] getGlobalsAndPackages() ... DONE [18:40:49.366] run() for 'Future' ... [18:40:49.366] - state: 'created' [18:40:49.367] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:40:49.382] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:40:49.382] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:40:49.382] - Field: 'node' [18:40:49.382] - Field: 'label' [18:40:49.382] - Field: 'local' [18:40:49.383] - Field: 'owner' [18:40:49.383] - Field: 'envir' [18:40:49.383] - Field: 'workers' [18:40:49.383] - Field: 'packages' [18:40:49.383] - Field: 'gc' [18:40:49.383] - Field: 'conditions' [18:40:49.384] - Field: 'persistent' [18:40:49.384] - Field: 'expr' [18:40:49.384] - Field: 'uuid' [18:40:49.384] - Field: 'seed' [18:40:49.384] - Field: 'version' [18:40:49.385] - Field: 'result' [18:40:49.385] - Field: 'asynchronous' [18:40:49.385] - Field: 'calls' [18:40:49.385] - Field: 'globals' [18:40:49.385] - Field: 'stdout' [18:40:49.385] - Field: 'earlySignal' [18:40:49.386] - Field: 'lazy' [18:40:49.386] - Field: 'state' [18:40:49.386] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:40:49.386] - Launch lazy future ... [18:40:49.386] Packages needed by the future expression (n = 0): [18:40:49.387] Packages needed by future strategies (n = 0): [18:40:49.387] { [18:40:49.387] { [18:40:49.387] { [18:40:49.387] ...future.startTime <- base::Sys.time() [18:40:49.387] { [18:40:49.387] { [18:40:49.387] { [18:40:49.387] { [18:40:49.387] base::local({ [18:40:49.387] has_future <- base::requireNamespace("future", [18:40:49.387] quietly = TRUE) [18:40:49.387] if (has_future) { [18:40:49.387] ns <- base::getNamespace("future") [18:40:49.387] version <- ns[[".package"]][["version"]] [18:40:49.387] if (is.null(version)) [18:40:49.387] version <- utils::packageVersion("future") [18:40:49.387] } [18:40:49.387] else { [18:40:49.387] version <- NULL [18:40:49.387] } [18:40:49.387] if (!has_future || version < "1.8.0") { [18:40:49.387] info <- base::c(r_version = base::gsub("R version ", [18:40:49.387] "", base::R.version$version.string), [18:40:49.387] platform = base::sprintf("%s (%s-bit)", [18:40:49.387] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:40:49.387] os = base::paste(base::Sys.info()[base::c("sysname", [18:40:49.387] "release", "version")], collapse = " "), [18:40:49.387] hostname = base::Sys.info()[["nodename"]]) [18:40:49.387] info <- base::sprintf("%s: %s", base::names(info), [18:40:49.387] info) [18:40:49.387] info <- base::paste(info, collapse = "; ") [18:40:49.387] if (!has_future) { [18:40:49.387] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:40:49.387] info) [18:40:49.387] } [18:40:49.387] else { [18:40:49.387] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:40:49.387] info, version) [18:40:49.387] } [18:40:49.387] base::stop(msg) [18:40:49.387] } [18:40:49.387] }) [18:40:49.387] } [18:40:49.387] ...future.mc.cores.old <- base::getOption("mc.cores") [18:40:49.387] base::options(mc.cores = 1L) [18:40:49.387] } [18:40:49.387] ...future.strategy.old <- future::plan("list") [18:40:49.387] options(future.plan = NULL) [18:40:49.387] Sys.unsetenv("R_FUTURE_PLAN") [18:40:49.387] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:40:49.387] } [18:40:49.387] ...future.workdir <- getwd() [18:40:49.387] } [18:40:49.387] ...future.oldOptions <- base::as.list(base::.Options) [18:40:49.387] ...future.oldEnvVars <- base::Sys.getenv() [18:40:49.387] } [18:40:49.387] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:40:49.387] future.globals.maxSize = Inf, future.globals.method = NULL, [18:40:49.387] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:40:49.387] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:40:49.387] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:40:49.387] future.stdout.windows.reencode = NULL, width = 80L) [18:40:49.387] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:40:49.387] base::names(...future.oldOptions)) [18:40:49.387] } [18:40:49.387] if (FALSE) { [18:40:49.387] } [18:40:49.387] else { [18:40:49.387] if (TRUE) { [18:40:49.387] ...future.stdout <- base::rawConnection(base::raw(0L), [18:40:49.387] open = "w") [18:40:49.387] } [18:40:49.387] else { [18:40:49.387] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:40:49.387] windows = "NUL", "/dev/null"), open = "w") [18:40:49.387] } [18:40:49.387] base::sink(...future.stdout, type = "output", split = FALSE) [18:40:49.387] base::on.exit(if (!base::is.null(...future.stdout)) { [18:40:49.387] base::sink(type = "output", split = FALSE) [18:40:49.387] base::close(...future.stdout) [18:40:49.387] }, add = TRUE) [18:40:49.387] } [18:40:49.387] ...future.frame <- base::sys.nframe() [18:40:49.387] ...future.conditions <- base::list() [18:40:49.387] ...future.rng <- base::globalenv()$.Random.seed [18:40:49.387] if (FALSE) { [18:40:49.387] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:40:49.387] "...future.value", "...future.globalenv.names", ".Random.seed") [18:40:49.387] } [18:40:49.387] ...future.result <- base::tryCatch({ [18:40:49.387] base::withCallingHandlers({ [18:40:49.387] ...future.value <- base::withVisible(base::local({ [18:40:49.387] ...future.makeSendCondition <- base::local({ [18:40:49.387] sendCondition <- NULL [18:40:49.387] function(frame = 1L) { [18:40:49.387] if (is.function(sendCondition)) [18:40:49.387] return(sendCondition) [18:40:49.387] ns <- getNamespace("parallel") [18:40:49.387] if (exists("sendData", mode = "function", [18:40:49.387] envir = ns)) { [18:40:49.387] parallel_sendData <- get("sendData", mode = "function", [18:40:49.387] envir = ns) [18:40:49.387] envir <- sys.frame(frame) [18:40:49.387] master <- NULL [18:40:49.387] while (!identical(envir, .GlobalEnv) && [18:40:49.387] !identical(envir, emptyenv())) { [18:40:49.387] if (exists("master", mode = "list", envir = envir, [18:40:49.387] inherits = FALSE)) { [18:40:49.387] master <- get("master", mode = "list", [18:40:49.387] envir = envir, inherits = FALSE) [18:40:49.387] if (inherits(master, c("SOCKnode", [18:40:49.387] "SOCK0node"))) { [18:40:49.387] sendCondition <<- function(cond) { [18:40:49.387] data <- list(type = "VALUE", value = cond, [18:40:49.387] success = TRUE) [18:40:49.387] parallel_sendData(master, data) [18:40:49.387] } [18:40:49.387] return(sendCondition) [18:40:49.387] } [18:40:49.387] } [18:40:49.387] frame <- frame + 1L [18:40:49.387] envir <- sys.frame(frame) [18:40:49.387] } [18:40:49.387] } [18:40:49.387] sendCondition <<- function(cond) NULL [18:40:49.387] } [18:40:49.387] }) [18:40:49.387] withCallingHandlers({ [18:40:49.387] { [18:40:49.387] do.call(function(...) { [18:40:49.387] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:49.387] if (!identical(...future.globals.maxSize.org, [18:40:49.387] ...future.globals.maxSize)) { [18:40:49.387] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:49.387] on.exit(options(oopts), add = TRUE) [18:40:49.387] } [18:40:49.387] { [18:40:49.387] lapply(seq_along(...future.elements_ii), [18:40:49.387] FUN = function(jj) { [18:40:49.387] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:49.387] ...future.FUN(...future.X_jj, ...) [18:40:49.387] }) [18:40:49.387] } [18:40:49.387] }, args = future.call.arguments) [18:40:49.387] } [18:40:49.387] }, immediateCondition = function(cond) { [18:40:49.387] sendCondition <- ...future.makeSendCondition() [18:40:49.387] sendCondition(cond) [18:40:49.387] muffleCondition <- function (cond, pattern = "^muffle") [18:40:49.387] { [18:40:49.387] inherits <- base::inherits [18:40:49.387] invokeRestart <- base::invokeRestart [18:40:49.387] is.null <- base::is.null [18:40:49.387] muffled <- FALSE [18:40:49.387] if (inherits(cond, "message")) { [18:40:49.387] muffled <- grepl(pattern, "muffleMessage") [18:40:49.387] if (muffled) [18:40:49.387] invokeRestart("muffleMessage") [18:40:49.387] } [18:40:49.387] else if (inherits(cond, "warning")) { [18:40:49.387] muffled <- grepl(pattern, "muffleWarning") [18:40:49.387] if (muffled) [18:40:49.387] invokeRestart("muffleWarning") [18:40:49.387] } [18:40:49.387] else if (inherits(cond, "condition")) { [18:40:49.387] if (!is.null(pattern)) { [18:40:49.387] computeRestarts <- base::computeRestarts [18:40:49.387] grepl <- base::grepl [18:40:49.387] restarts <- computeRestarts(cond) [18:40:49.387] for (restart in restarts) { [18:40:49.387] name <- restart$name [18:40:49.387] if (is.null(name)) [18:40:49.387] next [18:40:49.387] if (!grepl(pattern, name)) [18:40:49.387] next [18:40:49.387] invokeRestart(restart) [18:40:49.387] muffled <- TRUE [18:40:49.387] break [18:40:49.387] } [18:40:49.387] } [18:40:49.387] } [18:40:49.387] invisible(muffled) [18:40:49.387] } [18:40:49.387] muffleCondition(cond) [18:40:49.387] }) [18:40:49.387] })) [18:40:49.387] future::FutureResult(value = ...future.value$value, [18:40:49.387] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:40:49.387] ...future.rng), globalenv = if (FALSE) [18:40:49.387] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:40:49.387] ...future.globalenv.names)) [18:40:49.387] else NULL, started = ...future.startTime, version = "1.8") [18:40:49.387] }, condition = base::local({ [18:40:49.387] c <- base::c [18:40:49.387] inherits <- base::inherits [18:40:49.387] invokeRestart <- base::invokeRestart [18:40:49.387] length <- base::length [18:40:49.387] list <- base::list [18:40:49.387] seq.int <- base::seq.int [18:40:49.387] signalCondition <- base::signalCondition [18:40:49.387] sys.calls <- base::sys.calls [18:40:49.387] `[[` <- base::`[[` [18:40:49.387] `+` <- base::`+` [18:40:49.387] `<<-` <- base::`<<-` [18:40:49.387] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:40:49.387] calls[seq.int(from = from + 12L, to = length(calls) - [18:40:49.387] 3L)] [18:40:49.387] } [18:40:49.387] function(cond) { [18:40:49.387] is_error <- inherits(cond, "error") [18:40:49.387] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:40:49.387] NULL) [18:40:49.387] if (is_error) { [18:40:49.387] sessionInformation <- function() { [18:40:49.387] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:40:49.387] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:40:49.387] search = base::search(), system = base::Sys.info()) [18:40:49.387] } [18:40:49.387] ...future.conditions[[length(...future.conditions) + [18:40:49.387] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:40:49.387] cond$call), session = sessionInformation(), [18:40:49.387] timestamp = base::Sys.time(), signaled = 0L) [18:40:49.387] signalCondition(cond) [18:40:49.387] } [18:40:49.387] else if (!ignore && TRUE && inherits(cond, c("condition", [18:40:49.387] "immediateCondition"))) { [18:40:49.387] signal <- TRUE && inherits(cond, "immediateCondition") [18:40:49.387] ...future.conditions[[length(...future.conditions) + [18:40:49.387] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:40:49.387] if (TRUE && !signal) { [18:40:49.387] muffleCondition <- function (cond, pattern = "^muffle") [18:40:49.387] { [18:40:49.387] inherits <- base::inherits [18:40:49.387] invokeRestart <- base::invokeRestart [18:40:49.387] is.null <- base::is.null [18:40:49.387] muffled <- FALSE [18:40:49.387] if (inherits(cond, "message")) { [18:40:49.387] muffled <- grepl(pattern, "muffleMessage") [18:40:49.387] if (muffled) [18:40:49.387] invokeRestart("muffleMessage") [18:40:49.387] } [18:40:49.387] else if (inherits(cond, "warning")) { [18:40:49.387] muffled <- grepl(pattern, "muffleWarning") [18:40:49.387] if (muffled) [18:40:49.387] invokeRestart("muffleWarning") [18:40:49.387] } [18:40:49.387] else if (inherits(cond, "condition")) { [18:40:49.387] if (!is.null(pattern)) { [18:40:49.387] computeRestarts <- base::computeRestarts [18:40:49.387] grepl <- base::grepl [18:40:49.387] restarts <- computeRestarts(cond) [18:40:49.387] for (restart in restarts) { [18:40:49.387] name <- restart$name [18:40:49.387] if (is.null(name)) [18:40:49.387] next [18:40:49.387] if (!grepl(pattern, name)) [18:40:49.387] next [18:40:49.387] invokeRestart(restart) [18:40:49.387] muffled <- TRUE [18:40:49.387] break [18:40:49.387] } [18:40:49.387] } [18:40:49.387] } [18:40:49.387] invisible(muffled) [18:40:49.387] } [18:40:49.387] muffleCondition(cond, pattern = "^muffle") [18:40:49.387] } [18:40:49.387] } [18:40:49.387] else { [18:40:49.387] if (TRUE) { [18:40:49.387] muffleCondition <- function (cond, pattern = "^muffle") [18:40:49.387] { [18:40:49.387] inherits <- base::inherits [18:40:49.387] invokeRestart <- base::invokeRestart [18:40:49.387] is.null <- base::is.null [18:40:49.387] muffled <- FALSE [18:40:49.387] if (inherits(cond, "message")) { [18:40:49.387] muffled <- grepl(pattern, "muffleMessage") [18:40:49.387] if (muffled) [18:40:49.387] invokeRestart("muffleMessage") [18:40:49.387] } [18:40:49.387] else if (inherits(cond, "warning")) { [18:40:49.387] muffled <- grepl(pattern, "muffleWarning") [18:40:49.387] if (muffled) [18:40:49.387] invokeRestart("muffleWarning") [18:40:49.387] } [18:40:49.387] else if (inherits(cond, "condition")) { [18:40:49.387] if (!is.null(pattern)) { [18:40:49.387] computeRestarts <- base::computeRestarts [18:40:49.387] grepl <- base::grepl [18:40:49.387] restarts <- computeRestarts(cond) [18:40:49.387] for (restart in restarts) { [18:40:49.387] name <- restart$name [18:40:49.387] if (is.null(name)) [18:40:49.387] next [18:40:49.387] if (!grepl(pattern, name)) [18:40:49.387] next [18:40:49.387] invokeRestart(restart) [18:40:49.387] muffled <- TRUE [18:40:49.387] break [18:40:49.387] } [18:40:49.387] } [18:40:49.387] } [18:40:49.387] invisible(muffled) [18:40:49.387] } [18:40:49.387] muffleCondition(cond, pattern = "^muffle") [18:40:49.387] } [18:40:49.387] } [18:40:49.387] } [18:40:49.387] })) [18:40:49.387] }, error = function(ex) { [18:40:49.387] base::structure(base::list(value = NULL, visible = NULL, [18:40:49.387] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:40:49.387] ...future.rng), started = ...future.startTime, [18:40:49.387] finished = Sys.time(), session_uuid = NA_character_, [18:40:49.387] version = "1.8"), class = "FutureResult") [18:40:49.387] }, finally = { [18:40:49.387] if (!identical(...future.workdir, getwd())) [18:40:49.387] setwd(...future.workdir) [18:40:49.387] { [18:40:49.387] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:40:49.387] ...future.oldOptions$nwarnings <- NULL [18:40:49.387] } [18:40:49.387] base::options(...future.oldOptions) [18:40:49.387] if (.Platform$OS.type == "windows") { [18:40:49.387] old_names <- names(...future.oldEnvVars) [18:40:49.387] envs <- base::Sys.getenv() [18:40:49.387] names <- names(envs) [18:40:49.387] common <- intersect(names, old_names) [18:40:49.387] added <- setdiff(names, old_names) [18:40:49.387] removed <- setdiff(old_names, names) [18:40:49.387] changed <- common[...future.oldEnvVars[common] != [18:40:49.387] envs[common]] [18:40:49.387] NAMES <- toupper(changed) [18:40:49.387] args <- list() [18:40:49.387] for (kk in seq_along(NAMES)) { [18:40:49.387] name <- changed[[kk]] [18:40:49.387] NAME <- NAMES[[kk]] [18:40:49.387] if (name != NAME && is.element(NAME, old_names)) [18:40:49.387] next [18:40:49.387] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:49.387] } [18:40:49.387] NAMES <- toupper(added) [18:40:49.387] for (kk in seq_along(NAMES)) { [18:40:49.387] name <- added[[kk]] [18:40:49.387] NAME <- NAMES[[kk]] [18:40:49.387] if (name != NAME && is.element(NAME, old_names)) [18:40:49.387] next [18:40:49.387] args[[name]] <- "" [18:40:49.387] } [18:40:49.387] NAMES <- toupper(removed) [18:40:49.387] for (kk in seq_along(NAMES)) { [18:40:49.387] name <- removed[[kk]] [18:40:49.387] NAME <- NAMES[[kk]] [18:40:49.387] if (name != NAME && is.element(NAME, old_names)) [18:40:49.387] next [18:40:49.387] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:49.387] } [18:40:49.387] if (length(args) > 0) [18:40:49.387] base::do.call(base::Sys.setenv, args = args) [18:40:49.387] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:40:49.387] } [18:40:49.387] else { [18:40:49.387] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:40:49.387] } [18:40:49.387] { [18:40:49.387] if (base::length(...future.futureOptionsAdded) > [18:40:49.387] 0L) { [18:40:49.387] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:40:49.387] base::names(opts) <- ...future.futureOptionsAdded [18:40:49.387] base::options(opts) [18:40:49.387] } [18:40:49.387] { [18:40:49.387] { [18:40:49.387] base::options(mc.cores = ...future.mc.cores.old) [18:40:49.387] NULL [18:40:49.387] } [18:40:49.387] options(future.plan = NULL) [18:40:49.387] if (is.na(NA_character_)) [18:40:49.387] Sys.unsetenv("R_FUTURE_PLAN") [18:40:49.387] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:40:49.387] future::plan(...future.strategy.old, .cleanup = FALSE, [18:40:49.387] .init = FALSE) [18:40:49.387] } [18:40:49.387] } [18:40:49.387] } [18:40:49.387] }) [18:40:49.387] if (TRUE) { [18:40:49.387] base::sink(type = "output", split = FALSE) [18:40:49.387] if (TRUE) { [18:40:49.387] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:40:49.387] } [18:40:49.387] else { [18:40:49.387] ...future.result["stdout"] <- base::list(NULL) [18:40:49.387] } [18:40:49.387] base::close(...future.stdout) [18:40:49.387] ...future.stdout <- NULL [18:40:49.387] } [18:40:49.387] ...future.result$conditions <- ...future.conditions [18:40:49.387] ...future.result$finished <- base::Sys.time() [18:40:49.387] ...future.result [18:40:49.387] } [18:40:49.392] Exporting 5 global objects (1.11 KiB) to cluster node #1 ... [18:40:49.393] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:40:49.393] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:40:49.393] Exporting '...future.FUN' (411 bytes) to cluster node #1 ... [18:40:49.394] Exporting '...future.FUN' (411 bytes) to cluster node #1 ... DONE [18:40:49.394] Exporting '...future.elements_ii' (103 bytes) to cluster node #1 ... [18:40:49.394] Exporting '...future.elements_ii' (103 bytes) to cluster node #1 ... DONE [18:40:49.394] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:40:49.395] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:40:49.395] Exporting '...future.globals.maxSize' (39 bytes) to cluster node #1 ... [18:40:49.395] Exporting '...future.globals.maxSize' (39 bytes) to cluster node #1 ... DONE [18:40:49.395] Exporting 5 global objects (1.11 KiB) to cluster node #1 ... DONE [18:40:49.396] MultisessionFuture started [18:40:49.396] - Launch lazy future ... done [18:40:49.396] run() for 'MultisessionFuture' ... done [18:40:49.397] Created future: [18:40:49.411] receiveMessageFromWorker() for ClusterFuture ... [18:40:49.412] - Validating connection of MultisessionFuture [18:40:49.412] - received message: FutureResult [18:40:49.412] - Received FutureResult [18:40:49.412] - Erased future from FutureRegistry [18:40:49.412] result() for ClusterFuture ... [18:40:49.413] - result already collected: FutureResult [18:40:49.413] result() for ClusterFuture ... done [18:40:49.413] receiveMessageFromWorker() for ClusterFuture ... done [18:40:49.397] MultisessionFuture: [18:40:49.397] Label: 'future_apply-1' [18:40:49.397] Expression: [18:40:49.397] { [18:40:49.397] do.call(function(...) { [18:40:49.397] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:49.397] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:49.397] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:49.397] on.exit(options(oopts), add = TRUE) [18:40:49.397] } [18:40:49.397] { [18:40:49.397] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:49.397] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:49.397] ...future.FUN(...future.X_jj, ...) [18:40:49.397] }) [18:40:49.397] } [18:40:49.397] }, args = future.call.arguments) [18:40:49.397] } [18:40:49.397] Lazy evaluation: FALSE [18:40:49.397] Asynchronous evaluation: TRUE [18:40:49.397] Local evaluation: TRUE [18:40:49.397] Environment: R_GlobalEnv [18:40:49.397] Capture standard output: TRUE [18:40:49.397] Capture condition classes: 'condition' (excluding 'nothing') [18:40:49.397] Globals: 5 objects totaling 677 bytes (DotDotDotList 'future.call.arguments' of 97 bytes, function '...future.FUN' of 411 bytes, list '...future.elements_ii' of 103 bytes, NULL '...future.seeds_ii' of 27 bytes, numeric '...future.globals.maxSize' of 39 bytes) [18:40:49.397] Packages: [18:40:49.397] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:40:49.397] Resolved: TRUE [18:40:49.397] Value: [18:40:49.397] Conditions captured: [18:40:49.397] Early signaling: FALSE [18:40:49.397] Owner process: 2171382a-9202-bc7d-80d6-248e0cb487f4 [18:40:49.397] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:40:49.413] Chunk #1 of 2 ... DONE [18:40:49.413] Chunk #2 of 2 ... [18:40:49.414] - Adjusted option 'future.globals.maxSize': Inf -> 2 * Inf = Inf (bytes) [18:40:49.414] - seeds: [18:40:49.414] - All globals exported: [n=5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:49.414] getGlobalsAndPackages() ... [18:40:49.414] - globals passed as-is: [5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:49.415] Resolving globals: FALSE [18:40:49.415] Tweak future expression to call with '...' arguments ... [18:40:49.415] { [18:40:49.415] do.call(function(...) { [18:40:49.415] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:49.415] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:49.415] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:49.415] on.exit(options(oopts), add = TRUE) [18:40:49.415] } [18:40:49.415] { [18:40:49.415] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:49.415] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:49.415] ...future.FUN(...future.X_jj, ...) [18:40:49.415] }) [18:40:49.415] } [18:40:49.415] }, args = future.call.arguments) [18:40:49.415] } [18:40:49.415] Tweak future expression to call with '...' arguments ... DONE [18:40:49.416] - globals: [5] 'future.call.arguments', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:49.416] [18:40:49.416] getGlobalsAndPackages() ... DONE [18:40:49.417] run() for 'Future' ... [18:40:49.417] - state: 'created' [18:40:49.417] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:40:49.432] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:40:49.433] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:40:49.433] - Field: 'node' [18:40:49.433] - Field: 'label' [18:40:49.433] - Field: 'local' [18:40:49.433] - Field: 'owner' [18:40:49.434] - Field: 'envir' [18:40:49.434] - Field: 'workers' [18:40:49.434] - Field: 'packages' [18:40:49.434] - Field: 'gc' [18:40:49.434] - Field: 'conditions' [18:40:49.434] - Field: 'persistent' [18:40:49.435] - Field: 'expr' [18:40:49.435] - Field: 'uuid' [18:40:49.435] - Field: 'seed' [18:40:49.435] - Field: 'version' [18:40:49.435] - Field: 'result' [18:40:49.435] - Field: 'asynchronous' [18:40:49.436] - Field: 'calls' [18:40:49.436] - Field: 'globals' [18:40:49.436] - Field: 'stdout' [18:40:49.436] - Field: 'earlySignal' [18:40:49.437] - Field: 'lazy' [18:40:49.437] - Field: 'state' [18:40:49.437] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:40:49.437] - Launch lazy future ... [18:40:49.437] Packages needed by the future expression (n = 0): [18:40:49.438] Packages needed by future strategies (n = 0): [18:40:49.438] { [18:40:49.438] { [18:40:49.438] { [18:40:49.438] ...future.startTime <- base::Sys.time() [18:40:49.438] { [18:40:49.438] { [18:40:49.438] { [18:40:49.438] { [18:40:49.438] base::local({ [18:40:49.438] has_future <- base::requireNamespace("future", [18:40:49.438] quietly = TRUE) [18:40:49.438] if (has_future) { [18:40:49.438] ns <- base::getNamespace("future") [18:40:49.438] version <- ns[[".package"]][["version"]] [18:40:49.438] if (is.null(version)) [18:40:49.438] version <- utils::packageVersion("future") [18:40:49.438] } [18:40:49.438] else { [18:40:49.438] version <- NULL [18:40:49.438] } [18:40:49.438] if (!has_future || version < "1.8.0") { [18:40:49.438] info <- base::c(r_version = base::gsub("R version ", [18:40:49.438] "", base::R.version$version.string), [18:40:49.438] platform = base::sprintf("%s (%s-bit)", [18:40:49.438] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:40:49.438] os = base::paste(base::Sys.info()[base::c("sysname", [18:40:49.438] "release", "version")], collapse = " "), [18:40:49.438] hostname = base::Sys.info()[["nodename"]]) [18:40:49.438] info <- base::sprintf("%s: %s", base::names(info), [18:40:49.438] info) [18:40:49.438] info <- base::paste(info, collapse = "; ") [18:40:49.438] if (!has_future) { [18:40:49.438] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:40:49.438] info) [18:40:49.438] } [18:40:49.438] else { [18:40:49.438] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:40:49.438] info, version) [18:40:49.438] } [18:40:49.438] base::stop(msg) [18:40:49.438] } [18:40:49.438] }) [18:40:49.438] } [18:40:49.438] ...future.mc.cores.old <- base::getOption("mc.cores") [18:40:49.438] base::options(mc.cores = 1L) [18:40:49.438] } [18:40:49.438] ...future.strategy.old <- future::plan("list") [18:40:49.438] options(future.plan = NULL) [18:40:49.438] Sys.unsetenv("R_FUTURE_PLAN") [18:40:49.438] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:40:49.438] } [18:40:49.438] ...future.workdir <- getwd() [18:40:49.438] } [18:40:49.438] ...future.oldOptions <- base::as.list(base::.Options) [18:40:49.438] ...future.oldEnvVars <- base::Sys.getenv() [18:40:49.438] } [18:40:49.438] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:40:49.438] future.globals.maxSize = Inf, future.globals.method = NULL, [18:40:49.438] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:40:49.438] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:40:49.438] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:40:49.438] future.stdout.windows.reencode = NULL, width = 80L) [18:40:49.438] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:40:49.438] base::names(...future.oldOptions)) [18:40:49.438] } [18:40:49.438] if (FALSE) { [18:40:49.438] } [18:40:49.438] else { [18:40:49.438] if (TRUE) { [18:40:49.438] ...future.stdout <- base::rawConnection(base::raw(0L), [18:40:49.438] open = "w") [18:40:49.438] } [18:40:49.438] else { [18:40:49.438] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:40:49.438] windows = "NUL", "/dev/null"), open = "w") [18:40:49.438] } [18:40:49.438] base::sink(...future.stdout, type = "output", split = FALSE) [18:40:49.438] base::on.exit(if (!base::is.null(...future.stdout)) { [18:40:49.438] base::sink(type = "output", split = FALSE) [18:40:49.438] base::close(...future.stdout) [18:40:49.438] }, add = TRUE) [18:40:49.438] } [18:40:49.438] ...future.frame <- base::sys.nframe() [18:40:49.438] ...future.conditions <- base::list() [18:40:49.438] ...future.rng <- base::globalenv()$.Random.seed [18:40:49.438] if (FALSE) { [18:40:49.438] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:40:49.438] "...future.value", "...future.globalenv.names", ".Random.seed") [18:40:49.438] } [18:40:49.438] ...future.result <- base::tryCatch({ [18:40:49.438] base::withCallingHandlers({ [18:40:49.438] ...future.value <- base::withVisible(base::local({ [18:40:49.438] ...future.makeSendCondition <- base::local({ [18:40:49.438] sendCondition <- NULL [18:40:49.438] function(frame = 1L) { [18:40:49.438] if (is.function(sendCondition)) [18:40:49.438] return(sendCondition) [18:40:49.438] ns <- getNamespace("parallel") [18:40:49.438] if (exists("sendData", mode = "function", [18:40:49.438] envir = ns)) { [18:40:49.438] parallel_sendData <- get("sendData", mode = "function", [18:40:49.438] envir = ns) [18:40:49.438] envir <- sys.frame(frame) [18:40:49.438] master <- NULL [18:40:49.438] while (!identical(envir, .GlobalEnv) && [18:40:49.438] !identical(envir, emptyenv())) { [18:40:49.438] if (exists("master", mode = "list", envir = envir, [18:40:49.438] inherits = FALSE)) { [18:40:49.438] master <- get("master", mode = "list", [18:40:49.438] envir = envir, inherits = FALSE) [18:40:49.438] if (inherits(master, c("SOCKnode", [18:40:49.438] "SOCK0node"))) { [18:40:49.438] sendCondition <<- function(cond) { [18:40:49.438] data <- list(type = "VALUE", value = cond, [18:40:49.438] success = TRUE) [18:40:49.438] parallel_sendData(master, data) [18:40:49.438] } [18:40:49.438] return(sendCondition) [18:40:49.438] } [18:40:49.438] } [18:40:49.438] frame <- frame + 1L [18:40:49.438] envir <- sys.frame(frame) [18:40:49.438] } [18:40:49.438] } [18:40:49.438] sendCondition <<- function(cond) NULL [18:40:49.438] } [18:40:49.438] }) [18:40:49.438] withCallingHandlers({ [18:40:49.438] { [18:40:49.438] do.call(function(...) { [18:40:49.438] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:49.438] if (!identical(...future.globals.maxSize.org, [18:40:49.438] ...future.globals.maxSize)) { [18:40:49.438] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:49.438] on.exit(options(oopts), add = TRUE) [18:40:49.438] } [18:40:49.438] { [18:40:49.438] lapply(seq_along(...future.elements_ii), [18:40:49.438] FUN = function(jj) { [18:40:49.438] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:49.438] ...future.FUN(...future.X_jj, ...) [18:40:49.438] }) [18:40:49.438] } [18:40:49.438] }, args = future.call.arguments) [18:40:49.438] } [18:40:49.438] }, immediateCondition = function(cond) { [18:40:49.438] sendCondition <- ...future.makeSendCondition() [18:40:49.438] sendCondition(cond) [18:40:49.438] muffleCondition <- function (cond, pattern = "^muffle") [18:40:49.438] { [18:40:49.438] inherits <- base::inherits [18:40:49.438] invokeRestart <- base::invokeRestart [18:40:49.438] is.null <- base::is.null [18:40:49.438] muffled <- FALSE [18:40:49.438] if (inherits(cond, "message")) { [18:40:49.438] muffled <- grepl(pattern, "muffleMessage") [18:40:49.438] if (muffled) [18:40:49.438] invokeRestart("muffleMessage") [18:40:49.438] } [18:40:49.438] else if (inherits(cond, "warning")) { [18:40:49.438] muffled <- grepl(pattern, "muffleWarning") [18:40:49.438] if (muffled) [18:40:49.438] invokeRestart("muffleWarning") [18:40:49.438] } [18:40:49.438] else if (inherits(cond, "condition")) { [18:40:49.438] if (!is.null(pattern)) { [18:40:49.438] computeRestarts <- base::computeRestarts [18:40:49.438] grepl <- base::grepl [18:40:49.438] restarts <- computeRestarts(cond) [18:40:49.438] for (restart in restarts) { [18:40:49.438] name <- restart$name [18:40:49.438] if (is.null(name)) [18:40:49.438] next [18:40:49.438] if (!grepl(pattern, name)) [18:40:49.438] next [18:40:49.438] invokeRestart(restart) [18:40:49.438] muffled <- TRUE [18:40:49.438] break [18:40:49.438] } [18:40:49.438] } [18:40:49.438] } [18:40:49.438] invisible(muffled) [18:40:49.438] } [18:40:49.438] muffleCondition(cond) [18:40:49.438] }) [18:40:49.438] })) [18:40:49.438] future::FutureResult(value = ...future.value$value, [18:40:49.438] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:40:49.438] ...future.rng), globalenv = if (FALSE) [18:40:49.438] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:40:49.438] ...future.globalenv.names)) [18:40:49.438] else NULL, started = ...future.startTime, version = "1.8") [18:40:49.438] }, condition = base::local({ [18:40:49.438] c <- base::c [18:40:49.438] inherits <- base::inherits [18:40:49.438] invokeRestart <- base::invokeRestart [18:40:49.438] length <- base::length [18:40:49.438] list <- base::list [18:40:49.438] seq.int <- base::seq.int [18:40:49.438] signalCondition <- base::signalCondition [18:40:49.438] sys.calls <- base::sys.calls [18:40:49.438] `[[` <- base::`[[` [18:40:49.438] `+` <- base::`+` [18:40:49.438] `<<-` <- base::`<<-` [18:40:49.438] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:40:49.438] calls[seq.int(from = from + 12L, to = length(calls) - [18:40:49.438] 3L)] [18:40:49.438] } [18:40:49.438] function(cond) { [18:40:49.438] is_error <- inherits(cond, "error") [18:40:49.438] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:40:49.438] NULL) [18:40:49.438] if (is_error) { [18:40:49.438] sessionInformation <- function() { [18:40:49.438] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:40:49.438] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:40:49.438] search = base::search(), system = base::Sys.info()) [18:40:49.438] } [18:40:49.438] ...future.conditions[[length(...future.conditions) + [18:40:49.438] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:40:49.438] cond$call), session = sessionInformation(), [18:40:49.438] timestamp = base::Sys.time(), signaled = 0L) [18:40:49.438] signalCondition(cond) [18:40:49.438] } [18:40:49.438] else if (!ignore && TRUE && inherits(cond, c("condition", [18:40:49.438] "immediateCondition"))) { [18:40:49.438] signal <- TRUE && inherits(cond, "immediateCondition") [18:40:49.438] ...future.conditions[[length(...future.conditions) + [18:40:49.438] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:40:49.438] if (TRUE && !signal) { [18:40:49.438] muffleCondition <- function (cond, pattern = "^muffle") [18:40:49.438] { [18:40:49.438] inherits <- base::inherits [18:40:49.438] invokeRestart <- base::invokeRestart [18:40:49.438] is.null <- base::is.null [18:40:49.438] muffled <- FALSE [18:40:49.438] if (inherits(cond, "message")) { [18:40:49.438] muffled <- grepl(pattern, "muffleMessage") [18:40:49.438] if (muffled) [18:40:49.438] invokeRestart("muffleMessage") [18:40:49.438] } [18:40:49.438] else if (inherits(cond, "warning")) { [18:40:49.438] muffled <- grepl(pattern, "muffleWarning") [18:40:49.438] if (muffled) [18:40:49.438] invokeRestart("muffleWarning") [18:40:49.438] } [18:40:49.438] else if (inherits(cond, "condition")) { [18:40:49.438] if (!is.null(pattern)) { [18:40:49.438] computeRestarts <- base::computeRestarts [18:40:49.438] grepl <- base::grepl [18:40:49.438] restarts <- computeRestarts(cond) [18:40:49.438] for (restart in restarts) { [18:40:49.438] name <- restart$name [18:40:49.438] if (is.null(name)) [18:40:49.438] next [18:40:49.438] if (!grepl(pattern, name)) [18:40:49.438] next [18:40:49.438] invokeRestart(restart) [18:40:49.438] muffled <- TRUE [18:40:49.438] break [18:40:49.438] } [18:40:49.438] } [18:40:49.438] } [18:40:49.438] invisible(muffled) [18:40:49.438] } [18:40:49.438] muffleCondition(cond, pattern = "^muffle") [18:40:49.438] } [18:40:49.438] } [18:40:49.438] else { [18:40:49.438] if (TRUE) { [18:40:49.438] muffleCondition <- function (cond, pattern = "^muffle") [18:40:49.438] { [18:40:49.438] inherits <- base::inherits [18:40:49.438] invokeRestart <- base::invokeRestart [18:40:49.438] is.null <- base::is.null [18:40:49.438] muffled <- FALSE [18:40:49.438] if (inherits(cond, "message")) { [18:40:49.438] muffled <- grepl(pattern, "muffleMessage") [18:40:49.438] if (muffled) [18:40:49.438] invokeRestart("muffleMessage") [18:40:49.438] } [18:40:49.438] else if (inherits(cond, "warning")) { [18:40:49.438] muffled <- grepl(pattern, "muffleWarning") [18:40:49.438] if (muffled) [18:40:49.438] invokeRestart("muffleWarning") [18:40:49.438] } [18:40:49.438] else if (inherits(cond, "condition")) { [18:40:49.438] if (!is.null(pattern)) { [18:40:49.438] computeRestarts <- base::computeRestarts [18:40:49.438] grepl <- base::grepl [18:40:49.438] restarts <- computeRestarts(cond) [18:40:49.438] for (restart in restarts) { [18:40:49.438] name <- restart$name [18:40:49.438] if (is.null(name)) [18:40:49.438] next [18:40:49.438] if (!grepl(pattern, name)) [18:40:49.438] next [18:40:49.438] invokeRestart(restart) [18:40:49.438] muffled <- TRUE [18:40:49.438] break [18:40:49.438] } [18:40:49.438] } [18:40:49.438] } [18:40:49.438] invisible(muffled) [18:40:49.438] } [18:40:49.438] muffleCondition(cond, pattern = "^muffle") [18:40:49.438] } [18:40:49.438] } [18:40:49.438] } [18:40:49.438] })) [18:40:49.438] }, error = function(ex) { [18:40:49.438] base::structure(base::list(value = NULL, visible = NULL, [18:40:49.438] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:40:49.438] ...future.rng), started = ...future.startTime, [18:40:49.438] finished = Sys.time(), session_uuid = NA_character_, [18:40:49.438] version = "1.8"), class = "FutureResult") [18:40:49.438] }, finally = { [18:40:49.438] if (!identical(...future.workdir, getwd())) [18:40:49.438] setwd(...future.workdir) [18:40:49.438] { [18:40:49.438] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:40:49.438] ...future.oldOptions$nwarnings <- NULL [18:40:49.438] } [18:40:49.438] base::options(...future.oldOptions) [18:40:49.438] if (.Platform$OS.type == "windows") { [18:40:49.438] old_names <- names(...future.oldEnvVars) [18:40:49.438] envs <- base::Sys.getenv() [18:40:49.438] names <- names(envs) [18:40:49.438] common <- intersect(names, old_names) [18:40:49.438] added <- setdiff(names, old_names) [18:40:49.438] removed <- setdiff(old_names, names) [18:40:49.438] changed <- common[...future.oldEnvVars[common] != [18:40:49.438] envs[common]] [18:40:49.438] NAMES <- toupper(changed) [18:40:49.438] args <- list() [18:40:49.438] for (kk in seq_along(NAMES)) { [18:40:49.438] name <- changed[[kk]] [18:40:49.438] NAME <- NAMES[[kk]] [18:40:49.438] if (name != NAME && is.element(NAME, old_names)) [18:40:49.438] next [18:40:49.438] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:49.438] } [18:40:49.438] NAMES <- toupper(added) [18:40:49.438] for (kk in seq_along(NAMES)) { [18:40:49.438] name <- added[[kk]] [18:40:49.438] NAME <- NAMES[[kk]] [18:40:49.438] if (name != NAME && is.element(NAME, old_names)) [18:40:49.438] next [18:40:49.438] args[[name]] <- "" [18:40:49.438] } [18:40:49.438] NAMES <- toupper(removed) [18:40:49.438] for (kk in seq_along(NAMES)) { [18:40:49.438] name <- removed[[kk]] [18:40:49.438] NAME <- NAMES[[kk]] [18:40:49.438] if (name != NAME && is.element(NAME, old_names)) [18:40:49.438] next [18:40:49.438] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:49.438] } [18:40:49.438] if (length(args) > 0) [18:40:49.438] base::do.call(base::Sys.setenv, args = args) [18:40:49.438] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:40:49.438] } [18:40:49.438] else { [18:40:49.438] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:40:49.438] } [18:40:49.438] { [18:40:49.438] if (base::length(...future.futureOptionsAdded) > [18:40:49.438] 0L) { [18:40:49.438] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:40:49.438] base::names(opts) <- ...future.futureOptionsAdded [18:40:49.438] base::options(opts) [18:40:49.438] } [18:40:49.438] { [18:40:49.438] { [18:40:49.438] base::options(mc.cores = ...future.mc.cores.old) [18:40:49.438] NULL [18:40:49.438] } [18:40:49.438] options(future.plan = NULL) [18:40:49.438] if (is.na(NA_character_)) [18:40:49.438] Sys.unsetenv("R_FUTURE_PLAN") [18:40:49.438] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:40:49.438] future::plan(...future.strategy.old, .cleanup = FALSE, [18:40:49.438] .init = FALSE) [18:40:49.438] } [18:40:49.438] } [18:40:49.438] } [18:40:49.438] }) [18:40:49.438] if (TRUE) { [18:40:49.438] base::sink(type = "output", split = FALSE) [18:40:49.438] if (TRUE) { [18:40:49.438] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:40:49.438] } [18:40:49.438] else { [18:40:49.438] ...future.result["stdout"] <- base::list(NULL) [18:40:49.438] } [18:40:49.438] base::close(...future.stdout) [18:40:49.438] ...future.stdout <- NULL [18:40:49.438] } [18:40:49.438] ...future.result$conditions <- ...future.conditions [18:40:49.438] ...future.result$finished <- base::Sys.time() [18:40:49.438] ...future.result [18:40:49.438] } [18:40:49.443] Exporting 5 global objects (1.11 KiB) to cluster node #1 ... [18:40:49.444] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:40:49.444] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:40:49.444] Exporting '...future.FUN' (411 bytes) to cluster node #1 ... [18:40:49.445] Exporting '...future.FUN' (411 bytes) to cluster node #1 ... DONE [18:40:49.445] Exporting '...future.elements_ii' (103 bytes) to cluster node #1 ... [18:40:49.445] Exporting '...future.elements_ii' (103 bytes) to cluster node #1 ... DONE [18:40:49.445] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:40:49.446] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:40:49.446] Exporting '...future.globals.maxSize' (39 bytes) to cluster node #1 ... [18:40:49.446] Exporting '...future.globals.maxSize' (39 bytes) to cluster node #1 ... DONE [18:40:49.446] Exporting 5 global objects (1.11 KiB) to cluster node #1 ... DONE [18:40:49.447] MultisessionFuture started [18:40:49.447] - Launch lazy future ... done [18:40:49.447] run() for 'MultisessionFuture' ... done [18:40:49.448] Created future: [18:40:49.462] receiveMessageFromWorker() for ClusterFuture ... [18:40:49.462] - Validating connection of MultisessionFuture [18:40:49.463] - received message: FutureResult [18:40:49.463] - Received FutureResult [18:40:49.463] - Erased future from FutureRegistry [18:40:49.463] result() for ClusterFuture ... [18:40:49.463] - result already collected: FutureResult [18:40:49.463] result() for ClusterFuture ... done [18:40:49.464] receiveMessageFromWorker() for ClusterFuture ... done [18:40:49.448] MultisessionFuture: [18:40:49.448] Label: 'future_apply-2' [18:40:49.448] Expression: [18:40:49.448] { [18:40:49.448] do.call(function(...) { [18:40:49.448] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:49.448] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:49.448] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:49.448] on.exit(options(oopts), add = TRUE) [18:40:49.448] } [18:40:49.448] { [18:40:49.448] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:49.448] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:49.448] ...future.FUN(...future.X_jj, ...) [18:40:49.448] }) [18:40:49.448] } [18:40:49.448] }, args = future.call.arguments) [18:40:49.448] } [18:40:49.448] Lazy evaluation: FALSE [18:40:49.448] Asynchronous evaluation: TRUE [18:40:49.448] Local evaluation: TRUE [18:40:49.448] Environment: R_GlobalEnv [18:40:49.448] Capture standard output: TRUE [18:40:49.448] Capture condition classes: 'condition' (excluding 'nothing') [18:40:49.448] Globals: 5 objects totaling 677 bytes (DotDotDotList 'future.call.arguments' of 97 bytes, function '...future.FUN' of 411 bytes, list '...future.elements_ii' of 103 bytes, NULL '...future.seeds_ii' of 27 bytes, numeric '...future.globals.maxSize' of 39 bytes) [18:40:49.448] Packages: [18:40:49.448] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:40:49.448] Resolved: TRUE [18:40:49.448] Value: [18:40:49.448] Conditions captured: [18:40:49.448] Early signaling: FALSE [18:40:49.448] Owner process: 2171382a-9202-bc7d-80d6-248e0cb487f4 [18:40:49.448] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:40:49.464] Chunk #2 of 2 ... DONE [18:40:49.464] Launching 2 futures (chunks) ... DONE [18:40:49.464] Resolving 2 futures (chunks) ... [18:40:49.465] resolve() on list ... [18:40:49.465] recursive: 0 [18:40:49.465] length: 2 [18:40:49.465] [18:40:49.465] Future #1 [18:40:49.465] result() for ClusterFuture ... [18:40:49.465] - result already collected: FutureResult [18:40:49.466] result() for ClusterFuture ... done [18:40:49.466] result() for ClusterFuture ... [18:40:49.466] - result already collected: FutureResult [18:40:49.466] result() for ClusterFuture ... done [18:40:49.466] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:40:49.466] - nx: 2 [18:40:49.467] - relay: TRUE [18:40:49.467] - stdout: TRUE [18:40:49.467] - signal: TRUE [18:40:49.467] - resignal: FALSE [18:40:49.467] - force: TRUE [18:40:49.467] - relayed: [n=2] FALSE, FALSE [18:40:49.467] - queued futures: [n=2] FALSE, FALSE [18:40:49.468] - until=1 [18:40:49.468] - relaying element #1 [18:40:49.468] result() for ClusterFuture ... [18:40:49.468] - result already collected: FutureResult [18:40:49.468] result() for ClusterFuture ... done [18:40:49.468] result() for ClusterFuture ... [18:40:49.469] - result already collected: FutureResult [18:40:49.469] result() for ClusterFuture ... done [18:40:49.469] result() for ClusterFuture ... [18:40:49.469] - result already collected: FutureResult [18:40:49.469] result() for ClusterFuture ... done [18:40:49.469] result() for ClusterFuture ... [18:40:49.470] - result already collected: FutureResult [18:40:49.470] result() for ClusterFuture ... done [18:40:49.470] - relayed: [n=2] TRUE, FALSE [18:40:49.470] - queued futures: [n=2] TRUE, FALSE [18:40:49.470] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:40:49.470] length: 1 (resolved future 1) [18:40:49.471] Future #2 [18:40:49.471] result() for ClusterFuture ... [18:40:49.471] - result already collected: FutureResult [18:40:49.471] result() for ClusterFuture ... done [18:40:49.473] result() for ClusterFuture ... [18:40:49.474] - result already collected: FutureResult [18:40:49.474] result() for ClusterFuture ... done [18:40:49.474] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:40:49.474] - nx: 2 [18:40:49.474] - relay: TRUE [18:40:49.474] - stdout: TRUE [18:40:49.475] - signal: TRUE [18:40:49.475] - resignal: FALSE [18:40:49.475] - force: TRUE [18:40:49.475] - relayed: [n=2] TRUE, FALSE [18:40:49.475] - queued futures: [n=2] TRUE, FALSE [18:40:49.475] - until=2 [18:40:49.475] - relaying element #2 [18:40:49.476] result() for ClusterFuture ... [18:40:49.476] - result already collected: FutureResult [18:40:49.476] result() for ClusterFuture ... done [18:40:49.476] result() for ClusterFuture ... [18:40:49.476] - result already collected: FutureResult [18:40:49.476] result() for ClusterFuture ... done [18:40:49.477] result() for ClusterFuture ... [18:40:49.477] - result already collected: FutureResult [18:40:49.477] result() for ClusterFuture ... done [18:40:49.477] result() for ClusterFuture ... [18:40:49.477] - result already collected: FutureResult [18:40:49.477] result() for ClusterFuture ... done [18:40:49.477] - relayed: [n=2] TRUE, TRUE [18:40:49.478] - queued futures: [n=2] TRUE, TRUE [18:40:49.478] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:40:49.478] length: 0 (resolved future 2) [18:40:49.478] Relaying remaining futures [18:40:49.478] signalConditionsASAP(NULL, pos=0) ... [18:40:49.478] - nx: 2 [18:40:49.479] - relay: TRUE [18:40:49.479] - stdout: TRUE [18:40:49.479] - signal: TRUE [18:40:49.479] - resignal: FALSE [18:40:49.479] - force: TRUE [18:40:49.479] - relayed: [n=2] TRUE, TRUE [18:40:49.479] - queued futures: [n=2] TRUE, TRUE - flush all [18:40:49.480] - relayed: [n=2] TRUE, TRUE [18:40:49.480] - queued futures: [n=2] TRUE, TRUE [18:40:49.480] signalConditionsASAP(NULL, pos=0) ... done [18:40:49.480] resolve() on list ... DONE [18:40:49.480] result() for ClusterFuture ... [18:40:49.480] - result already collected: FutureResult [18:40:49.481] result() for ClusterFuture ... done [18:40:49.481] result() for ClusterFuture ... [18:40:49.481] - result already collected: FutureResult [18:40:49.481] result() for ClusterFuture ... done [18:40:49.481] result() for ClusterFuture ... [18:40:49.481] - result already collected: FutureResult [18:40:49.482] result() for ClusterFuture ... done [18:40:49.482] result() for ClusterFuture ... [18:40:49.482] - result already collected: FutureResult [18:40:49.482] result() for ClusterFuture ... done [18:40:49.482] - Number of value chunks collected: 2 [18:40:49.482] Resolving 2 futures (chunks) ... DONE [18:40:49.483] Reducing values from 2 chunks ... [18:40:49.483] - Number of values collected after concatenation: 6 [18:40:49.483] - Number of values expected: 6 [18:40:49.483] Reducing values from 2 chunks ... DONE [18:40:49.483] future_lapply() ... DONE [,1] [,2] [,3] [1,] integer,19 integer,21 integer,23 [2,] integer,20 integer,22 integer,24 - apply(X, MARGIN = , ...) ... [18:40:49.484] getGlobalsAndPackagesXApply() ... [18:40:49.484] - future.globals: TRUE [18:40:49.484] getGlobalsAndPackages() ... [18:40:49.484] Searching for globals... [18:40:49.485] - globals found: [1] 'FUN' [18:40:49.485] Searching for globals ... DONE [18:40:49.486] Resolving globals: FALSE [18:40:49.486] The total size of the 1 globals is 185 bytes (185 bytes) [18:40:49.486] The total size of the 1 globals exported for future expression ('FUN(X = structure(1:2, dim = 2:1, dimnames = list(rows = c("a",; "b"), NULL)))') 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:40:49.487] - globals: [1] 'FUN' [18:40:49.487] [18:40:49.487] getGlobalsAndPackages() ... DONE [18:40:49.487] - globals found/used: [n=1] 'FUN' [18:40:49.487] - needed namespaces: [n=0] [18:40:49.487] Finding globals ... DONE [18:40:49.488] - use_args: TRUE [18:40:49.488] - Getting '...' globals ... [18:40:49.488] resolve() on list ... [18:40:49.488] recursive: 0 [18:40:49.489] length: 1 [18:40:49.489] elements: '...' [18:40:49.489] length: 0 (resolved future 1) [18:40:49.489] resolve() on list ... DONE [18:40:49.489] - '...' content: [n=0] [18:40:49.489] List of 1 [18:40:49.489] $ ...: list() [18:40:49.489] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:49.489] - attr(*, "where")=List of 1 [18:40:49.489] ..$ ...: [18:40:49.489] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:49.489] - attr(*, "resolved")= logi TRUE [18:40:49.489] - attr(*, "total_size")= num NA [18:40:49.492] - Getting '...' globals ... DONE [18:40:49.492] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:40:49.493] List of 2 [18:40:49.493] $ ...future.FUN:function (x) [18:40:49.493] $ ... : list() [18:40:49.493] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:49.493] - attr(*, "where")=List of 2 [18:40:49.493] ..$ ...future.FUN: [18:40:49.493] ..$ ... : [18:40:49.493] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:49.493] - attr(*, "resolved")= logi FALSE [18:40:49.493] - attr(*, "total_size")= int 2547 [18:40:49.496] Packages to be attached in all futures: [n=0] [18:40:49.496] getGlobalsAndPackagesXApply() ... DONE [18:40:49.498] future_lapply() ... [18:40:49.501] Number of chunks: 2 [18:40:49.501] getGlobalsAndPackagesXApply() ... [18:40:49.501] - future.globals: with names 'list()' [18:40:49.502] - use_args: TRUE [18:40:49.502] Globals to be used in all futures (chunks): [n=2] '...', '...future.FUN' [18:40:49.502] List of 2 [18:40:49.502] $ ... : list() [18:40:49.502] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:49.502] $ ...future.FUN:function (x) [18:40:49.502] - attr(*, "where")=List of 2 [18:40:49.502] ..$ ... : [18:40:49.502] ..$ ...future.FUN: [18:40:49.502] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:49.502] - attr(*, "resolved")= logi FALSE [18:40:49.502] - attr(*, "total_size")= num NA [18:40:49.506] Packages to be attached in all futures: [n=0] [18:40:49.506] getGlobalsAndPackagesXApply() ... DONE [18:40:49.507] Number of futures (= number of chunks): 2 [18:40:49.507] Launching 2 futures (chunks) ... [18:40:49.507] Chunk #1 of 2 ... [18:40:49.507] - Adjusted option 'future.globals.maxSize': Inf -> 2 * Inf = Inf (bytes) [18:40:49.507] - seeds: [18:40:49.508] - All globals exported: [n=5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:49.508] getGlobalsAndPackages() ... [18:40:49.508] - globals passed as-is: [5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:49.508] Resolving globals: FALSE [18:40:49.508] Tweak future expression to call with '...' arguments ... [18:40:49.508] { [18:40:49.508] do.call(function(...) { [18:40:49.508] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:49.508] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:49.508] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:49.508] on.exit(options(oopts), add = TRUE) [18:40:49.508] } [18:40:49.508] { [18:40:49.508] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:49.508] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:49.508] ...future.FUN(...future.X_jj, ...) [18:40:49.508] }) [18:40:49.508] } [18:40:49.508] }, args = future.call.arguments) [18:40:49.508] } [18:40:49.509] Tweak future expression to call with '...' arguments ... DONE [18:40:49.509] - globals: [5] 'future.call.arguments', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:49.510] [18:40:49.510] getGlobalsAndPackages() ... DONE [18:40:49.510] run() for 'Future' ... [18:40:49.510] - state: 'created' [18:40:49.511] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:40:49.525] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:40:49.526] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:40:49.526] - Field: 'node' [18:40:49.526] - Field: 'label' [18:40:49.526] - Field: 'local' [18:40:49.526] - Field: 'owner' [18:40:49.527] - Field: 'envir' [18:40:49.527] - Field: 'workers' [18:40:49.527] - Field: 'packages' [18:40:49.527] - Field: 'gc' [18:40:49.527] - Field: 'conditions' [18:40:49.527] - Field: 'persistent' [18:40:49.528] - Field: 'expr' [18:40:49.528] - Field: 'uuid' [18:40:49.528] - Field: 'seed' [18:40:49.528] - Field: 'version' [18:40:49.528] - Field: 'result' [18:40:49.528] - Field: 'asynchronous' [18:40:49.529] - Field: 'calls' [18:40:49.529] - Field: 'globals' [18:40:49.529] - Field: 'stdout' [18:40:49.529] - Field: 'earlySignal' [18:40:49.529] - Field: 'lazy' [18:40:49.529] - Field: 'state' [18:40:49.530] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:40:49.530] - Launch lazy future ... [18:40:49.530] Packages needed by the future expression (n = 0): [18:40:49.530] Packages needed by future strategies (n = 0): [18:40:49.531] { [18:40:49.531] { [18:40:49.531] { [18:40:49.531] ...future.startTime <- base::Sys.time() [18:40:49.531] { [18:40:49.531] { [18:40:49.531] { [18:40:49.531] { [18:40:49.531] base::local({ [18:40:49.531] has_future <- base::requireNamespace("future", [18:40:49.531] quietly = TRUE) [18:40:49.531] if (has_future) { [18:40:49.531] ns <- base::getNamespace("future") [18:40:49.531] version <- ns[[".package"]][["version"]] [18:40:49.531] if (is.null(version)) [18:40:49.531] version <- utils::packageVersion("future") [18:40:49.531] } [18:40:49.531] else { [18:40:49.531] version <- NULL [18:40:49.531] } [18:40:49.531] if (!has_future || version < "1.8.0") { [18:40:49.531] info <- base::c(r_version = base::gsub("R version ", [18:40:49.531] "", base::R.version$version.string), [18:40:49.531] platform = base::sprintf("%s (%s-bit)", [18:40:49.531] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:40:49.531] os = base::paste(base::Sys.info()[base::c("sysname", [18:40:49.531] "release", "version")], collapse = " "), [18:40:49.531] hostname = base::Sys.info()[["nodename"]]) [18:40:49.531] info <- base::sprintf("%s: %s", base::names(info), [18:40:49.531] info) [18:40:49.531] info <- base::paste(info, collapse = "; ") [18:40:49.531] if (!has_future) { [18:40:49.531] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:40:49.531] info) [18:40:49.531] } [18:40:49.531] else { [18:40:49.531] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:40:49.531] info, version) [18:40:49.531] } [18:40:49.531] base::stop(msg) [18:40:49.531] } [18:40:49.531] }) [18:40:49.531] } [18:40:49.531] ...future.mc.cores.old <- base::getOption("mc.cores") [18:40:49.531] base::options(mc.cores = 1L) [18:40:49.531] } [18:40:49.531] ...future.strategy.old <- future::plan("list") [18:40:49.531] options(future.plan = NULL) [18:40:49.531] Sys.unsetenv("R_FUTURE_PLAN") [18:40:49.531] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:40:49.531] } [18:40:49.531] ...future.workdir <- getwd() [18:40:49.531] } [18:40:49.531] ...future.oldOptions <- base::as.list(base::.Options) [18:40:49.531] ...future.oldEnvVars <- base::Sys.getenv() [18:40:49.531] } [18:40:49.531] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:40:49.531] future.globals.maxSize = Inf, future.globals.method = NULL, [18:40:49.531] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:40:49.531] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:40:49.531] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:40:49.531] future.stdout.windows.reencode = NULL, width = 80L) [18:40:49.531] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:40:49.531] base::names(...future.oldOptions)) [18:40:49.531] } [18:40:49.531] if (FALSE) { [18:40:49.531] } [18:40:49.531] else { [18:40:49.531] if (TRUE) { [18:40:49.531] ...future.stdout <- base::rawConnection(base::raw(0L), [18:40:49.531] open = "w") [18:40:49.531] } [18:40:49.531] else { [18:40:49.531] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:40:49.531] windows = "NUL", "/dev/null"), open = "w") [18:40:49.531] } [18:40:49.531] base::sink(...future.stdout, type = "output", split = FALSE) [18:40:49.531] base::on.exit(if (!base::is.null(...future.stdout)) { [18:40:49.531] base::sink(type = "output", split = FALSE) [18:40:49.531] base::close(...future.stdout) [18:40:49.531] }, add = TRUE) [18:40:49.531] } [18:40:49.531] ...future.frame <- base::sys.nframe() [18:40:49.531] ...future.conditions <- base::list() [18:40:49.531] ...future.rng <- base::globalenv()$.Random.seed [18:40:49.531] if (FALSE) { [18:40:49.531] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:40:49.531] "...future.value", "...future.globalenv.names", ".Random.seed") [18:40:49.531] } [18:40:49.531] ...future.result <- base::tryCatch({ [18:40:49.531] base::withCallingHandlers({ [18:40:49.531] ...future.value <- base::withVisible(base::local({ [18:40:49.531] ...future.makeSendCondition <- base::local({ [18:40:49.531] sendCondition <- NULL [18:40:49.531] function(frame = 1L) { [18:40:49.531] if (is.function(sendCondition)) [18:40:49.531] return(sendCondition) [18:40:49.531] ns <- getNamespace("parallel") [18:40:49.531] if (exists("sendData", mode = "function", [18:40:49.531] envir = ns)) { [18:40:49.531] parallel_sendData <- get("sendData", mode = "function", [18:40:49.531] envir = ns) [18:40:49.531] envir <- sys.frame(frame) [18:40:49.531] master <- NULL [18:40:49.531] while (!identical(envir, .GlobalEnv) && [18:40:49.531] !identical(envir, emptyenv())) { [18:40:49.531] if (exists("master", mode = "list", envir = envir, [18:40:49.531] inherits = FALSE)) { [18:40:49.531] master <- get("master", mode = "list", [18:40:49.531] envir = envir, inherits = FALSE) [18:40:49.531] if (inherits(master, c("SOCKnode", [18:40:49.531] "SOCK0node"))) { [18:40:49.531] sendCondition <<- function(cond) { [18:40:49.531] data <- list(type = "VALUE", value = cond, [18:40:49.531] success = TRUE) [18:40:49.531] parallel_sendData(master, data) [18:40:49.531] } [18:40:49.531] return(sendCondition) [18:40:49.531] } [18:40:49.531] } [18:40:49.531] frame <- frame + 1L [18:40:49.531] envir <- sys.frame(frame) [18:40:49.531] } [18:40:49.531] } [18:40:49.531] sendCondition <<- function(cond) NULL [18:40:49.531] } [18:40:49.531] }) [18:40:49.531] withCallingHandlers({ [18:40:49.531] { [18:40:49.531] do.call(function(...) { [18:40:49.531] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:49.531] if (!identical(...future.globals.maxSize.org, [18:40:49.531] ...future.globals.maxSize)) { [18:40:49.531] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:49.531] on.exit(options(oopts), add = TRUE) [18:40:49.531] } [18:40:49.531] { [18:40:49.531] lapply(seq_along(...future.elements_ii), [18:40:49.531] FUN = function(jj) { [18:40:49.531] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:49.531] ...future.FUN(...future.X_jj, ...) [18:40:49.531] }) [18:40:49.531] } [18:40:49.531] }, args = future.call.arguments) [18:40:49.531] } [18:40:49.531] }, immediateCondition = function(cond) { [18:40:49.531] sendCondition <- ...future.makeSendCondition() [18:40:49.531] sendCondition(cond) [18:40:49.531] muffleCondition <- function (cond, pattern = "^muffle") [18:40:49.531] { [18:40:49.531] inherits <- base::inherits [18:40:49.531] invokeRestart <- base::invokeRestart [18:40:49.531] is.null <- base::is.null [18:40:49.531] muffled <- FALSE [18:40:49.531] if (inherits(cond, "message")) { [18:40:49.531] muffled <- grepl(pattern, "muffleMessage") [18:40:49.531] if (muffled) [18:40:49.531] invokeRestart("muffleMessage") [18:40:49.531] } [18:40:49.531] else if (inherits(cond, "warning")) { [18:40:49.531] muffled <- grepl(pattern, "muffleWarning") [18:40:49.531] if (muffled) [18:40:49.531] invokeRestart("muffleWarning") [18:40:49.531] } [18:40:49.531] else if (inherits(cond, "condition")) { [18:40:49.531] if (!is.null(pattern)) { [18:40:49.531] computeRestarts <- base::computeRestarts [18:40:49.531] grepl <- base::grepl [18:40:49.531] restarts <- computeRestarts(cond) [18:40:49.531] for (restart in restarts) { [18:40:49.531] name <- restart$name [18:40:49.531] if (is.null(name)) [18:40:49.531] next [18:40:49.531] if (!grepl(pattern, name)) [18:40:49.531] next [18:40:49.531] invokeRestart(restart) [18:40:49.531] muffled <- TRUE [18:40:49.531] break [18:40:49.531] } [18:40:49.531] } [18:40:49.531] } [18:40:49.531] invisible(muffled) [18:40:49.531] } [18:40:49.531] muffleCondition(cond) [18:40:49.531] }) [18:40:49.531] })) [18:40:49.531] future::FutureResult(value = ...future.value$value, [18:40:49.531] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:40:49.531] ...future.rng), globalenv = if (FALSE) [18:40:49.531] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:40:49.531] ...future.globalenv.names)) [18:40:49.531] else NULL, started = ...future.startTime, version = "1.8") [18:40:49.531] }, condition = base::local({ [18:40:49.531] c <- base::c [18:40:49.531] inherits <- base::inherits [18:40:49.531] invokeRestart <- base::invokeRestart [18:40:49.531] length <- base::length [18:40:49.531] list <- base::list [18:40:49.531] seq.int <- base::seq.int [18:40:49.531] signalCondition <- base::signalCondition [18:40:49.531] sys.calls <- base::sys.calls [18:40:49.531] `[[` <- base::`[[` [18:40:49.531] `+` <- base::`+` [18:40:49.531] `<<-` <- base::`<<-` [18:40:49.531] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:40:49.531] calls[seq.int(from = from + 12L, to = length(calls) - [18:40:49.531] 3L)] [18:40:49.531] } [18:40:49.531] function(cond) { [18:40:49.531] is_error <- inherits(cond, "error") [18:40:49.531] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:40:49.531] NULL) [18:40:49.531] if (is_error) { [18:40:49.531] sessionInformation <- function() { [18:40:49.531] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:40:49.531] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:40:49.531] search = base::search(), system = base::Sys.info()) [18:40:49.531] } [18:40:49.531] ...future.conditions[[length(...future.conditions) + [18:40:49.531] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:40:49.531] cond$call), session = sessionInformation(), [18:40:49.531] timestamp = base::Sys.time(), signaled = 0L) [18:40:49.531] signalCondition(cond) [18:40:49.531] } [18:40:49.531] else if (!ignore && TRUE && inherits(cond, c("condition", [18:40:49.531] "immediateCondition"))) { [18:40:49.531] signal <- TRUE && inherits(cond, "immediateCondition") [18:40:49.531] ...future.conditions[[length(...future.conditions) + [18:40:49.531] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:40:49.531] if (TRUE && !signal) { [18:40:49.531] muffleCondition <- function (cond, pattern = "^muffle") [18:40:49.531] { [18:40:49.531] inherits <- base::inherits [18:40:49.531] invokeRestart <- base::invokeRestart [18:40:49.531] is.null <- base::is.null [18:40:49.531] muffled <- FALSE [18:40:49.531] if (inherits(cond, "message")) { [18:40:49.531] muffled <- grepl(pattern, "muffleMessage") [18:40:49.531] if (muffled) [18:40:49.531] invokeRestart("muffleMessage") [18:40:49.531] } [18:40:49.531] else if (inherits(cond, "warning")) { [18:40:49.531] muffled <- grepl(pattern, "muffleWarning") [18:40:49.531] if (muffled) [18:40:49.531] invokeRestart("muffleWarning") [18:40:49.531] } [18:40:49.531] else if (inherits(cond, "condition")) { [18:40:49.531] if (!is.null(pattern)) { [18:40:49.531] computeRestarts <- base::computeRestarts [18:40:49.531] grepl <- base::grepl [18:40:49.531] restarts <- computeRestarts(cond) [18:40:49.531] for (restart in restarts) { [18:40:49.531] name <- restart$name [18:40:49.531] if (is.null(name)) [18:40:49.531] next [18:40:49.531] if (!grepl(pattern, name)) [18:40:49.531] next [18:40:49.531] invokeRestart(restart) [18:40:49.531] muffled <- TRUE [18:40:49.531] break [18:40:49.531] } [18:40:49.531] } [18:40:49.531] } [18:40:49.531] invisible(muffled) [18:40:49.531] } [18:40:49.531] muffleCondition(cond, pattern = "^muffle") [18:40:49.531] } [18:40:49.531] } [18:40:49.531] else { [18:40:49.531] if (TRUE) { [18:40:49.531] muffleCondition <- function (cond, pattern = "^muffle") [18:40:49.531] { [18:40:49.531] inherits <- base::inherits [18:40:49.531] invokeRestart <- base::invokeRestart [18:40:49.531] is.null <- base::is.null [18:40:49.531] muffled <- FALSE [18:40:49.531] if (inherits(cond, "message")) { [18:40:49.531] muffled <- grepl(pattern, "muffleMessage") [18:40:49.531] if (muffled) [18:40:49.531] invokeRestart("muffleMessage") [18:40:49.531] } [18:40:49.531] else if (inherits(cond, "warning")) { [18:40:49.531] muffled <- grepl(pattern, "muffleWarning") [18:40:49.531] if (muffled) [18:40:49.531] invokeRestart("muffleWarning") [18:40:49.531] } [18:40:49.531] else if (inherits(cond, "condition")) { [18:40:49.531] if (!is.null(pattern)) { [18:40:49.531] computeRestarts <- base::computeRestarts [18:40:49.531] grepl <- base::grepl [18:40:49.531] restarts <- computeRestarts(cond) [18:40:49.531] for (restart in restarts) { [18:40:49.531] name <- restart$name [18:40:49.531] if (is.null(name)) [18:40:49.531] next [18:40:49.531] if (!grepl(pattern, name)) [18:40:49.531] next [18:40:49.531] invokeRestart(restart) [18:40:49.531] muffled <- TRUE [18:40:49.531] break [18:40:49.531] } [18:40:49.531] } [18:40:49.531] } [18:40:49.531] invisible(muffled) [18:40:49.531] } [18:40:49.531] muffleCondition(cond, pattern = "^muffle") [18:40:49.531] } [18:40:49.531] } [18:40:49.531] } [18:40:49.531] })) [18:40:49.531] }, error = function(ex) { [18:40:49.531] base::structure(base::list(value = NULL, visible = NULL, [18:40:49.531] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:40:49.531] ...future.rng), started = ...future.startTime, [18:40:49.531] finished = Sys.time(), session_uuid = NA_character_, [18:40:49.531] version = "1.8"), class = "FutureResult") [18:40:49.531] }, finally = { [18:40:49.531] if (!identical(...future.workdir, getwd())) [18:40:49.531] setwd(...future.workdir) [18:40:49.531] { [18:40:49.531] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:40:49.531] ...future.oldOptions$nwarnings <- NULL [18:40:49.531] } [18:40:49.531] base::options(...future.oldOptions) [18:40:49.531] if (.Platform$OS.type == "windows") { [18:40:49.531] old_names <- names(...future.oldEnvVars) [18:40:49.531] envs <- base::Sys.getenv() [18:40:49.531] names <- names(envs) [18:40:49.531] common <- intersect(names, old_names) [18:40:49.531] added <- setdiff(names, old_names) [18:40:49.531] removed <- setdiff(old_names, names) [18:40:49.531] changed <- common[...future.oldEnvVars[common] != [18:40:49.531] envs[common]] [18:40:49.531] NAMES <- toupper(changed) [18:40:49.531] args <- list() [18:40:49.531] for (kk in seq_along(NAMES)) { [18:40:49.531] name <- changed[[kk]] [18:40:49.531] NAME <- NAMES[[kk]] [18:40:49.531] if (name != NAME && is.element(NAME, old_names)) [18:40:49.531] next [18:40:49.531] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:49.531] } [18:40:49.531] NAMES <- toupper(added) [18:40:49.531] for (kk in seq_along(NAMES)) { [18:40:49.531] name <- added[[kk]] [18:40:49.531] NAME <- NAMES[[kk]] [18:40:49.531] if (name != NAME && is.element(NAME, old_names)) [18:40:49.531] next [18:40:49.531] args[[name]] <- "" [18:40:49.531] } [18:40:49.531] NAMES <- toupper(removed) [18:40:49.531] for (kk in seq_along(NAMES)) { [18:40:49.531] name <- removed[[kk]] [18:40:49.531] NAME <- NAMES[[kk]] [18:40:49.531] if (name != NAME && is.element(NAME, old_names)) [18:40:49.531] next [18:40:49.531] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:49.531] } [18:40:49.531] if (length(args) > 0) [18:40:49.531] base::do.call(base::Sys.setenv, args = args) [18:40:49.531] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:40:49.531] } [18:40:49.531] else { [18:40:49.531] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:40:49.531] } [18:40:49.531] { [18:40:49.531] if (base::length(...future.futureOptionsAdded) > [18:40:49.531] 0L) { [18:40:49.531] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:40:49.531] base::names(opts) <- ...future.futureOptionsAdded [18:40:49.531] base::options(opts) [18:40:49.531] } [18:40:49.531] { [18:40:49.531] { [18:40:49.531] base::options(mc.cores = ...future.mc.cores.old) [18:40:49.531] NULL [18:40:49.531] } [18:40:49.531] options(future.plan = NULL) [18:40:49.531] if (is.na(NA_character_)) [18:40:49.531] Sys.unsetenv("R_FUTURE_PLAN") [18:40:49.531] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:40:49.531] future::plan(...future.strategy.old, .cleanup = FALSE, [18:40:49.531] .init = FALSE) [18:40:49.531] } [18:40:49.531] } [18:40:49.531] } [18:40:49.531] }) [18:40:49.531] if (TRUE) { [18:40:49.531] base::sink(type = "output", split = FALSE) [18:40:49.531] if (TRUE) { [18:40:49.531] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:40:49.531] } [18:40:49.531] else { [18:40:49.531] ...future.result["stdout"] <- base::list(NULL) [18:40:49.531] } [18:40:49.531] base::close(...future.stdout) [18:40:49.531] ...future.stdout <- NULL [18:40:49.531] } [18:40:49.531] ...future.result$conditions <- ...future.conditions [18:40:49.531] ...future.result$finished <- base::Sys.time() [18:40:49.531] ...future.result [18:40:49.531] } [18:40:49.536] Exporting 5 global objects (854 bytes) to cluster node #1 ... [18:40:49.536] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:40:49.537] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:40:49.537] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:40:49.537] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:40:49.537] Exporting '...future.elements_ii' (43 bytes) to cluster node #1 ... [18:40:49.538] Exporting '...future.elements_ii' (43 bytes) to cluster node #1 ... DONE [18:40:49.538] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:40:49.538] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:40:49.538] Exporting '...future.globals.maxSize' (39 bytes) to cluster node #1 ... [18:40:49.539] Exporting '...future.globals.maxSize' (39 bytes) to cluster node #1 ... DONE [18:40:49.539] Exporting 5 global objects (854 bytes) to cluster node #1 ... DONE [18:40:49.539] MultisessionFuture started [18:40:49.540] - Launch lazy future ... done [18:40:49.540] run() for 'MultisessionFuture' ... done [18:40:49.540] Created future: [18:40:49.555] receiveMessageFromWorker() for ClusterFuture ... [18:40:49.555] - Validating connection of MultisessionFuture [18:40:49.556] - received message: FutureResult [18:40:49.556] - Received FutureResult [18:40:49.556] - Erased future from FutureRegistry [18:40:49.556] result() for ClusterFuture ... [18:40:49.556] - result already collected: FutureResult [18:40:49.556] result() for ClusterFuture ... done [18:40:49.557] receiveMessageFromWorker() for ClusterFuture ... done [18:40:49.540] MultisessionFuture: [18:40:49.540] Label: 'future_apply-1' [18:40:49.540] Expression: [18:40:49.540] { [18:40:49.540] do.call(function(...) { [18:40:49.540] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:49.540] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:49.540] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:49.540] on.exit(options(oopts), add = TRUE) [18:40:49.540] } [18:40:49.540] { [18:40:49.540] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:49.540] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:49.540] ...future.FUN(...future.X_jj, ...) [18:40:49.540] }) [18:40:49.540] } [18:40:49.540] }, args = future.call.arguments) [18:40:49.540] } [18:40:49.540] Lazy evaluation: FALSE [18:40:49.540] Asynchronous evaluation: TRUE [18:40:49.540] Local evaluation: TRUE [18:40:49.540] Environment: R_GlobalEnv [18:40:49.540] Capture standard output: TRUE [18:40:49.540] Capture condition classes: 'condition' (excluding 'nothing') [18:40:49.540] Globals: 5 objects totaling 391 bytes (DotDotDotList 'future.call.arguments' of 97 bytes, function '...future.FUN' of 185 bytes, list '...future.elements_ii' of 43 bytes, NULL '...future.seeds_ii' of 27 bytes, numeric '...future.globals.maxSize' of 39 bytes) [18:40:49.540] Packages: [18:40:49.540] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:40:49.540] Resolved: TRUE [18:40:49.540] Value: [18:40:49.540] Conditions captured: [18:40:49.540] Early signaling: FALSE [18:40:49.540] Owner process: 2171382a-9202-bc7d-80d6-248e0cb487f4 [18:40:49.540] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:40:49.557] Chunk #1 of 2 ... DONE [18:40:49.557] Chunk #2 of 2 ... [18:40:49.557] - Adjusted option 'future.globals.maxSize': Inf -> 2 * Inf = Inf (bytes) [18:40:49.557] - seeds: [18:40:49.558] - All globals exported: [n=5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:49.558] getGlobalsAndPackages() ... [18:40:49.558] - globals passed as-is: [5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:49.558] Resolving globals: FALSE [18:40:49.558] Tweak future expression to call with '...' arguments ... [18:40:49.559] { [18:40:49.559] do.call(function(...) { [18:40:49.559] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:49.559] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:49.559] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:49.559] on.exit(options(oopts), add = TRUE) [18:40:49.559] } [18:40:49.559] { [18:40:49.559] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:49.559] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:49.559] ...future.FUN(...future.X_jj, ...) [18:40:49.559] }) [18:40:49.559] } [18:40:49.559] }, args = future.call.arguments) [18:40:49.559] } [18:40:49.559] Tweak future expression to call with '...' arguments ... DONE [18:40:49.559] - globals: [5] 'future.call.arguments', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:49.560] [18:40:49.560] getGlobalsAndPackages() ... DONE [18:40:49.560] run() for 'Future' ... [18:40:49.560] - state: 'created' [18:40:49.561] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:40:49.575] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:40:49.575] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:40:49.576] - Field: 'node' [18:40:49.576] - Field: 'label' [18:40:49.576] - Field: 'local' [18:40:49.576] - Field: 'owner' [18:40:49.576] - Field: 'envir' [18:40:49.576] - Field: 'workers' [18:40:49.577] - Field: 'packages' [18:40:49.577] - Field: 'gc' [18:40:49.577] - Field: 'conditions' [18:40:49.577] - Field: 'persistent' [18:40:49.577] - Field: 'expr' [18:40:49.578] - Field: 'uuid' [18:40:49.578] - Field: 'seed' [18:40:49.578] - Field: 'version' [18:40:49.578] - Field: 'result' [18:40:49.578] - Field: 'asynchronous' [18:40:49.578] - Field: 'calls' [18:40:49.579] - Field: 'globals' [18:40:49.579] - Field: 'stdout' [18:40:49.579] - Field: 'earlySignal' [18:40:49.579] - Field: 'lazy' [18:40:49.579] - Field: 'state' [18:40:49.579] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:40:49.580] - Launch lazy future ... [18:40:49.580] Packages needed by the future expression (n = 0): [18:40:49.580] Packages needed by future strategies (n = 0): [18:40:49.581] { [18:40:49.581] { [18:40:49.581] { [18:40:49.581] ...future.startTime <- base::Sys.time() [18:40:49.581] { [18:40:49.581] { [18:40:49.581] { [18:40:49.581] { [18:40:49.581] base::local({ [18:40:49.581] has_future <- base::requireNamespace("future", [18:40:49.581] quietly = TRUE) [18:40:49.581] if (has_future) { [18:40:49.581] ns <- base::getNamespace("future") [18:40:49.581] version <- ns[[".package"]][["version"]] [18:40:49.581] if (is.null(version)) [18:40:49.581] version <- utils::packageVersion("future") [18:40:49.581] } [18:40:49.581] else { [18:40:49.581] version <- NULL [18:40:49.581] } [18:40:49.581] if (!has_future || version < "1.8.0") { [18:40:49.581] info <- base::c(r_version = base::gsub("R version ", [18:40:49.581] "", base::R.version$version.string), [18:40:49.581] platform = base::sprintf("%s (%s-bit)", [18:40:49.581] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:40:49.581] os = base::paste(base::Sys.info()[base::c("sysname", [18:40:49.581] "release", "version")], collapse = " "), [18:40:49.581] hostname = base::Sys.info()[["nodename"]]) [18:40:49.581] info <- base::sprintf("%s: %s", base::names(info), [18:40:49.581] info) [18:40:49.581] info <- base::paste(info, collapse = "; ") [18:40:49.581] if (!has_future) { [18:40:49.581] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:40:49.581] info) [18:40:49.581] } [18:40:49.581] else { [18:40:49.581] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:40:49.581] info, version) [18:40:49.581] } [18:40:49.581] base::stop(msg) [18:40:49.581] } [18:40:49.581] }) [18:40:49.581] } [18:40:49.581] ...future.mc.cores.old <- base::getOption("mc.cores") [18:40:49.581] base::options(mc.cores = 1L) [18:40:49.581] } [18:40:49.581] ...future.strategy.old <- future::plan("list") [18:40:49.581] options(future.plan = NULL) [18:40:49.581] Sys.unsetenv("R_FUTURE_PLAN") [18:40:49.581] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:40:49.581] } [18:40:49.581] ...future.workdir <- getwd() [18:40:49.581] } [18:40:49.581] ...future.oldOptions <- base::as.list(base::.Options) [18:40:49.581] ...future.oldEnvVars <- base::Sys.getenv() [18:40:49.581] } [18:40:49.581] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:40:49.581] future.globals.maxSize = Inf, future.globals.method = NULL, [18:40:49.581] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:40:49.581] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:40:49.581] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:40:49.581] future.stdout.windows.reencode = NULL, width = 80L) [18:40:49.581] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:40:49.581] base::names(...future.oldOptions)) [18:40:49.581] } [18:40:49.581] if (FALSE) { [18:40:49.581] } [18:40:49.581] else { [18:40:49.581] if (TRUE) { [18:40:49.581] ...future.stdout <- base::rawConnection(base::raw(0L), [18:40:49.581] open = "w") [18:40:49.581] } [18:40:49.581] else { [18:40:49.581] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:40:49.581] windows = "NUL", "/dev/null"), open = "w") [18:40:49.581] } [18:40:49.581] base::sink(...future.stdout, type = "output", split = FALSE) [18:40:49.581] base::on.exit(if (!base::is.null(...future.stdout)) { [18:40:49.581] base::sink(type = "output", split = FALSE) [18:40:49.581] base::close(...future.stdout) [18:40:49.581] }, add = TRUE) [18:40:49.581] } [18:40:49.581] ...future.frame <- base::sys.nframe() [18:40:49.581] ...future.conditions <- base::list() [18:40:49.581] ...future.rng <- base::globalenv()$.Random.seed [18:40:49.581] if (FALSE) { [18:40:49.581] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:40:49.581] "...future.value", "...future.globalenv.names", ".Random.seed") [18:40:49.581] } [18:40:49.581] ...future.result <- base::tryCatch({ [18:40:49.581] base::withCallingHandlers({ [18:40:49.581] ...future.value <- base::withVisible(base::local({ [18:40:49.581] ...future.makeSendCondition <- base::local({ [18:40:49.581] sendCondition <- NULL [18:40:49.581] function(frame = 1L) { [18:40:49.581] if (is.function(sendCondition)) [18:40:49.581] return(sendCondition) [18:40:49.581] ns <- getNamespace("parallel") [18:40:49.581] if (exists("sendData", mode = "function", [18:40:49.581] envir = ns)) { [18:40:49.581] parallel_sendData <- get("sendData", mode = "function", [18:40:49.581] envir = ns) [18:40:49.581] envir <- sys.frame(frame) [18:40:49.581] master <- NULL [18:40:49.581] while (!identical(envir, .GlobalEnv) && [18:40:49.581] !identical(envir, emptyenv())) { [18:40:49.581] if (exists("master", mode = "list", envir = envir, [18:40:49.581] inherits = FALSE)) { [18:40:49.581] master <- get("master", mode = "list", [18:40:49.581] envir = envir, inherits = FALSE) [18:40:49.581] if (inherits(master, c("SOCKnode", [18:40:49.581] "SOCK0node"))) { [18:40:49.581] sendCondition <<- function(cond) { [18:40:49.581] data <- list(type = "VALUE", value = cond, [18:40:49.581] success = TRUE) [18:40:49.581] parallel_sendData(master, data) [18:40:49.581] } [18:40:49.581] return(sendCondition) [18:40:49.581] } [18:40:49.581] } [18:40:49.581] frame <- frame + 1L [18:40:49.581] envir <- sys.frame(frame) [18:40:49.581] } [18:40:49.581] } [18:40:49.581] sendCondition <<- function(cond) NULL [18:40:49.581] } [18:40:49.581] }) [18:40:49.581] withCallingHandlers({ [18:40:49.581] { [18:40:49.581] do.call(function(...) { [18:40:49.581] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:49.581] if (!identical(...future.globals.maxSize.org, [18:40:49.581] ...future.globals.maxSize)) { [18:40:49.581] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:49.581] on.exit(options(oopts), add = TRUE) [18:40:49.581] } [18:40:49.581] { [18:40:49.581] lapply(seq_along(...future.elements_ii), [18:40:49.581] FUN = function(jj) { [18:40:49.581] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:49.581] ...future.FUN(...future.X_jj, ...) [18:40:49.581] }) [18:40:49.581] } [18:40:49.581] }, args = future.call.arguments) [18:40:49.581] } [18:40:49.581] }, immediateCondition = function(cond) { [18:40:49.581] sendCondition <- ...future.makeSendCondition() [18:40:49.581] sendCondition(cond) [18:40:49.581] muffleCondition <- function (cond, pattern = "^muffle") [18:40:49.581] { [18:40:49.581] inherits <- base::inherits [18:40:49.581] invokeRestart <- base::invokeRestart [18:40:49.581] is.null <- base::is.null [18:40:49.581] muffled <- FALSE [18:40:49.581] if (inherits(cond, "message")) { [18:40:49.581] muffled <- grepl(pattern, "muffleMessage") [18:40:49.581] if (muffled) [18:40:49.581] invokeRestart("muffleMessage") [18:40:49.581] } [18:40:49.581] else if (inherits(cond, "warning")) { [18:40:49.581] muffled <- grepl(pattern, "muffleWarning") [18:40:49.581] if (muffled) [18:40:49.581] invokeRestart("muffleWarning") [18:40:49.581] } [18:40:49.581] else if (inherits(cond, "condition")) { [18:40:49.581] if (!is.null(pattern)) { [18:40:49.581] computeRestarts <- base::computeRestarts [18:40:49.581] grepl <- base::grepl [18:40:49.581] restarts <- computeRestarts(cond) [18:40:49.581] for (restart in restarts) { [18:40:49.581] name <- restart$name [18:40:49.581] if (is.null(name)) [18:40:49.581] next [18:40:49.581] if (!grepl(pattern, name)) [18:40:49.581] next [18:40:49.581] invokeRestart(restart) [18:40:49.581] muffled <- TRUE [18:40:49.581] break [18:40:49.581] } [18:40:49.581] } [18:40:49.581] } [18:40:49.581] invisible(muffled) [18:40:49.581] } [18:40:49.581] muffleCondition(cond) [18:40:49.581] }) [18:40:49.581] })) [18:40:49.581] future::FutureResult(value = ...future.value$value, [18:40:49.581] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:40:49.581] ...future.rng), globalenv = if (FALSE) [18:40:49.581] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:40:49.581] ...future.globalenv.names)) [18:40:49.581] else NULL, started = ...future.startTime, version = "1.8") [18:40:49.581] }, condition = base::local({ [18:40:49.581] c <- base::c [18:40:49.581] inherits <- base::inherits [18:40:49.581] invokeRestart <- base::invokeRestart [18:40:49.581] length <- base::length [18:40:49.581] list <- base::list [18:40:49.581] seq.int <- base::seq.int [18:40:49.581] signalCondition <- base::signalCondition [18:40:49.581] sys.calls <- base::sys.calls [18:40:49.581] `[[` <- base::`[[` [18:40:49.581] `+` <- base::`+` [18:40:49.581] `<<-` <- base::`<<-` [18:40:49.581] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:40:49.581] calls[seq.int(from = from + 12L, to = length(calls) - [18:40:49.581] 3L)] [18:40:49.581] } [18:40:49.581] function(cond) { [18:40:49.581] is_error <- inherits(cond, "error") [18:40:49.581] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:40:49.581] NULL) [18:40:49.581] if (is_error) { [18:40:49.581] sessionInformation <- function() { [18:40:49.581] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:40:49.581] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:40:49.581] search = base::search(), system = base::Sys.info()) [18:40:49.581] } [18:40:49.581] ...future.conditions[[length(...future.conditions) + [18:40:49.581] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:40:49.581] cond$call), session = sessionInformation(), [18:40:49.581] timestamp = base::Sys.time(), signaled = 0L) [18:40:49.581] signalCondition(cond) [18:40:49.581] } [18:40:49.581] else if (!ignore && TRUE && inherits(cond, c("condition", [18:40:49.581] "immediateCondition"))) { [18:40:49.581] signal <- TRUE && inherits(cond, "immediateCondition") [18:40:49.581] ...future.conditions[[length(...future.conditions) + [18:40:49.581] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:40:49.581] if (TRUE && !signal) { [18:40:49.581] muffleCondition <- function (cond, pattern = "^muffle") [18:40:49.581] { [18:40:49.581] inherits <- base::inherits [18:40:49.581] invokeRestart <- base::invokeRestart [18:40:49.581] is.null <- base::is.null [18:40:49.581] muffled <- FALSE [18:40:49.581] if (inherits(cond, "message")) { [18:40:49.581] muffled <- grepl(pattern, "muffleMessage") [18:40:49.581] if (muffled) [18:40:49.581] invokeRestart("muffleMessage") [18:40:49.581] } [18:40:49.581] else if (inherits(cond, "warning")) { [18:40:49.581] muffled <- grepl(pattern, "muffleWarning") [18:40:49.581] if (muffled) [18:40:49.581] invokeRestart("muffleWarning") [18:40:49.581] } [18:40:49.581] else if (inherits(cond, "condition")) { [18:40:49.581] if (!is.null(pattern)) { [18:40:49.581] computeRestarts <- base::computeRestarts [18:40:49.581] grepl <- base::grepl [18:40:49.581] restarts <- computeRestarts(cond) [18:40:49.581] for (restart in restarts) { [18:40:49.581] name <- restart$name [18:40:49.581] if (is.null(name)) [18:40:49.581] next [18:40:49.581] if (!grepl(pattern, name)) [18:40:49.581] next [18:40:49.581] invokeRestart(restart) [18:40:49.581] muffled <- TRUE [18:40:49.581] break [18:40:49.581] } [18:40:49.581] } [18:40:49.581] } [18:40:49.581] invisible(muffled) [18:40:49.581] } [18:40:49.581] muffleCondition(cond, pattern = "^muffle") [18:40:49.581] } [18:40:49.581] } [18:40:49.581] else { [18:40:49.581] if (TRUE) { [18:40:49.581] muffleCondition <- function (cond, pattern = "^muffle") [18:40:49.581] { [18:40:49.581] inherits <- base::inherits [18:40:49.581] invokeRestart <- base::invokeRestart [18:40:49.581] is.null <- base::is.null [18:40:49.581] muffled <- FALSE [18:40:49.581] if (inherits(cond, "message")) { [18:40:49.581] muffled <- grepl(pattern, "muffleMessage") [18:40:49.581] if (muffled) [18:40:49.581] invokeRestart("muffleMessage") [18:40:49.581] } [18:40:49.581] else if (inherits(cond, "warning")) { [18:40:49.581] muffled <- grepl(pattern, "muffleWarning") [18:40:49.581] if (muffled) [18:40:49.581] invokeRestart("muffleWarning") [18:40:49.581] } [18:40:49.581] else if (inherits(cond, "condition")) { [18:40:49.581] if (!is.null(pattern)) { [18:40:49.581] computeRestarts <- base::computeRestarts [18:40:49.581] grepl <- base::grepl [18:40:49.581] restarts <- computeRestarts(cond) [18:40:49.581] for (restart in restarts) { [18:40:49.581] name <- restart$name [18:40:49.581] if (is.null(name)) [18:40:49.581] next [18:40:49.581] if (!grepl(pattern, name)) [18:40:49.581] next [18:40:49.581] invokeRestart(restart) [18:40:49.581] muffled <- TRUE [18:40:49.581] break [18:40:49.581] } [18:40:49.581] } [18:40:49.581] } [18:40:49.581] invisible(muffled) [18:40:49.581] } [18:40:49.581] muffleCondition(cond, pattern = "^muffle") [18:40:49.581] } [18:40:49.581] } [18:40:49.581] } [18:40:49.581] })) [18:40:49.581] }, error = function(ex) { [18:40:49.581] base::structure(base::list(value = NULL, visible = NULL, [18:40:49.581] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:40:49.581] ...future.rng), started = ...future.startTime, [18:40:49.581] finished = Sys.time(), session_uuid = NA_character_, [18:40:49.581] version = "1.8"), class = "FutureResult") [18:40:49.581] }, finally = { [18:40:49.581] if (!identical(...future.workdir, getwd())) [18:40:49.581] setwd(...future.workdir) [18:40:49.581] { [18:40:49.581] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:40:49.581] ...future.oldOptions$nwarnings <- NULL [18:40:49.581] } [18:40:49.581] base::options(...future.oldOptions) [18:40:49.581] if (.Platform$OS.type == "windows") { [18:40:49.581] old_names <- names(...future.oldEnvVars) [18:40:49.581] envs <- base::Sys.getenv() [18:40:49.581] names <- names(envs) [18:40:49.581] common <- intersect(names, old_names) [18:40:49.581] added <- setdiff(names, old_names) [18:40:49.581] removed <- setdiff(old_names, names) [18:40:49.581] changed <- common[...future.oldEnvVars[common] != [18:40:49.581] envs[common]] [18:40:49.581] NAMES <- toupper(changed) [18:40:49.581] args <- list() [18:40:49.581] for (kk in seq_along(NAMES)) { [18:40:49.581] name <- changed[[kk]] [18:40:49.581] NAME <- NAMES[[kk]] [18:40:49.581] if (name != NAME && is.element(NAME, old_names)) [18:40:49.581] next [18:40:49.581] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:49.581] } [18:40:49.581] NAMES <- toupper(added) [18:40:49.581] for (kk in seq_along(NAMES)) { [18:40:49.581] name <- added[[kk]] [18:40:49.581] NAME <- NAMES[[kk]] [18:40:49.581] if (name != NAME && is.element(NAME, old_names)) [18:40:49.581] next [18:40:49.581] args[[name]] <- "" [18:40:49.581] } [18:40:49.581] NAMES <- toupper(removed) [18:40:49.581] for (kk in seq_along(NAMES)) { [18:40:49.581] name <- removed[[kk]] [18:40:49.581] NAME <- NAMES[[kk]] [18:40:49.581] if (name != NAME && is.element(NAME, old_names)) [18:40:49.581] next [18:40:49.581] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:49.581] } [18:40:49.581] if (length(args) > 0) [18:40:49.581] base::do.call(base::Sys.setenv, args = args) [18:40:49.581] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:40:49.581] } [18:40:49.581] else { [18:40:49.581] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:40:49.581] } [18:40:49.581] { [18:40:49.581] if (base::length(...future.futureOptionsAdded) > [18:40:49.581] 0L) { [18:40:49.581] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:40:49.581] base::names(opts) <- ...future.futureOptionsAdded [18:40:49.581] base::options(opts) [18:40:49.581] } [18:40:49.581] { [18:40:49.581] { [18:40:49.581] base::options(mc.cores = ...future.mc.cores.old) [18:40:49.581] NULL [18:40:49.581] } [18:40:49.581] options(future.plan = NULL) [18:40:49.581] if (is.na(NA_character_)) [18:40:49.581] Sys.unsetenv("R_FUTURE_PLAN") [18:40:49.581] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:40:49.581] future::plan(...future.strategy.old, .cleanup = FALSE, [18:40:49.581] .init = FALSE) [18:40:49.581] } [18:40:49.581] } [18:40:49.581] } [18:40:49.581] }) [18:40:49.581] if (TRUE) { [18:40:49.581] base::sink(type = "output", split = FALSE) [18:40:49.581] if (TRUE) { [18:40:49.581] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:40:49.581] } [18:40:49.581] else { [18:40:49.581] ...future.result["stdout"] <- base::list(NULL) [18:40:49.581] } [18:40:49.581] base::close(...future.stdout) [18:40:49.581] ...future.stdout <- NULL [18:40:49.581] } [18:40:49.581] ...future.result$conditions <- ...future.conditions [18:40:49.581] ...future.result$finished <- base::Sys.time() [18:40:49.581] ...future.result [18:40:49.581] } [18:40:49.586] Exporting 5 global objects (854 bytes) to cluster node #1 ... [18:40:49.586] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:40:49.586] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:40:49.587] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:40:49.587] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:40:49.587] Exporting '...future.elements_ii' (43 bytes) to cluster node #1 ... [18:40:49.588] Exporting '...future.elements_ii' (43 bytes) to cluster node #1 ... DONE [18:40:49.588] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:40:49.588] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:40:49.588] Exporting '...future.globals.maxSize' (39 bytes) to cluster node #1 ... [18:40:49.589] Exporting '...future.globals.maxSize' (39 bytes) to cluster node #1 ... DONE [18:40:49.589] Exporting 5 global objects (854 bytes) to cluster node #1 ... DONE [18:40:49.589] MultisessionFuture started [18:40:49.590] - Launch lazy future ... done [18:40:49.590] run() for 'MultisessionFuture' ... done [18:40:49.590] Created future: [18:40:49.603] receiveMessageFromWorker() for ClusterFuture ... [18:40:49.603] - Validating connection of MultisessionFuture [18:40:49.604] - received message: FutureResult [18:40:49.604] - Received FutureResult [18:40:49.604] - Erased future from FutureRegistry [18:40:49.604] result() for ClusterFuture ... [18:40:49.604] - result already collected: FutureResult [18:40:49.605] result() for ClusterFuture ... done [18:40:49.605] receiveMessageFromWorker() for ClusterFuture ... done [18:40:49.590] MultisessionFuture: [18:40:49.590] Label: 'future_apply-2' [18:40:49.590] Expression: [18:40:49.590] { [18:40:49.590] do.call(function(...) { [18:40:49.590] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:49.590] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:49.590] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:49.590] on.exit(options(oopts), add = TRUE) [18:40:49.590] } [18:40:49.590] { [18:40:49.590] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:49.590] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:49.590] ...future.FUN(...future.X_jj, ...) [18:40:49.590] }) [18:40:49.590] } [18:40:49.590] }, args = future.call.arguments) [18:40:49.590] } [18:40:49.590] Lazy evaluation: FALSE [18:40:49.590] Asynchronous evaluation: TRUE [18:40:49.590] Local evaluation: TRUE [18:40:49.590] Environment: R_GlobalEnv [18:40:49.590] Capture standard output: TRUE [18:40:49.590] Capture condition classes: 'condition' (excluding 'nothing') [18:40:49.590] Globals: 5 objects totaling 391 bytes (DotDotDotList 'future.call.arguments' of 97 bytes, function '...future.FUN' of 185 bytes, list '...future.elements_ii' of 43 bytes, NULL '...future.seeds_ii' of 27 bytes, numeric '...future.globals.maxSize' of 39 bytes) [18:40:49.590] Packages: [18:40:49.590] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:40:49.590] Resolved: TRUE [18:40:49.590] Value: [18:40:49.590] Conditions captured: [18:40:49.590] Early signaling: FALSE [18:40:49.590] Owner process: 2171382a-9202-bc7d-80d6-248e0cb487f4 [18:40:49.590] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:40:49.605] Chunk #2 of 2 ... DONE [18:40:49.605] Launching 2 futures (chunks) ... DONE [18:40:49.605] Resolving 2 futures (chunks) ... [18:40:49.606] resolve() on list ... [18:40:49.606] recursive: 0 [18:40:49.606] length: 2 [18:40:49.606] [18:40:49.606] Future #1 [18:40:49.606] result() for ClusterFuture ... [18:40:49.607] - result already collected: FutureResult [18:40:49.607] result() for ClusterFuture ... done [18:40:49.607] result() for ClusterFuture ... [18:40:49.607] - result already collected: FutureResult [18:40:49.607] result() for ClusterFuture ... done [18:40:49.607] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:40:49.608] - nx: 2 [18:40:49.608] - relay: TRUE [18:40:49.608] - stdout: TRUE [18:40:49.608] - signal: TRUE [18:40:49.608] - resignal: FALSE [18:40:49.608] - force: TRUE [18:40:49.608] - relayed: [n=2] FALSE, FALSE [18:40:49.609] - queued futures: [n=2] FALSE, FALSE [18:40:49.609] - until=1 [18:40:49.609] - relaying element #1 [18:40:49.609] result() for ClusterFuture ... [18:40:49.609] - result already collected: FutureResult [18:40:49.609] result() for ClusterFuture ... done [18:40:49.610] result() for ClusterFuture ... [18:40:49.610] - result already collected: FutureResult [18:40:49.610] result() for ClusterFuture ... done [18:40:49.610] result() for ClusterFuture ... [18:40:49.610] - result already collected: FutureResult [18:40:49.610] result() for ClusterFuture ... done [18:40:49.611] result() for ClusterFuture ... [18:40:49.611] - result already collected: FutureResult [18:40:49.611] result() for ClusterFuture ... done [18:40:49.611] - relayed: [n=2] TRUE, FALSE [18:40:49.611] - queued futures: [n=2] TRUE, FALSE [18:40:49.611] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:40:49.611] length: 1 (resolved future 1) [18:40:49.612] Future #2 [18:40:49.612] result() for ClusterFuture ... [18:40:49.612] - result already collected: FutureResult [18:40:49.612] result() for ClusterFuture ... done [18:40:49.612] result() for ClusterFuture ... [18:40:49.612] - result already collected: FutureResult [18:40:49.613] result() for ClusterFuture ... done [18:40:49.613] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:40:49.613] - nx: 2 [18:40:49.613] - relay: TRUE [18:40:49.613] - stdout: TRUE [18:40:49.613] - signal: TRUE [18:40:49.614] - resignal: FALSE [18:40:49.614] - force: TRUE [18:40:49.614] - relayed: [n=2] TRUE, FALSE [18:40:49.614] - queued futures: [n=2] TRUE, FALSE [18:40:49.614] - until=2 [18:40:49.614] - relaying element #2 [18:40:49.614] result() for ClusterFuture ... [18:40:49.615] - result already collected: FutureResult [18:40:49.615] result() for ClusterFuture ... done [18:40:49.615] result() for ClusterFuture ... [18:40:49.615] - result already collected: FutureResult [18:40:49.615] result() for ClusterFuture ... done [18:40:49.615] result() for ClusterFuture ... [18:40:49.616] - result already collected: FutureResult [18:40:49.616] result() for ClusterFuture ... done [18:40:49.616] result() for ClusterFuture ... [18:40:49.616] - result already collected: FutureResult [18:40:49.616] result() for ClusterFuture ... done [18:40:49.616] - relayed: [n=2] TRUE, TRUE [18:40:49.617] - queued futures: [n=2] TRUE, TRUE [18:40:49.617] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:40:49.617] length: 0 (resolved future 2) [18:40:49.617] Relaying remaining futures [18:40:49.617] signalConditionsASAP(NULL, pos=0) ... [18:40:49.617] - nx: 2 [18:40:49.617] - relay: TRUE [18:40:49.618] - stdout: TRUE [18:40:49.618] - signal: TRUE [18:40:49.618] - resignal: FALSE [18:40:49.618] - force: TRUE [18:40:49.618] - relayed: [n=2] TRUE, TRUE [18:40:49.618] - queued futures: [n=2] TRUE, TRUE - flush all [18:40:49.619] - relayed: [n=2] TRUE, TRUE [18:40:49.619] - queued futures: [n=2] TRUE, TRUE [18:40:49.619] signalConditionsASAP(NULL, pos=0) ... done [18:40:49.619] resolve() on list ... DONE [18:40:49.619] result() for ClusterFuture ... [18:40:49.619] - result already collected: FutureResult [18:40:49.620] result() for ClusterFuture ... done [18:40:49.620] result() for ClusterFuture ... [18:40:49.620] - result already collected: FutureResult [18:40:49.620] result() for ClusterFuture ... done [18:40:49.620] result() for ClusterFuture ... [18:40:49.620] - result already collected: FutureResult [18:40:49.620] result() for ClusterFuture ... done [18:40:49.621] result() for ClusterFuture ... [18:40:49.621] - result already collected: FutureResult [18:40:49.621] result() for ClusterFuture ... done [18:40:49.621] - Number of value chunks collected: 2 [18:40:49.621] Resolving 2 futures (chunks) ... DONE [18:40:49.621] Reducing values from 2 chunks ... [18:40:49.622] - Number of values collected after concatenation: 2 [18:40:49.622] - Number of values expected: 2 [18:40:49.622] Reducing values from 2 chunks ... DONE [18:40:49.622] future_lapply() ... DONE a b 1 2 - apply(X, ...) - dim(X) > 2 ... [18:40:49.622] getGlobalsAndPackagesXApply() ... [18:40:49.623] - future.globals: TRUE [18:40:49.623] getGlobalsAndPackages() ... [18:40:49.623] Searching for globals... [18:40:49.624] - globals found: [1] 'FUN' [18:40:49.624] Searching for globals ... DONE [18:40:49.625] Resolving globals: FALSE [18:40:49.625] The total size of the 1 globals is 185 bytes (185 bytes) [18:40:49.625] The total size of the 1 globals exported for future expression ('FUN(X = structure(1:12, dim = c(2L, 2L, 3L)))') 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:40:49.626] - globals: [1] 'FUN' [18:40:49.626] [18:40:49.626] getGlobalsAndPackages() ... DONE [18:40:49.626] - globals found/used: [n=1] 'FUN' [18:40:49.626] - needed namespaces: [n=0] [18:40:49.626] Finding globals ... DONE [18:40:49.627] - use_args: TRUE [18:40:49.627] - Getting '...' globals ... [18:40:49.627] resolve() on list ... [18:40:49.627] recursive: 0 [18:40:49.627] length: 1 [18:40:49.628] elements: '...' [18:40:49.628] length: 0 (resolved future 1) [18:40:49.628] resolve() on list ... DONE [18:40:49.628] - '...' content: [n=0] [18:40:49.628] List of 1 [18:40:49.628] $ ...: list() [18:40:49.628] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:49.628] - attr(*, "where")=List of 1 [18:40:49.628] ..$ ...: [18:40:49.628] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:49.628] - attr(*, "resolved")= logi TRUE [18:40:49.628] - attr(*, "total_size")= num NA [18:40:49.631] - Getting '...' globals ... DONE [18:40:49.631] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:40:49.632] List of 2 [18:40:49.632] $ ...future.FUN:function (x) [18:40:49.632] $ ... : list() [18:40:49.632] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:49.632] - attr(*, "where")=List of 2 [18:40:49.632] ..$ ...future.FUN: [18:40:49.632] ..$ ... : [18:40:49.632] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:49.632] - attr(*, "resolved")= logi FALSE [18:40:49.632] - attr(*, "total_size")= int 2274 [18:40:49.635] Packages to be attached in all futures: [n=0] [18:40:49.635] getGlobalsAndPackagesXApply() ... DONE [18:40:49.637] future_lapply() ... [18:40:49.640] Number of chunks: 2 [18:40:49.641] getGlobalsAndPackagesXApply() ... [18:40:49.641] - future.globals: with names 'list()' [18:40:49.641] - use_args: TRUE [18:40:49.641] Globals to be used in all futures (chunks): [n=2] '...', '...future.FUN' [18:40:49.641] List of 2 [18:40:49.641] $ ... : list() [18:40:49.641] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:49.641] $ ...future.FUN:function (x) [18:40:49.641] - attr(*, "where")=List of 2 [18:40:49.641] ..$ ... : [18:40:49.641] ..$ ...future.FUN: [18:40:49.641] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:49.641] - attr(*, "resolved")= logi FALSE [18:40:49.641] - attr(*, "total_size")= num NA [18:40:49.647] Packages to be attached in all futures: [n=0] [18:40:49.648] getGlobalsAndPackagesXApply() ... DONE [18:40:49.648] Number of futures (= number of chunks): 2 [18:40:49.648] Launching 2 futures (chunks) ... [18:40:49.648] Chunk #1 of 2 ... [18:40:49.648] - Adjusted option 'future.globals.maxSize': Inf -> 2 * Inf = Inf (bytes) [18:40:49.649] - seeds: [18:40:49.649] - All globals exported: [n=5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:49.649] getGlobalsAndPackages() ... [18:40:49.649] - globals passed as-is: [5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:49.649] Resolving globals: FALSE [18:40:49.649] Tweak future expression to call with '...' arguments ... [18:40:49.650] { [18:40:49.650] do.call(function(...) { [18:40:49.650] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:49.650] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:49.650] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:49.650] on.exit(options(oopts), add = TRUE) [18:40:49.650] } [18:40:49.650] { [18:40:49.650] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:49.650] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:49.650] ...future.FUN(...future.X_jj, ...) [18:40:49.650] }) [18:40:49.650] } [18:40:49.650] }, args = future.call.arguments) [18:40:49.650] } [18:40:49.650] Tweak future expression to call with '...' arguments ... DONE [18:40:49.651] - globals: [5] 'future.call.arguments', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:49.651] [18:40:49.651] getGlobalsAndPackages() ... DONE [18:40:49.651] run() for 'Future' ... [18:40:49.652] - state: 'created' [18:40:49.652] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:40:49.667] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:40:49.667] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:40:49.667] - Field: 'node' [18:40:49.667] - Field: 'label' [18:40:49.667] - Field: 'local' [18:40:49.668] - Field: 'owner' [18:40:49.668] - Field: 'envir' [18:40:49.668] - Field: 'workers' [18:40:49.668] - Field: 'packages' [18:40:49.668] - Field: 'gc' [18:40:49.669] - Field: 'conditions' [18:40:49.669] - Field: 'persistent' [18:40:49.669] - Field: 'expr' [18:40:49.669] - Field: 'uuid' [18:40:49.669] - Field: 'seed' [18:40:49.669] - Field: 'version' [18:40:49.670] - Field: 'result' [18:40:49.670] - Field: 'asynchronous' [18:40:49.670] - Field: 'calls' [18:40:49.670] - Field: 'globals' [18:40:49.670] - Field: 'stdout' [18:40:49.670] - Field: 'earlySignal' [18:40:49.671] - Field: 'lazy' [18:40:49.671] - Field: 'state' [18:40:49.671] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:40:49.671] - Launch lazy future ... [18:40:49.672] Packages needed by the future expression (n = 0): [18:40:49.672] Packages needed by future strategies (n = 0): [18:40:49.672] { [18:40:49.672] { [18:40:49.672] { [18:40:49.672] ...future.startTime <- base::Sys.time() [18:40:49.672] { [18:40:49.672] { [18:40:49.672] { [18:40:49.672] { [18:40:49.672] base::local({ [18:40:49.672] has_future <- base::requireNamespace("future", [18:40:49.672] quietly = TRUE) [18:40:49.672] if (has_future) { [18:40:49.672] ns <- base::getNamespace("future") [18:40:49.672] version <- ns[[".package"]][["version"]] [18:40:49.672] if (is.null(version)) [18:40:49.672] version <- utils::packageVersion("future") [18:40:49.672] } [18:40:49.672] else { [18:40:49.672] version <- NULL [18:40:49.672] } [18:40:49.672] if (!has_future || version < "1.8.0") { [18:40:49.672] info <- base::c(r_version = base::gsub("R version ", [18:40:49.672] "", base::R.version$version.string), [18:40:49.672] platform = base::sprintf("%s (%s-bit)", [18:40:49.672] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:40:49.672] os = base::paste(base::Sys.info()[base::c("sysname", [18:40:49.672] "release", "version")], collapse = " "), [18:40:49.672] hostname = base::Sys.info()[["nodename"]]) [18:40:49.672] info <- base::sprintf("%s: %s", base::names(info), [18:40:49.672] info) [18:40:49.672] info <- base::paste(info, collapse = "; ") [18:40:49.672] if (!has_future) { [18:40:49.672] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:40:49.672] info) [18:40:49.672] } [18:40:49.672] else { [18:40:49.672] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:40:49.672] info, version) [18:40:49.672] } [18:40:49.672] base::stop(msg) [18:40:49.672] } [18:40:49.672] }) [18:40:49.672] } [18:40:49.672] ...future.mc.cores.old <- base::getOption("mc.cores") [18:40:49.672] base::options(mc.cores = 1L) [18:40:49.672] } [18:40:49.672] ...future.strategy.old <- future::plan("list") [18:40:49.672] options(future.plan = NULL) [18:40:49.672] Sys.unsetenv("R_FUTURE_PLAN") [18:40:49.672] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:40:49.672] } [18:40:49.672] ...future.workdir <- getwd() [18:40:49.672] } [18:40:49.672] ...future.oldOptions <- base::as.list(base::.Options) [18:40:49.672] ...future.oldEnvVars <- base::Sys.getenv() [18:40:49.672] } [18:40:49.672] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:40:49.672] future.globals.maxSize = Inf, future.globals.method = NULL, [18:40:49.672] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:40:49.672] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:40:49.672] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:40:49.672] future.stdout.windows.reencode = NULL, width = 80L) [18:40:49.672] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:40:49.672] base::names(...future.oldOptions)) [18:40:49.672] } [18:40:49.672] if (FALSE) { [18:40:49.672] } [18:40:49.672] else { [18:40:49.672] if (TRUE) { [18:40:49.672] ...future.stdout <- base::rawConnection(base::raw(0L), [18:40:49.672] open = "w") [18:40:49.672] } [18:40:49.672] else { [18:40:49.672] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:40:49.672] windows = "NUL", "/dev/null"), open = "w") [18:40:49.672] } [18:40:49.672] base::sink(...future.stdout, type = "output", split = FALSE) [18:40:49.672] base::on.exit(if (!base::is.null(...future.stdout)) { [18:40:49.672] base::sink(type = "output", split = FALSE) [18:40:49.672] base::close(...future.stdout) [18:40:49.672] }, add = TRUE) [18:40:49.672] } [18:40:49.672] ...future.frame <- base::sys.nframe() [18:40:49.672] ...future.conditions <- base::list() [18:40:49.672] ...future.rng <- base::globalenv()$.Random.seed [18:40:49.672] if (FALSE) { [18:40:49.672] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:40:49.672] "...future.value", "...future.globalenv.names", ".Random.seed") [18:40:49.672] } [18:40:49.672] ...future.result <- base::tryCatch({ [18:40:49.672] base::withCallingHandlers({ [18:40:49.672] ...future.value <- base::withVisible(base::local({ [18:40:49.672] ...future.makeSendCondition <- base::local({ [18:40:49.672] sendCondition <- NULL [18:40:49.672] function(frame = 1L) { [18:40:49.672] if (is.function(sendCondition)) [18:40:49.672] return(sendCondition) [18:40:49.672] ns <- getNamespace("parallel") [18:40:49.672] if (exists("sendData", mode = "function", [18:40:49.672] envir = ns)) { [18:40:49.672] parallel_sendData <- get("sendData", mode = "function", [18:40:49.672] envir = ns) [18:40:49.672] envir <- sys.frame(frame) [18:40:49.672] master <- NULL [18:40:49.672] while (!identical(envir, .GlobalEnv) && [18:40:49.672] !identical(envir, emptyenv())) { [18:40:49.672] if (exists("master", mode = "list", envir = envir, [18:40:49.672] inherits = FALSE)) { [18:40:49.672] master <- get("master", mode = "list", [18:40:49.672] envir = envir, inherits = FALSE) [18:40:49.672] if (inherits(master, c("SOCKnode", [18:40:49.672] "SOCK0node"))) { [18:40:49.672] sendCondition <<- function(cond) { [18:40:49.672] data <- list(type = "VALUE", value = cond, [18:40:49.672] success = TRUE) [18:40:49.672] parallel_sendData(master, data) [18:40:49.672] } [18:40:49.672] return(sendCondition) [18:40:49.672] } [18:40:49.672] } [18:40:49.672] frame <- frame + 1L [18:40:49.672] envir <- sys.frame(frame) [18:40:49.672] } [18:40:49.672] } [18:40:49.672] sendCondition <<- function(cond) NULL [18:40:49.672] } [18:40:49.672] }) [18:40:49.672] withCallingHandlers({ [18:40:49.672] { [18:40:49.672] do.call(function(...) { [18:40:49.672] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:49.672] if (!identical(...future.globals.maxSize.org, [18:40:49.672] ...future.globals.maxSize)) { [18:40:49.672] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:49.672] on.exit(options(oopts), add = TRUE) [18:40:49.672] } [18:40:49.672] { [18:40:49.672] lapply(seq_along(...future.elements_ii), [18:40:49.672] FUN = function(jj) { [18:40:49.672] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:49.672] ...future.FUN(...future.X_jj, ...) [18:40:49.672] }) [18:40:49.672] } [18:40:49.672] }, args = future.call.arguments) [18:40:49.672] } [18:40:49.672] }, immediateCondition = function(cond) { [18:40:49.672] sendCondition <- ...future.makeSendCondition() [18:40:49.672] sendCondition(cond) [18:40:49.672] muffleCondition <- function (cond, pattern = "^muffle") [18:40:49.672] { [18:40:49.672] inherits <- base::inherits [18:40:49.672] invokeRestart <- base::invokeRestart [18:40:49.672] is.null <- base::is.null [18:40:49.672] muffled <- FALSE [18:40:49.672] if (inherits(cond, "message")) { [18:40:49.672] muffled <- grepl(pattern, "muffleMessage") [18:40:49.672] if (muffled) [18:40:49.672] invokeRestart("muffleMessage") [18:40:49.672] } [18:40:49.672] else if (inherits(cond, "warning")) { [18:40:49.672] muffled <- grepl(pattern, "muffleWarning") [18:40:49.672] if (muffled) [18:40:49.672] invokeRestart("muffleWarning") [18:40:49.672] } [18:40:49.672] else if (inherits(cond, "condition")) { [18:40:49.672] if (!is.null(pattern)) { [18:40:49.672] computeRestarts <- base::computeRestarts [18:40:49.672] grepl <- base::grepl [18:40:49.672] restarts <- computeRestarts(cond) [18:40:49.672] for (restart in restarts) { [18:40:49.672] name <- restart$name [18:40:49.672] if (is.null(name)) [18:40:49.672] next [18:40:49.672] if (!grepl(pattern, name)) [18:40:49.672] next [18:40:49.672] invokeRestart(restart) [18:40:49.672] muffled <- TRUE [18:40:49.672] break [18:40:49.672] } [18:40:49.672] } [18:40:49.672] } [18:40:49.672] invisible(muffled) [18:40:49.672] } [18:40:49.672] muffleCondition(cond) [18:40:49.672] }) [18:40:49.672] })) [18:40:49.672] future::FutureResult(value = ...future.value$value, [18:40:49.672] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:40:49.672] ...future.rng), globalenv = if (FALSE) [18:40:49.672] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:40:49.672] ...future.globalenv.names)) [18:40:49.672] else NULL, started = ...future.startTime, version = "1.8") [18:40:49.672] }, condition = base::local({ [18:40:49.672] c <- base::c [18:40:49.672] inherits <- base::inherits [18:40:49.672] invokeRestart <- base::invokeRestart [18:40:49.672] length <- base::length [18:40:49.672] list <- base::list [18:40:49.672] seq.int <- base::seq.int [18:40:49.672] signalCondition <- base::signalCondition [18:40:49.672] sys.calls <- base::sys.calls [18:40:49.672] `[[` <- base::`[[` [18:40:49.672] `+` <- base::`+` [18:40:49.672] `<<-` <- base::`<<-` [18:40:49.672] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:40:49.672] calls[seq.int(from = from + 12L, to = length(calls) - [18:40:49.672] 3L)] [18:40:49.672] } [18:40:49.672] function(cond) { [18:40:49.672] is_error <- inherits(cond, "error") [18:40:49.672] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:40:49.672] NULL) [18:40:49.672] if (is_error) { [18:40:49.672] sessionInformation <- function() { [18:40:49.672] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:40:49.672] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:40:49.672] search = base::search(), system = base::Sys.info()) [18:40:49.672] } [18:40:49.672] ...future.conditions[[length(...future.conditions) + [18:40:49.672] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:40:49.672] cond$call), session = sessionInformation(), [18:40:49.672] timestamp = base::Sys.time(), signaled = 0L) [18:40:49.672] signalCondition(cond) [18:40:49.672] } [18:40:49.672] else if (!ignore && TRUE && inherits(cond, c("condition", [18:40:49.672] "immediateCondition"))) { [18:40:49.672] signal <- TRUE && inherits(cond, "immediateCondition") [18:40:49.672] ...future.conditions[[length(...future.conditions) + [18:40:49.672] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:40:49.672] if (TRUE && !signal) { [18:40:49.672] muffleCondition <- function (cond, pattern = "^muffle") [18:40:49.672] { [18:40:49.672] inherits <- base::inherits [18:40:49.672] invokeRestart <- base::invokeRestart [18:40:49.672] is.null <- base::is.null [18:40:49.672] muffled <- FALSE [18:40:49.672] if (inherits(cond, "message")) { [18:40:49.672] muffled <- grepl(pattern, "muffleMessage") [18:40:49.672] if (muffled) [18:40:49.672] invokeRestart("muffleMessage") [18:40:49.672] } [18:40:49.672] else if (inherits(cond, "warning")) { [18:40:49.672] muffled <- grepl(pattern, "muffleWarning") [18:40:49.672] if (muffled) [18:40:49.672] invokeRestart("muffleWarning") [18:40:49.672] } [18:40:49.672] else if (inherits(cond, "condition")) { [18:40:49.672] if (!is.null(pattern)) { [18:40:49.672] computeRestarts <- base::computeRestarts [18:40:49.672] grepl <- base::grepl [18:40:49.672] restarts <- computeRestarts(cond) [18:40:49.672] for (restart in restarts) { [18:40:49.672] name <- restart$name [18:40:49.672] if (is.null(name)) [18:40:49.672] next [18:40:49.672] if (!grepl(pattern, name)) [18:40:49.672] next [18:40:49.672] invokeRestart(restart) [18:40:49.672] muffled <- TRUE [18:40:49.672] break [18:40:49.672] } [18:40:49.672] } [18:40:49.672] } [18:40:49.672] invisible(muffled) [18:40:49.672] } [18:40:49.672] muffleCondition(cond, pattern = "^muffle") [18:40:49.672] } [18:40:49.672] } [18:40:49.672] else { [18:40:49.672] if (TRUE) { [18:40:49.672] muffleCondition <- function (cond, pattern = "^muffle") [18:40:49.672] { [18:40:49.672] inherits <- base::inherits [18:40:49.672] invokeRestart <- base::invokeRestart [18:40:49.672] is.null <- base::is.null [18:40:49.672] muffled <- FALSE [18:40:49.672] if (inherits(cond, "message")) { [18:40:49.672] muffled <- grepl(pattern, "muffleMessage") [18:40:49.672] if (muffled) [18:40:49.672] invokeRestart("muffleMessage") [18:40:49.672] } [18:40:49.672] else if (inherits(cond, "warning")) { [18:40:49.672] muffled <- grepl(pattern, "muffleWarning") [18:40:49.672] if (muffled) [18:40:49.672] invokeRestart("muffleWarning") [18:40:49.672] } [18:40:49.672] else if (inherits(cond, "condition")) { [18:40:49.672] if (!is.null(pattern)) { [18:40:49.672] computeRestarts <- base::computeRestarts [18:40:49.672] grepl <- base::grepl [18:40:49.672] restarts <- computeRestarts(cond) [18:40:49.672] for (restart in restarts) { [18:40:49.672] name <- restart$name [18:40:49.672] if (is.null(name)) [18:40:49.672] next [18:40:49.672] if (!grepl(pattern, name)) [18:40:49.672] next [18:40:49.672] invokeRestart(restart) [18:40:49.672] muffled <- TRUE [18:40:49.672] break [18:40:49.672] } [18:40:49.672] } [18:40:49.672] } [18:40:49.672] invisible(muffled) [18:40:49.672] } [18:40:49.672] muffleCondition(cond, pattern = "^muffle") [18:40:49.672] } [18:40:49.672] } [18:40:49.672] } [18:40:49.672] })) [18:40:49.672] }, error = function(ex) { [18:40:49.672] base::structure(base::list(value = NULL, visible = NULL, [18:40:49.672] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:40:49.672] ...future.rng), started = ...future.startTime, [18:40:49.672] finished = Sys.time(), session_uuid = NA_character_, [18:40:49.672] version = "1.8"), class = "FutureResult") [18:40:49.672] }, finally = { [18:40:49.672] if (!identical(...future.workdir, getwd())) [18:40:49.672] setwd(...future.workdir) [18:40:49.672] { [18:40:49.672] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:40:49.672] ...future.oldOptions$nwarnings <- NULL [18:40:49.672] } [18:40:49.672] base::options(...future.oldOptions) [18:40:49.672] if (.Platform$OS.type == "windows") { [18:40:49.672] old_names <- names(...future.oldEnvVars) [18:40:49.672] envs <- base::Sys.getenv() [18:40:49.672] names <- names(envs) [18:40:49.672] common <- intersect(names, old_names) [18:40:49.672] added <- setdiff(names, old_names) [18:40:49.672] removed <- setdiff(old_names, names) [18:40:49.672] changed <- common[...future.oldEnvVars[common] != [18:40:49.672] envs[common]] [18:40:49.672] NAMES <- toupper(changed) [18:40:49.672] args <- list() [18:40:49.672] for (kk in seq_along(NAMES)) { [18:40:49.672] name <- changed[[kk]] [18:40:49.672] NAME <- NAMES[[kk]] [18:40:49.672] if (name != NAME && is.element(NAME, old_names)) [18:40:49.672] next [18:40:49.672] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:49.672] } [18:40:49.672] NAMES <- toupper(added) [18:40:49.672] for (kk in seq_along(NAMES)) { [18:40:49.672] name <- added[[kk]] [18:40:49.672] NAME <- NAMES[[kk]] [18:40:49.672] if (name != NAME && is.element(NAME, old_names)) [18:40:49.672] next [18:40:49.672] args[[name]] <- "" [18:40:49.672] } [18:40:49.672] NAMES <- toupper(removed) [18:40:49.672] for (kk in seq_along(NAMES)) { [18:40:49.672] name <- removed[[kk]] [18:40:49.672] NAME <- NAMES[[kk]] [18:40:49.672] if (name != NAME && is.element(NAME, old_names)) [18:40:49.672] next [18:40:49.672] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:49.672] } [18:40:49.672] if (length(args) > 0) [18:40:49.672] base::do.call(base::Sys.setenv, args = args) [18:40:49.672] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:40:49.672] } [18:40:49.672] else { [18:40:49.672] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:40:49.672] } [18:40:49.672] { [18:40:49.672] if (base::length(...future.futureOptionsAdded) > [18:40:49.672] 0L) { [18:40:49.672] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:40:49.672] base::names(opts) <- ...future.futureOptionsAdded [18:40:49.672] base::options(opts) [18:40:49.672] } [18:40:49.672] { [18:40:49.672] { [18:40:49.672] base::options(mc.cores = ...future.mc.cores.old) [18:40:49.672] NULL [18:40:49.672] } [18:40:49.672] options(future.plan = NULL) [18:40:49.672] if (is.na(NA_character_)) [18:40:49.672] Sys.unsetenv("R_FUTURE_PLAN") [18:40:49.672] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:40:49.672] future::plan(...future.strategy.old, .cleanup = FALSE, [18:40:49.672] .init = FALSE) [18:40:49.672] } [18:40:49.672] } [18:40:49.672] } [18:40:49.672] }) [18:40:49.672] if (TRUE) { [18:40:49.672] base::sink(type = "output", split = FALSE) [18:40:49.672] if (TRUE) { [18:40:49.672] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:40:49.672] } [18:40:49.672] else { [18:40:49.672] ...future.result["stdout"] <- base::list(NULL) [18:40:49.672] } [18:40:49.672] base::close(...future.stdout) [18:40:49.672] ...future.stdout <- NULL [18:40:49.672] } [18:40:49.672] ...future.result$conditions <- ...future.conditions [18:40:49.672] ...future.result$finished <- base::Sys.time() [18:40:49.672] ...future.result [18:40:49.672] } [18:40:49.678] Exporting 5 global objects (913 bytes) to cluster node #1 ... [18:40:49.678] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:40:49.678] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:40:49.679] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:40:49.679] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:40:49.679] Exporting '...future.elements_ii' (102 bytes) to cluster node #1 ... [18:40:49.680] Exporting '...future.elements_ii' (102 bytes) to cluster node #1 ... DONE [18:40:49.680] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:40:49.680] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:40:49.680] Exporting '...future.globals.maxSize' (39 bytes) to cluster node #1 ... [18:40:49.681] Exporting '...future.globals.maxSize' (39 bytes) to cluster node #1 ... DONE [18:40:49.681] Exporting 5 global objects (913 bytes) to cluster node #1 ... DONE [18:40:49.681] MultisessionFuture started [18:40:49.682] - Launch lazy future ... done [18:40:49.682] run() for 'MultisessionFuture' ... done [18:40:49.682] Created future: [18:40:49.697] receiveMessageFromWorker() for ClusterFuture ... [18:40:49.697] - Validating connection of MultisessionFuture [18:40:49.697] - received message: FutureResult [18:40:49.698] - Received FutureResult [18:40:49.698] - Erased future from FutureRegistry [18:40:49.698] result() for ClusterFuture ... [18:40:49.698] - result already collected: FutureResult [18:40:49.698] result() for ClusterFuture ... done [18:40:49.698] receiveMessageFromWorker() for ClusterFuture ... done [18:40:49.682] MultisessionFuture: [18:40:49.682] Label: 'future_apply-1' [18:40:49.682] Expression: [18:40:49.682] { [18:40:49.682] do.call(function(...) { [18:40:49.682] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:49.682] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:49.682] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:49.682] on.exit(options(oopts), add = TRUE) [18:40:49.682] } [18:40:49.682] { [18:40:49.682] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:49.682] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:49.682] ...future.FUN(...future.X_jj, ...) [18:40:49.682] }) [18:40:49.682] } [18:40:49.682] }, args = future.call.arguments) [18:40:49.682] } [18:40:49.682] Lazy evaluation: FALSE [18:40:49.682] Asynchronous evaluation: TRUE [18:40:49.682] Local evaluation: TRUE [18:40:49.682] Environment: R_GlobalEnv [18:40:49.682] Capture standard output: TRUE [18:40:49.682] Capture condition classes: 'condition' (excluding 'nothing') [18:40:49.682] Globals: 5 objects totaling 450 bytes (DotDotDotList 'future.call.arguments' of 97 bytes, function '...future.FUN' of 185 bytes, list '...future.elements_ii' of 102 bytes, NULL '...future.seeds_ii' of 27 bytes, numeric '...future.globals.maxSize' of 39 bytes) [18:40:49.682] Packages: [18:40:49.682] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:40:49.682] Resolved: TRUE [18:40:49.682] Value: [18:40:49.682] Conditions captured: [18:40:49.682] Early signaling: FALSE [18:40:49.682] Owner process: 2171382a-9202-bc7d-80d6-248e0cb487f4 [18:40:49.682] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:40:49.699] Chunk #1 of 2 ... DONE [18:40:49.699] Chunk #2 of 2 ... [18:40:49.699] - Adjusted option 'future.globals.maxSize': Inf -> 2 * Inf = Inf (bytes) [18:40:49.699] - seeds: [18:40:49.700] - All globals exported: [n=5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:49.700] getGlobalsAndPackages() ... [18:40:49.700] - globals passed as-is: [5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:49.700] Resolving globals: FALSE [18:40:49.700] Tweak future expression to call with '...' arguments ... [18:40:49.700] { [18:40:49.700] do.call(function(...) { [18:40:49.700] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:49.700] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:49.700] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:49.700] on.exit(options(oopts), add = TRUE) [18:40:49.700] } [18:40:49.700] { [18:40:49.700] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:49.700] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:49.700] ...future.FUN(...future.X_jj, ...) [18:40:49.700] }) [18:40:49.700] } [18:40:49.700] }, args = future.call.arguments) [18:40:49.700] } [18:40:49.701] Tweak future expression to call with '...' arguments ... DONE [18:40:49.701] - globals: [5] 'future.call.arguments', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:49.702] [18:40:49.702] getGlobalsAndPackages() ... DONE [18:40:49.702] run() for 'Future' ... [18:40:49.702] - state: 'created' [18:40:49.703] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:40:49.717] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:40:49.718] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:40:49.718] - Field: 'node' [18:40:49.718] - Field: 'label' [18:40:49.718] - Field: 'local' [18:40:49.718] - Field: 'owner' [18:40:49.719] - Field: 'envir' [18:40:49.719] - Field: 'workers' [18:40:49.719] - Field: 'packages' [18:40:49.719] - Field: 'gc' [18:40:49.719] - Field: 'conditions' [18:40:49.719] - Field: 'persistent' [18:40:49.720] - Field: 'expr' [18:40:49.720] - Field: 'uuid' [18:40:49.720] - Field: 'seed' [18:40:49.720] - Field: 'version' [18:40:49.720] - Field: 'result' [18:40:49.720] - Field: 'asynchronous' [18:40:49.721] - Field: 'calls' [18:40:49.721] - Field: 'globals' [18:40:49.721] - Field: 'stdout' [18:40:49.721] - Field: 'earlySignal' [18:40:49.721] - Field: 'lazy' [18:40:49.722] - Field: 'state' [18:40:49.722] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:40:49.722] - Launch lazy future ... [18:40:49.722] Packages needed by the future expression (n = 0): [18:40:49.722] Packages needed by future strategies (n = 0): [18:40:49.723] { [18:40:49.723] { [18:40:49.723] { [18:40:49.723] ...future.startTime <- base::Sys.time() [18:40:49.723] { [18:40:49.723] { [18:40:49.723] { [18:40:49.723] { [18:40:49.723] base::local({ [18:40:49.723] has_future <- base::requireNamespace("future", [18:40:49.723] quietly = TRUE) [18:40:49.723] if (has_future) { [18:40:49.723] ns <- base::getNamespace("future") [18:40:49.723] version <- ns[[".package"]][["version"]] [18:40:49.723] if (is.null(version)) [18:40:49.723] version <- utils::packageVersion("future") [18:40:49.723] } [18:40:49.723] else { [18:40:49.723] version <- NULL [18:40:49.723] } [18:40:49.723] if (!has_future || version < "1.8.0") { [18:40:49.723] info <- base::c(r_version = base::gsub("R version ", [18:40:49.723] "", base::R.version$version.string), [18:40:49.723] platform = base::sprintf("%s (%s-bit)", [18:40:49.723] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:40:49.723] os = base::paste(base::Sys.info()[base::c("sysname", [18:40:49.723] "release", "version")], collapse = " "), [18:40:49.723] hostname = base::Sys.info()[["nodename"]]) [18:40:49.723] info <- base::sprintf("%s: %s", base::names(info), [18:40:49.723] info) [18:40:49.723] info <- base::paste(info, collapse = "; ") [18:40:49.723] if (!has_future) { [18:40:49.723] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:40:49.723] info) [18:40:49.723] } [18:40:49.723] else { [18:40:49.723] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:40:49.723] info, version) [18:40:49.723] } [18:40:49.723] base::stop(msg) [18:40:49.723] } [18:40:49.723] }) [18:40:49.723] } [18:40:49.723] ...future.mc.cores.old <- base::getOption("mc.cores") [18:40:49.723] base::options(mc.cores = 1L) [18:40:49.723] } [18:40:49.723] ...future.strategy.old <- future::plan("list") [18:40:49.723] options(future.plan = NULL) [18:40:49.723] Sys.unsetenv("R_FUTURE_PLAN") [18:40:49.723] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:40:49.723] } [18:40:49.723] ...future.workdir <- getwd() [18:40:49.723] } [18:40:49.723] ...future.oldOptions <- base::as.list(base::.Options) [18:40:49.723] ...future.oldEnvVars <- base::Sys.getenv() [18:40:49.723] } [18:40:49.723] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:40:49.723] future.globals.maxSize = Inf, future.globals.method = NULL, [18:40:49.723] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:40:49.723] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:40:49.723] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:40:49.723] future.stdout.windows.reencode = NULL, width = 80L) [18:40:49.723] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:40:49.723] base::names(...future.oldOptions)) [18:40:49.723] } [18:40:49.723] if (FALSE) { [18:40:49.723] } [18:40:49.723] else { [18:40:49.723] if (TRUE) { [18:40:49.723] ...future.stdout <- base::rawConnection(base::raw(0L), [18:40:49.723] open = "w") [18:40:49.723] } [18:40:49.723] else { [18:40:49.723] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:40:49.723] windows = "NUL", "/dev/null"), open = "w") [18:40:49.723] } [18:40:49.723] base::sink(...future.stdout, type = "output", split = FALSE) [18:40:49.723] base::on.exit(if (!base::is.null(...future.stdout)) { [18:40:49.723] base::sink(type = "output", split = FALSE) [18:40:49.723] base::close(...future.stdout) [18:40:49.723] }, add = TRUE) [18:40:49.723] } [18:40:49.723] ...future.frame <- base::sys.nframe() [18:40:49.723] ...future.conditions <- base::list() [18:40:49.723] ...future.rng <- base::globalenv()$.Random.seed [18:40:49.723] if (FALSE) { [18:40:49.723] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:40:49.723] "...future.value", "...future.globalenv.names", ".Random.seed") [18:40:49.723] } [18:40:49.723] ...future.result <- base::tryCatch({ [18:40:49.723] base::withCallingHandlers({ [18:40:49.723] ...future.value <- base::withVisible(base::local({ [18:40:49.723] ...future.makeSendCondition <- base::local({ [18:40:49.723] sendCondition <- NULL [18:40:49.723] function(frame = 1L) { [18:40:49.723] if (is.function(sendCondition)) [18:40:49.723] return(sendCondition) [18:40:49.723] ns <- getNamespace("parallel") [18:40:49.723] if (exists("sendData", mode = "function", [18:40:49.723] envir = ns)) { [18:40:49.723] parallel_sendData <- get("sendData", mode = "function", [18:40:49.723] envir = ns) [18:40:49.723] envir <- sys.frame(frame) [18:40:49.723] master <- NULL [18:40:49.723] while (!identical(envir, .GlobalEnv) && [18:40:49.723] !identical(envir, emptyenv())) { [18:40:49.723] if (exists("master", mode = "list", envir = envir, [18:40:49.723] inherits = FALSE)) { [18:40:49.723] master <- get("master", mode = "list", [18:40:49.723] envir = envir, inherits = FALSE) [18:40:49.723] if (inherits(master, c("SOCKnode", [18:40:49.723] "SOCK0node"))) { [18:40:49.723] sendCondition <<- function(cond) { [18:40:49.723] data <- list(type = "VALUE", value = cond, [18:40:49.723] success = TRUE) [18:40:49.723] parallel_sendData(master, data) [18:40:49.723] } [18:40:49.723] return(sendCondition) [18:40:49.723] } [18:40:49.723] } [18:40:49.723] frame <- frame + 1L [18:40:49.723] envir <- sys.frame(frame) [18:40:49.723] } [18:40:49.723] } [18:40:49.723] sendCondition <<- function(cond) NULL [18:40:49.723] } [18:40:49.723] }) [18:40:49.723] withCallingHandlers({ [18:40:49.723] { [18:40:49.723] do.call(function(...) { [18:40:49.723] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:49.723] if (!identical(...future.globals.maxSize.org, [18:40:49.723] ...future.globals.maxSize)) { [18:40:49.723] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:49.723] on.exit(options(oopts), add = TRUE) [18:40:49.723] } [18:40:49.723] { [18:40:49.723] lapply(seq_along(...future.elements_ii), [18:40:49.723] FUN = function(jj) { [18:40:49.723] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:49.723] ...future.FUN(...future.X_jj, ...) [18:40:49.723] }) [18:40:49.723] } [18:40:49.723] }, args = future.call.arguments) [18:40:49.723] } [18:40:49.723] }, immediateCondition = function(cond) { [18:40:49.723] sendCondition <- ...future.makeSendCondition() [18:40:49.723] sendCondition(cond) [18:40:49.723] muffleCondition <- function (cond, pattern = "^muffle") [18:40:49.723] { [18:40:49.723] inherits <- base::inherits [18:40:49.723] invokeRestart <- base::invokeRestart [18:40:49.723] is.null <- base::is.null [18:40:49.723] muffled <- FALSE [18:40:49.723] if (inherits(cond, "message")) { [18:40:49.723] muffled <- grepl(pattern, "muffleMessage") [18:40:49.723] if (muffled) [18:40:49.723] invokeRestart("muffleMessage") [18:40:49.723] } [18:40:49.723] else if (inherits(cond, "warning")) { [18:40:49.723] muffled <- grepl(pattern, "muffleWarning") [18:40:49.723] if (muffled) [18:40:49.723] invokeRestart("muffleWarning") [18:40:49.723] } [18:40:49.723] else if (inherits(cond, "condition")) { [18:40:49.723] if (!is.null(pattern)) { [18:40:49.723] computeRestarts <- base::computeRestarts [18:40:49.723] grepl <- base::grepl [18:40:49.723] restarts <- computeRestarts(cond) [18:40:49.723] for (restart in restarts) { [18:40:49.723] name <- restart$name [18:40:49.723] if (is.null(name)) [18:40:49.723] next [18:40:49.723] if (!grepl(pattern, name)) [18:40:49.723] next [18:40:49.723] invokeRestart(restart) [18:40:49.723] muffled <- TRUE [18:40:49.723] break [18:40:49.723] } [18:40:49.723] } [18:40:49.723] } [18:40:49.723] invisible(muffled) [18:40:49.723] } [18:40:49.723] muffleCondition(cond) [18:40:49.723] }) [18:40:49.723] })) [18:40:49.723] future::FutureResult(value = ...future.value$value, [18:40:49.723] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:40:49.723] ...future.rng), globalenv = if (FALSE) [18:40:49.723] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:40:49.723] ...future.globalenv.names)) [18:40:49.723] else NULL, started = ...future.startTime, version = "1.8") [18:40:49.723] }, condition = base::local({ [18:40:49.723] c <- base::c [18:40:49.723] inherits <- base::inherits [18:40:49.723] invokeRestart <- base::invokeRestart [18:40:49.723] length <- base::length [18:40:49.723] list <- base::list [18:40:49.723] seq.int <- base::seq.int [18:40:49.723] signalCondition <- base::signalCondition [18:40:49.723] sys.calls <- base::sys.calls [18:40:49.723] `[[` <- base::`[[` [18:40:49.723] `+` <- base::`+` [18:40:49.723] `<<-` <- base::`<<-` [18:40:49.723] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:40:49.723] calls[seq.int(from = from + 12L, to = length(calls) - [18:40:49.723] 3L)] [18:40:49.723] } [18:40:49.723] function(cond) { [18:40:49.723] is_error <- inherits(cond, "error") [18:40:49.723] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:40:49.723] NULL) [18:40:49.723] if (is_error) { [18:40:49.723] sessionInformation <- function() { [18:40:49.723] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:40:49.723] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:40:49.723] search = base::search(), system = base::Sys.info()) [18:40:49.723] } [18:40:49.723] ...future.conditions[[length(...future.conditions) + [18:40:49.723] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:40:49.723] cond$call), session = sessionInformation(), [18:40:49.723] timestamp = base::Sys.time(), signaled = 0L) [18:40:49.723] signalCondition(cond) [18:40:49.723] } [18:40:49.723] else if (!ignore && TRUE && inherits(cond, c("condition", [18:40:49.723] "immediateCondition"))) { [18:40:49.723] signal <- TRUE && inherits(cond, "immediateCondition") [18:40:49.723] ...future.conditions[[length(...future.conditions) + [18:40:49.723] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:40:49.723] if (TRUE && !signal) { [18:40:49.723] muffleCondition <- function (cond, pattern = "^muffle") [18:40:49.723] { [18:40:49.723] inherits <- base::inherits [18:40:49.723] invokeRestart <- base::invokeRestart [18:40:49.723] is.null <- base::is.null [18:40:49.723] muffled <- FALSE [18:40:49.723] if (inherits(cond, "message")) { [18:40:49.723] muffled <- grepl(pattern, "muffleMessage") [18:40:49.723] if (muffled) [18:40:49.723] invokeRestart("muffleMessage") [18:40:49.723] } [18:40:49.723] else if (inherits(cond, "warning")) { [18:40:49.723] muffled <- grepl(pattern, "muffleWarning") [18:40:49.723] if (muffled) [18:40:49.723] invokeRestart("muffleWarning") [18:40:49.723] } [18:40:49.723] else if (inherits(cond, "condition")) { [18:40:49.723] if (!is.null(pattern)) { [18:40:49.723] computeRestarts <- base::computeRestarts [18:40:49.723] grepl <- base::grepl [18:40:49.723] restarts <- computeRestarts(cond) [18:40:49.723] for (restart in restarts) { [18:40:49.723] name <- restart$name [18:40:49.723] if (is.null(name)) [18:40:49.723] next [18:40:49.723] if (!grepl(pattern, name)) [18:40:49.723] next [18:40:49.723] invokeRestart(restart) [18:40:49.723] muffled <- TRUE [18:40:49.723] break [18:40:49.723] } [18:40:49.723] } [18:40:49.723] } [18:40:49.723] invisible(muffled) [18:40:49.723] } [18:40:49.723] muffleCondition(cond, pattern = "^muffle") [18:40:49.723] } [18:40:49.723] } [18:40:49.723] else { [18:40:49.723] if (TRUE) { [18:40:49.723] muffleCondition <- function (cond, pattern = "^muffle") [18:40:49.723] { [18:40:49.723] inherits <- base::inherits [18:40:49.723] invokeRestart <- base::invokeRestart [18:40:49.723] is.null <- base::is.null [18:40:49.723] muffled <- FALSE [18:40:49.723] if (inherits(cond, "message")) { [18:40:49.723] muffled <- grepl(pattern, "muffleMessage") [18:40:49.723] if (muffled) [18:40:49.723] invokeRestart("muffleMessage") [18:40:49.723] } [18:40:49.723] else if (inherits(cond, "warning")) { [18:40:49.723] muffled <- grepl(pattern, "muffleWarning") [18:40:49.723] if (muffled) [18:40:49.723] invokeRestart("muffleWarning") [18:40:49.723] } [18:40:49.723] else if (inherits(cond, "condition")) { [18:40:49.723] if (!is.null(pattern)) { [18:40:49.723] computeRestarts <- base::computeRestarts [18:40:49.723] grepl <- base::grepl [18:40:49.723] restarts <- computeRestarts(cond) [18:40:49.723] for (restart in restarts) { [18:40:49.723] name <- restart$name [18:40:49.723] if (is.null(name)) [18:40:49.723] next [18:40:49.723] if (!grepl(pattern, name)) [18:40:49.723] next [18:40:49.723] invokeRestart(restart) [18:40:49.723] muffled <- TRUE [18:40:49.723] break [18:40:49.723] } [18:40:49.723] } [18:40:49.723] } [18:40:49.723] invisible(muffled) [18:40:49.723] } [18:40:49.723] muffleCondition(cond, pattern = "^muffle") [18:40:49.723] } [18:40:49.723] } [18:40:49.723] } [18:40:49.723] })) [18:40:49.723] }, error = function(ex) { [18:40:49.723] base::structure(base::list(value = NULL, visible = NULL, [18:40:49.723] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:40:49.723] ...future.rng), started = ...future.startTime, [18:40:49.723] finished = Sys.time(), session_uuid = NA_character_, [18:40:49.723] version = "1.8"), class = "FutureResult") [18:40:49.723] }, finally = { [18:40:49.723] if (!identical(...future.workdir, getwd())) [18:40:49.723] setwd(...future.workdir) [18:40:49.723] { [18:40:49.723] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:40:49.723] ...future.oldOptions$nwarnings <- NULL [18:40:49.723] } [18:40:49.723] base::options(...future.oldOptions) [18:40:49.723] if (.Platform$OS.type == "windows") { [18:40:49.723] old_names <- names(...future.oldEnvVars) [18:40:49.723] envs <- base::Sys.getenv() [18:40:49.723] names <- names(envs) [18:40:49.723] common <- intersect(names, old_names) [18:40:49.723] added <- setdiff(names, old_names) [18:40:49.723] removed <- setdiff(old_names, names) [18:40:49.723] changed <- common[...future.oldEnvVars[common] != [18:40:49.723] envs[common]] [18:40:49.723] NAMES <- toupper(changed) [18:40:49.723] args <- list() [18:40:49.723] for (kk in seq_along(NAMES)) { [18:40:49.723] name <- changed[[kk]] [18:40:49.723] NAME <- NAMES[[kk]] [18:40:49.723] if (name != NAME && is.element(NAME, old_names)) [18:40:49.723] next [18:40:49.723] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:49.723] } [18:40:49.723] NAMES <- toupper(added) [18:40:49.723] for (kk in seq_along(NAMES)) { [18:40:49.723] name <- added[[kk]] [18:40:49.723] NAME <- NAMES[[kk]] [18:40:49.723] if (name != NAME && is.element(NAME, old_names)) [18:40:49.723] next [18:40:49.723] args[[name]] <- "" [18:40:49.723] } [18:40:49.723] NAMES <- toupper(removed) [18:40:49.723] for (kk in seq_along(NAMES)) { [18:40:49.723] name <- removed[[kk]] [18:40:49.723] NAME <- NAMES[[kk]] [18:40:49.723] if (name != NAME && is.element(NAME, old_names)) [18:40:49.723] next [18:40:49.723] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:49.723] } [18:40:49.723] if (length(args) > 0) [18:40:49.723] base::do.call(base::Sys.setenv, args = args) [18:40:49.723] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:40:49.723] } [18:40:49.723] else { [18:40:49.723] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:40:49.723] } [18:40:49.723] { [18:40:49.723] if (base::length(...future.futureOptionsAdded) > [18:40:49.723] 0L) { [18:40:49.723] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:40:49.723] base::names(opts) <- ...future.futureOptionsAdded [18:40:49.723] base::options(opts) [18:40:49.723] } [18:40:49.723] { [18:40:49.723] { [18:40:49.723] base::options(mc.cores = ...future.mc.cores.old) [18:40:49.723] NULL [18:40:49.723] } [18:40:49.723] options(future.plan = NULL) [18:40:49.723] if (is.na(NA_character_)) [18:40:49.723] Sys.unsetenv("R_FUTURE_PLAN") [18:40:49.723] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:40:49.723] future::plan(...future.strategy.old, .cleanup = FALSE, [18:40:49.723] .init = FALSE) [18:40:49.723] } [18:40:49.723] } [18:40:49.723] } [18:40:49.723] }) [18:40:49.723] if (TRUE) { [18:40:49.723] base::sink(type = "output", split = FALSE) [18:40:49.723] if (TRUE) { [18:40:49.723] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:40:49.723] } [18:40:49.723] else { [18:40:49.723] ...future.result["stdout"] <- base::list(NULL) [18:40:49.723] } [18:40:49.723] base::close(...future.stdout) [18:40:49.723] ...future.stdout <- NULL [18:40:49.723] } [18:40:49.723] ...future.result$conditions <- ...future.conditions [18:40:49.723] ...future.result$finished <- base::Sys.time() [18:40:49.723] ...future.result [18:40:49.723] } [18:40:49.728] Exporting 5 global objects (913 bytes) to cluster node #1 ... [18:40:49.728] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:40:49.729] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:40:49.729] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:40:49.729] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:40:49.729] Exporting '...future.elements_ii' (102 bytes) to cluster node #1 ... [18:40:49.730] Exporting '...future.elements_ii' (102 bytes) to cluster node #1 ... DONE [18:40:49.730] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:40:49.730] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:40:49.730] Exporting '...future.globals.maxSize' (39 bytes) to cluster node #1 ... [18:40:49.731] Exporting '...future.globals.maxSize' (39 bytes) to cluster node #1 ... DONE [18:40:49.731] Exporting 5 global objects (913 bytes) to cluster node #1 ... DONE [18:40:49.732] MultisessionFuture started [18:40:49.732] - Launch lazy future ... done [18:40:49.732] run() for 'MultisessionFuture' ... done [18:40:49.732] Created future: [18:40:49.746] receiveMessageFromWorker() for ClusterFuture ... [18:40:49.746] - Validating connection of MultisessionFuture [18:40:49.746] - received message: FutureResult [18:40:49.747] - Received FutureResult [18:40:49.747] - Erased future from FutureRegistry [18:40:49.747] result() for ClusterFuture ... [18:40:49.747] - result already collected: FutureResult [18:40:49.747] result() for ClusterFuture ... done [18:40:49.747] receiveMessageFromWorker() for ClusterFuture ... done [18:40:49.732] MultisessionFuture: [18:40:49.732] Label: 'future_apply-2' [18:40:49.732] Expression: [18:40:49.732] { [18:40:49.732] do.call(function(...) { [18:40:49.732] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:49.732] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:49.732] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:49.732] on.exit(options(oopts), add = TRUE) [18:40:49.732] } [18:40:49.732] { [18:40:49.732] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:49.732] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:49.732] ...future.FUN(...future.X_jj, ...) [18:40:49.732] }) [18:40:49.732] } [18:40:49.732] }, args = future.call.arguments) [18:40:49.732] } [18:40:49.732] Lazy evaluation: FALSE [18:40:49.732] Asynchronous evaluation: TRUE [18:40:49.732] Local evaluation: TRUE [18:40:49.732] Environment: R_GlobalEnv [18:40:49.732] Capture standard output: TRUE [18:40:49.732] Capture condition classes: 'condition' (excluding 'nothing') [18:40:49.732] Globals: 5 objects totaling 450 bytes (DotDotDotList 'future.call.arguments' of 97 bytes, function '...future.FUN' of 185 bytes, list '...future.elements_ii' of 102 bytes, NULL '...future.seeds_ii' of 27 bytes, numeric '...future.globals.maxSize' of 39 bytes) [18:40:49.732] Packages: [18:40:49.732] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:40:49.732] Resolved: TRUE [18:40:49.732] Value: [18:40:49.732] Conditions captured: [18:40:49.732] Early signaling: FALSE [18:40:49.732] Owner process: 2171382a-9202-bc7d-80d6-248e0cb487f4 [18:40:49.732] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:40:49.748] Chunk #2 of 2 ... DONE [18:40:49.748] Launching 2 futures (chunks) ... DONE [18:40:49.748] Resolving 2 futures (chunks) ... [18:40:49.748] resolve() on list ... [18:40:49.748] recursive: 0 [18:40:49.749] length: 2 [18:40:49.749] [18:40:49.749] Future #1 [18:40:49.749] result() for ClusterFuture ... [18:40:49.749] - result already collected: FutureResult [18:40:49.749] result() for ClusterFuture ... done [18:40:49.750] result() for ClusterFuture ... [18:40:49.750] - result already collected: FutureResult [18:40:49.750] result() for ClusterFuture ... done [18:40:49.750] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:40:49.750] - nx: 2 [18:40:49.750] - relay: TRUE [18:40:49.751] - stdout: TRUE [18:40:49.751] - signal: TRUE [18:40:49.751] - resignal: FALSE [18:40:49.751] - force: TRUE [18:40:49.751] - relayed: [n=2] FALSE, FALSE [18:40:49.751] - queued futures: [n=2] FALSE, FALSE [18:40:49.751] - until=1 [18:40:49.752] - relaying element #1 [18:40:49.752] result() for ClusterFuture ... [18:40:49.752] - result already collected: FutureResult [18:40:49.752] result() for ClusterFuture ... done [18:40:49.752] result() for ClusterFuture ... [18:40:49.752] - result already collected: FutureResult [18:40:49.753] result() for ClusterFuture ... done [18:40:49.753] result() for ClusterFuture ... [18:40:49.753] - result already collected: FutureResult [18:40:49.753] result() for ClusterFuture ... done [18:40:49.753] result() for ClusterFuture ... [18:40:49.753] - result already collected: FutureResult [18:40:49.753] result() for ClusterFuture ... done [18:40:49.754] - relayed: [n=2] TRUE, FALSE [18:40:49.754] - queued futures: [n=2] TRUE, FALSE [18:40:49.754] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:40:49.754] length: 1 (resolved future 1) [18:40:49.754] Future #2 [18:40:49.755] result() for ClusterFuture ... [18:40:49.755] - result already collected: FutureResult [18:40:49.755] result() for ClusterFuture ... done [18:40:49.755] result() for ClusterFuture ... [18:40:49.755] - result already collected: FutureResult [18:40:49.755] result() for ClusterFuture ... done [18:40:49.755] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:40:49.756] - nx: 2 [18:40:49.756] - relay: TRUE [18:40:49.756] - stdout: TRUE [18:40:49.756] - signal: TRUE [18:40:49.756] - resignal: FALSE [18:40:49.756] - force: TRUE [18:40:49.756] - relayed: [n=2] TRUE, FALSE [18:40:49.757] - queued futures: [n=2] TRUE, FALSE [18:40:49.757] - until=2 [18:40:49.757] - relaying element #2 [18:40:49.757] result() for ClusterFuture ... [18:40:49.757] - result already collected: FutureResult [18:40:49.757] result() for ClusterFuture ... done [18:40:49.758] result() for ClusterFuture ... [18:40:49.758] - result already collected: FutureResult [18:40:49.758] result() for ClusterFuture ... done [18:40:49.758] result() for ClusterFuture ... [18:40:49.758] - result already collected: FutureResult [18:40:49.759] result() for ClusterFuture ... done [18:40:49.759] result() for ClusterFuture ... [18:40:49.759] - result already collected: FutureResult [18:40:49.759] result() for ClusterFuture ... done [18:40:49.759] - relayed: [n=2] TRUE, TRUE [18:40:49.759] - queued futures: [n=2] TRUE, TRUE [18:40:49.759] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:40:49.760] length: 0 (resolved future 2) [18:40:49.760] Relaying remaining futures [18:40:49.760] signalConditionsASAP(NULL, pos=0) ... [18:40:49.760] - nx: 2 [18:40:49.760] - relay: TRUE [18:40:49.760] - stdout: TRUE [18:40:49.761] - signal: TRUE [18:40:49.761] - resignal: FALSE [18:40:49.761] - force: TRUE [18:40:49.761] - relayed: [n=2] TRUE, TRUE [18:40:49.761] - queued futures: [n=2] TRUE, TRUE - flush all [18:40:49.761] - relayed: [n=2] TRUE, TRUE [18:40:49.762] - queued futures: [n=2] TRUE, TRUE [18:40:49.762] signalConditionsASAP(NULL, pos=0) ... done [18:40:49.762] resolve() on list ... DONE [18:40:49.762] result() for ClusterFuture ... [18:40:49.762] - result already collected: FutureResult [18:40:49.762] result() for ClusterFuture ... done [18:40:49.762] result() for ClusterFuture ... [18:40:49.763] - result already collected: FutureResult [18:40:49.763] result() for ClusterFuture ... done [18:40:49.763] result() for ClusterFuture ... [18:40:49.763] - result already collected: FutureResult [18:40:49.763] result() for ClusterFuture ... done [18:40:49.763] result() for ClusterFuture ... [18:40:49.764] - result already collected: FutureResult [18:40:49.764] result() for ClusterFuture ... done [18:40:49.764] - Number of value chunks collected: 2 [18:40:49.764] Resolving 2 futures (chunks) ... DONE [18:40:49.764] Reducing values from 2 chunks ... [18:40:49.764] - Number of values collected after concatenation: 2 [18:40:49.764] - Number of values expected: 2 [18:40:49.765] Reducing values from 2 chunks ... DONE [18:40:49.765] future_lapply() ... DONE [,1] [,2] [1,] 1 2 [2,] 3 4 [3,] 5 6 [4,] 7 8 [5,] 9 10 [6,] 11 12 - apply(X, ...) - not all same names ... [18:40:49.765] getGlobalsAndPackagesXApply() ... [18:40:49.765] - future.globals: TRUE [18:40:49.766] getGlobalsAndPackages() ... [18:40:49.766] Searching for globals... [18:40:49.769] - globals found: [10] 'FUN', '{', 'if', '==', '[', '<-', 'names', 'names<-', 'letters', 'seq_along' [18:40:49.769] Searching for globals ... DONE [18:40:49.769] Resolving globals: FALSE [18:40:49.770] The total size of the 1 globals is 1.28 KiB (1311 bytes) [18:40:49.770] The total size of the 1 globals exported for future expression ('FUN(X = structure(1:4, dim = c(2L, 2L)))') is 1.28 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (1.28 KiB of class 'function') [18:40:49.771] - globals: [1] 'FUN' [18:40:49.771] [18:40:49.771] getGlobalsAndPackages() ... DONE [18:40:49.771] - globals found/used: [n=1] 'FUN' [18:40:49.771] - needed namespaces: [n=0] [18:40:49.771] Finding globals ... DONE [18:40:49.772] - use_args: TRUE [18:40:49.772] - Getting '...' globals ... [18:40:49.772] resolve() on list ... [18:40:49.772] recursive: 0 [18:40:49.772] length: 1 [18:40:49.773] elements: '...' [18:40:49.773] length: 0 (resolved future 1) [18:40:49.773] resolve() on list ... DONE [18:40:49.773] - '...' content: [n=0] [18:40:49.773] List of 1 [18:40:49.773] $ ...: list() [18:40:49.773] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:49.773] - attr(*, "where")=List of 1 [18:40:49.773] ..$ ...: [18:40:49.773] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:49.773] - attr(*, "resolved")= logi TRUE [18:40:49.773] - attr(*, "total_size")= num NA [18:40:49.776] - Getting '...' globals ... DONE [18:40:49.776] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:40:49.777] List of 2 [18:40:49.777] $ ...future.FUN:function (x) [18:40:49.777] $ ... : list() [18:40:49.777] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:49.777] - attr(*, "where")=List of 2 [18:40:49.777] ..$ ...future.FUN: [18:40:49.777] ..$ ... : [18:40:49.777] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:49.777] - attr(*, "resolved")= logi FALSE [18:40:49.777] - attr(*, "total_size")= int 4449 [18:40:49.780] Packages to be attached in all futures: [n=0] [18:40:49.780] getGlobalsAndPackagesXApply() ... DONE [18:40:49.782] future_lapply() ... [18:40:49.787] Number of chunks: 2 [18:40:49.787] getGlobalsAndPackagesXApply() ... [18:40:49.787] - future.globals: with names 'list()' [18:40:49.787] - use_args: TRUE [18:40:49.787] Globals to be used in all futures (chunks): [n=2] '...', '...future.FUN' [18:40:49.788] List of 2 [18:40:49.788] $ ... : list() [18:40:49.788] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:49.788] $ ...future.FUN:function (x) [18:40:49.788] - attr(*, "where")=List of 2 [18:40:49.788] ..$ ... : [18:40:49.788] ..$ ...future.FUN: [18:40:49.788] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:49.788] - attr(*, "resolved")= logi FALSE [18:40:49.788] - attr(*, "total_size")= num NA [18:40:49.791] Packages to be attached in all futures: [n=0] [18:40:49.791] getGlobalsAndPackagesXApply() ... DONE [18:40:49.791] Number of futures (= number of chunks): 2 [18:40:49.792] Launching 2 futures (chunks) ... [18:40:49.792] Chunk #1 of 2 ... [18:40:49.792] - Adjusted option 'future.globals.maxSize': Inf -> 2 * Inf = Inf (bytes) [18:40:49.792] - seeds: [18:40:49.792] - All globals exported: [n=5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:49.792] getGlobalsAndPackages() ... [18:40:49.793] - globals passed as-is: [5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:49.793] Resolving globals: FALSE [18:40:49.793] Tweak future expression to call with '...' arguments ... [18:40:49.793] { [18:40:49.793] do.call(function(...) { [18:40:49.793] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:49.793] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:49.793] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:49.793] on.exit(options(oopts), add = TRUE) [18:40:49.793] } [18:40:49.793] { [18:40:49.793] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:49.793] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:49.793] ...future.FUN(...future.X_jj, ...) [18:40:49.793] }) [18:40:49.793] } [18:40:49.793] }, args = future.call.arguments) [18:40:49.793] } [18:40:49.794] Tweak future expression to call with '...' arguments ... DONE [18:40:49.794] - globals: [5] 'future.call.arguments', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:49.794] [18:40:49.794] getGlobalsAndPackages() ... DONE [18:40:49.795] run() for 'Future' ... [18:40:49.795] - state: 'created' [18:40:49.795] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:40:49.811] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:40:49.812] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:40:49.812] - Field: 'node' [18:40:49.812] - Field: 'label' [18:40:49.812] - Field: 'local' [18:40:49.812] - Field: 'owner' [18:40:49.813] - Field: 'envir' [18:40:49.813] - Field: 'workers' [18:40:49.813] - Field: 'packages' [18:40:49.813] - Field: 'gc' [18:40:49.813] - Field: 'conditions' [18:40:49.813] - Field: 'persistent' [18:40:49.814] - Field: 'expr' [18:40:49.814] - Field: 'uuid' [18:40:49.814] - Field: 'seed' [18:40:49.814] - Field: 'version' [18:40:49.814] - Field: 'result' [18:40:49.814] - Field: 'asynchronous' [18:40:49.815] - Field: 'calls' [18:40:49.815] - Field: 'globals' [18:40:49.815] - Field: 'stdout' [18:40:49.815] - Field: 'earlySignal' [18:40:49.815] - Field: 'lazy' [18:40:49.816] - Field: 'state' [18:40:49.816] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:40:49.816] - Launch lazy future ... [18:40:49.816] Packages needed by the future expression (n = 0): [18:40:49.816] Packages needed by future strategies (n = 0): [18:40:49.817] { [18:40:49.817] { [18:40:49.817] { [18:40:49.817] ...future.startTime <- base::Sys.time() [18:40:49.817] { [18:40:49.817] { [18:40:49.817] { [18:40:49.817] { [18:40:49.817] base::local({ [18:40:49.817] has_future <- base::requireNamespace("future", [18:40:49.817] quietly = TRUE) [18:40:49.817] if (has_future) { [18:40:49.817] ns <- base::getNamespace("future") [18:40:49.817] version <- ns[[".package"]][["version"]] [18:40:49.817] if (is.null(version)) [18:40:49.817] version <- utils::packageVersion("future") [18:40:49.817] } [18:40:49.817] else { [18:40:49.817] version <- NULL [18:40:49.817] } [18:40:49.817] if (!has_future || version < "1.8.0") { [18:40:49.817] info <- base::c(r_version = base::gsub("R version ", [18:40:49.817] "", base::R.version$version.string), [18:40:49.817] platform = base::sprintf("%s (%s-bit)", [18:40:49.817] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:40:49.817] os = base::paste(base::Sys.info()[base::c("sysname", [18:40:49.817] "release", "version")], collapse = " "), [18:40:49.817] hostname = base::Sys.info()[["nodename"]]) [18:40:49.817] info <- base::sprintf("%s: %s", base::names(info), [18:40:49.817] info) [18:40:49.817] info <- base::paste(info, collapse = "; ") [18:40:49.817] if (!has_future) { [18:40:49.817] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:40:49.817] info) [18:40:49.817] } [18:40:49.817] else { [18:40:49.817] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:40:49.817] info, version) [18:40:49.817] } [18:40:49.817] base::stop(msg) [18:40:49.817] } [18:40:49.817] }) [18:40:49.817] } [18:40:49.817] ...future.mc.cores.old <- base::getOption("mc.cores") [18:40:49.817] base::options(mc.cores = 1L) [18:40:49.817] } [18:40:49.817] ...future.strategy.old <- future::plan("list") [18:40:49.817] options(future.plan = NULL) [18:40:49.817] Sys.unsetenv("R_FUTURE_PLAN") [18:40:49.817] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:40:49.817] } [18:40:49.817] ...future.workdir <- getwd() [18:40:49.817] } [18:40:49.817] ...future.oldOptions <- base::as.list(base::.Options) [18:40:49.817] ...future.oldEnvVars <- base::Sys.getenv() [18:40:49.817] } [18:40:49.817] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:40:49.817] future.globals.maxSize = Inf, future.globals.method = NULL, [18:40:49.817] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:40:49.817] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:40:49.817] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:40:49.817] future.stdout.windows.reencode = NULL, width = 80L) [18:40:49.817] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:40:49.817] base::names(...future.oldOptions)) [18:40:49.817] } [18:40:49.817] if (FALSE) { [18:40:49.817] } [18:40:49.817] else { [18:40:49.817] if (TRUE) { [18:40:49.817] ...future.stdout <- base::rawConnection(base::raw(0L), [18:40:49.817] open = "w") [18:40:49.817] } [18:40:49.817] else { [18:40:49.817] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:40:49.817] windows = "NUL", "/dev/null"), open = "w") [18:40:49.817] } [18:40:49.817] base::sink(...future.stdout, type = "output", split = FALSE) [18:40:49.817] base::on.exit(if (!base::is.null(...future.stdout)) { [18:40:49.817] base::sink(type = "output", split = FALSE) [18:40:49.817] base::close(...future.stdout) [18:40:49.817] }, add = TRUE) [18:40:49.817] } [18:40:49.817] ...future.frame <- base::sys.nframe() [18:40:49.817] ...future.conditions <- base::list() [18:40:49.817] ...future.rng <- base::globalenv()$.Random.seed [18:40:49.817] if (FALSE) { [18:40:49.817] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:40:49.817] "...future.value", "...future.globalenv.names", ".Random.seed") [18:40:49.817] } [18:40:49.817] ...future.result <- base::tryCatch({ [18:40:49.817] base::withCallingHandlers({ [18:40:49.817] ...future.value <- base::withVisible(base::local({ [18:40:49.817] ...future.makeSendCondition <- base::local({ [18:40:49.817] sendCondition <- NULL [18:40:49.817] function(frame = 1L) { [18:40:49.817] if (is.function(sendCondition)) [18:40:49.817] return(sendCondition) [18:40:49.817] ns <- getNamespace("parallel") [18:40:49.817] if (exists("sendData", mode = "function", [18:40:49.817] envir = ns)) { [18:40:49.817] parallel_sendData <- get("sendData", mode = "function", [18:40:49.817] envir = ns) [18:40:49.817] envir <- sys.frame(frame) [18:40:49.817] master <- NULL [18:40:49.817] while (!identical(envir, .GlobalEnv) && [18:40:49.817] !identical(envir, emptyenv())) { [18:40:49.817] if (exists("master", mode = "list", envir = envir, [18:40:49.817] inherits = FALSE)) { [18:40:49.817] master <- get("master", mode = "list", [18:40:49.817] envir = envir, inherits = FALSE) [18:40:49.817] if (inherits(master, c("SOCKnode", [18:40:49.817] "SOCK0node"))) { [18:40:49.817] sendCondition <<- function(cond) { [18:40:49.817] data <- list(type = "VALUE", value = cond, [18:40:49.817] success = TRUE) [18:40:49.817] parallel_sendData(master, data) [18:40:49.817] } [18:40:49.817] return(sendCondition) [18:40:49.817] } [18:40:49.817] } [18:40:49.817] frame <- frame + 1L [18:40:49.817] envir <- sys.frame(frame) [18:40:49.817] } [18:40:49.817] } [18:40:49.817] sendCondition <<- function(cond) NULL [18:40:49.817] } [18:40:49.817] }) [18:40:49.817] withCallingHandlers({ [18:40:49.817] { [18:40:49.817] do.call(function(...) { [18:40:49.817] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:49.817] if (!identical(...future.globals.maxSize.org, [18:40:49.817] ...future.globals.maxSize)) { [18:40:49.817] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:49.817] on.exit(options(oopts), add = TRUE) [18:40:49.817] } [18:40:49.817] { [18:40:49.817] lapply(seq_along(...future.elements_ii), [18:40:49.817] FUN = function(jj) { [18:40:49.817] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:49.817] ...future.FUN(...future.X_jj, ...) [18:40:49.817] }) [18:40:49.817] } [18:40:49.817] }, args = future.call.arguments) [18:40:49.817] } [18:40:49.817] }, immediateCondition = function(cond) { [18:40:49.817] sendCondition <- ...future.makeSendCondition() [18:40:49.817] sendCondition(cond) [18:40:49.817] muffleCondition <- function (cond, pattern = "^muffle") [18:40:49.817] { [18:40:49.817] inherits <- base::inherits [18:40:49.817] invokeRestart <- base::invokeRestart [18:40:49.817] is.null <- base::is.null [18:40:49.817] muffled <- FALSE [18:40:49.817] if (inherits(cond, "message")) { [18:40:49.817] muffled <- grepl(pattern, "muffleMessage") [18:40:49.817] if (muffled) [18:40:49.817] invokeRestart("muffleMessage") [18:40:49.817] } [18:40:49.817] else if (inherits(cond, "warning")) { [18:40:49.817] muffled <- grepl(pattern, "muffleWarning") [18:40:49.817] if (muffled) [18:40:49.817] invokeRestart("muffleWarning") [18:40:49.817] } [18:40:49.817] else if (inherits(cond, "condition")) { [18:40:49.817] if (!is.null(pattern)) { [18:40:49.817] computeRestarts <- base::computeRestarts [18:40:49.817] grepl <- base::grepl [18:40:49.817] restarts <- computeRestarts(cond) [18:40:49.817] for (restart in restarts) { [18:40:49.817] name <- restart$name [18:40:49.817] if (is.null(name)) [18:40:49.817] next [18:40:49.817] if (!grepl(pattern, name)) [18:40:49.817] next [18:40:49.817] invokeRestart(restart) [18:40:49.817] muffled <- TRUE [18:40:49.817] break [18:40:49.817] } [18:40:49.817] } [18:40:49.817] } [18:40:49.817] invisible(muffled) [18:40:49.817] } [18:40:49.817] muffleCondition(cond) [18:40:49.817] }) [18:40:49.817] })) [18:40:49.817] future::FutureResult(value = ...future.value$value, [18:40:49.817] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:40:49.817] ...future.rng), globalenv = if (FALSE) [18:40:49.817] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:40:49.817] ...future.globalenv.names)) [18:40:49.817] else NULL, started = ...future.startTime, version = "1.8") [18:40:49.817] }, condition = base::local({ [18:40:49.817] c <- base::c [18:40:49.817] inherits <- base::inherits [18:40:49.817] invokeRestart <- base::invokeRestart [18:40:49.817] length <- base::length [18:40:49.817] list <- base::list [18:40:49.817] seq.int <- base::seq.int [18:40:49.817] signalCondition <- base::signalCondition [18:40:49.817] sys.calls <- base::sys.calls [18:40:49.817] `[[` <- base::`[[` [18:40:49.817] `+` <- base::`+` [18:40:49.817] `<<-` <- base::`<<-` [18:40:49.817] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:40:49.817] calls[seq.int(from = from + 12L, to = length(calls) - [18:40:49.817] 3L)] [18:40:49.817] } [18:40:49.817] function(cond) { [18:40:49.817] is_error <- inherits(cond, "error") [18:40:49.817] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:40:49.817] NULL) [18:40:49.817] if (is_error) { [18:40:49.817] sessionInformation <- function() { [18:40:49.817] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:40:49.817] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:40:49.817] search = base::search(), system = base::Sys.info()) [18:40:49.817] } [18:40:49.817] ...future.conditions[[length(...future.conditions) + [18:40:49.817] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:40:49.817] cond$call), session = sessionInformation(), [18:40:49.817] timestamp = base::Sys.time(), signaled = 0L) [18:40:49.817] signalCondition(cond) [18:40:49.817] } [18:40:49.817] else if (!ignore && TRUE && inherits(cond, c("condition", [18:40:49.817] "immediateCondition"))) { [18:40:49.817] signal <- TRUE && inherits(cond, "immediateCondition") [18:40:49.817] ...future.conditions[[length(...future.conditions) + [18:40:49.817] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:40:49.817] if (TRUE && !signal) { [18:40:49.817] muffleCondition <- function (cond, pattern = "^muffle") [18:40:49.817] { [18:40:49.817] inherits <- base::inherits [18:40:49.817] invokeRestart <- base::invokeRestart [18:40:49.817] is.null <- base::is.null [18:40:49.817] muffled <- FALSE [18:40:49.817] if (inherits(cond, "message")) { [18:40:49.817] muffled <- grepl(pattern, "muffleMessage") [18:40:49.817] if (muffled) [18:40:49.817] invokeRestart("muffleMessage") [18:40:49.817] } [18:40:49.817] else if (inherits(cond, "warning")) { [18:40:49.817] muffled <- grepl(pattern, "muffleWarning") [18:40:49.817] if (muffled) [18:40:49.817] invokeRestart("muffleWarning") [18:40:49.817] } [18:40:49.817] else if (inherits(cond, "condition")) { [18:40:49.817] if (!is.null(pattern)) { [18:40:49.817] computeRestarts <- base::computeRestarts [18:40:49.817] grepl <- base::grepl [18:40:49.817] restarts <- computeRestarts(cond) [18:40:49.817] for (restart in restarts) { [18:40:49.817] name <- restart$name [18:40:49.817] if (is.null(name)) [18:40:49.817] next [18:40:49.817] if (!grepl(pattern, name)) [18:40:49.817] next [18:40:49.817] invokeRestart(restart) [18:40:49.817] muffled <- TRUE [18:40:49.817] break [18:40:49.817] } [18:40:49.817] } [18:40:49.817] } [18:40:49.817] invisible(muffled) [18:40:49.817] } [18:40:49.817] muffleCondition(cond, pattern = "^muffle") [18:40:49.817] } [18:40:49.817] } [18:40:49.817] else { [18:40:49.817] if (TRUE) { [18:40:49.817] muffleCondition <- function (cond, pattern = "^muffle") [18:40:49.817] { [18:40:49.817] inherits <- base::inherits [18:40:49.817] invokeRestart <- base::invokeRestart [18:40:49.817] is.null <- base::is.null [18:40:49.817] muffled <- FALSE [18:40:49.817] if (inherits(cond, "message")) { [18:40:49.817] muffled <- grepl(pattern, "muffleMessage") [18:40:49.817] if (muffled) [18:40:49.817] invokeRestart("muffleMessage") [18:40:49.817] } [18:40:49.817] else if (inherits(cond, "warning")) { [18:40:49.817] muffled <- grepl(pattern, "muffleWarning") [18:40:49.817] if (muffled) [18:40:49.817] invokeRestart("muffleWarning") [18:40:49.817] } [18:40:49.817] else if (inherits(cond, "condition")) { [18:40:49.817] if (!is.null(pattern)) { [18:40:49.817] computeRestarts <- base::computeRestarts [18:40:49.817] grepl <- base::grepl [18:40:49.817] restarts <- computeRestarts(cond) [18:40:49.817] for (restart in restarts) { [18:40:49.817] name <- restart$name [18:40:49.817] if (is.null(name)) [18:40:49.817] next [18:40:49.817] if (!grepl(pattern, name)) [18:40:49.817] next [18:40:49.817] invokeRestart(restart) [18:40:49.817] muffled <- TRUE [18:40:49.817] break [18:40:49.817] } [18:40:49.817] } [18:40:49.817] } [18:40:49.817] invisible(muffled) [18:40:49.817] } [18:40:49.817] muffleCondition(cond, pattern = "^muffle") [18:40:49.817] } [18:40:49.817] } [18:40:49.817] } [18:40:49.817] })) [18:40:49.817] }, error = function(ex) { [18:40:49.817] base::structure(base::list(value = NULL, visible = NULL, [18:40:49.817] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:40:49.817] ...future.rng), started = ...future.startTime, [18:40:49.817] finished = Sys.time(), session_uuid = NA_character_, [18:40:49.817] version = "1.8"), class = "FutureResult") [18:40:49.817] }, finally = { [18:40:49.817] if (!identical(...future.workdir, getwd())) [18:40:49.817] setwd(...future.workdir) [18:40:49.817] { [18:40:49.817] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:40:49.817] ...future.oldOptions$nwarnings <- NULL [18:40:49.817] } [18:40:49.817] base::options(...future.oldOptions) [18:40:49.817] if (.Platform$OS.type == "windows") { [18:40:49.817] old_names <- names(...future.oldEnvVars) [18:40:49.817] envs <- base::Sys.getenv() [18:40:49.817] names <- names(envs) [18:40:49.817] common <- intersect(names, old_names) [18:40:49.817] added <- setdiff(names, old_names) [18:40:49.817] removed <- setdiff(old_names, names) [18:40:49.817] changed <- common[...future.oldEnvVars[common] != [18:40:49.817] envs[common]] [18:40:49.817] NAMES <- toupper(changed) [18:40:49.817] args <- list() [18:40:49.817] for (kk in seq_along(NAMES)) { [18:40:49.817] name <- changed[[kk]] [18:40:49.817] NAME <- NAMES[[kk]] [18:40:49.817] if (name != NAME && is.element(NAME, old_names)) [18:40:49.817] next [18:40:49.817] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:49.817] } [18:40:49.817] NAMES <- toupper(added) [18:40:49.817] for (kk in seq_along(NAMES)) { [18:40:49.817] name <- added[[kk]] [18:40:49.817] NAME <- NAMES[[kk]] [18:40:49.817] if (name != NAME && is.element(NAME, old_names)) [18:40:49.817] next [18:40:49.817] args[[name]] <- "" [18:40:49.817] } [18:40:49.817] NAMES <- toupper(removed) [18:40:49.817] for (kk in seq_along(NAMES)) { [18:40:49.817] name <- removed[[kk]] [18:40:49.817] NAME <- NAMES[[kk]] [18:40:49.817] if (name != NAME && is.element(NAME, old_names)) [18:40:49.817] next [18:40:49.817] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:49.817] } [18:40:49.817] if (length(args) > 0) [18:40:49.817] base::do.call(base::Sys.setenv, args = args) [18:40:49.817] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:40:49.817] } [18:40:49.817] else { [18:40:49.817] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:40:49.817] } [18:40:49.817] { [18:40:49.817] if (base::length(...future.futureOptionsAdded) > [18:40:49.817] 0L) { [18:40:49.817] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:40:49.817] base::names(opts) <- ...future.futureOptionsAdded [18:40:49.817] base::options(opts) [18:40:49.817] } [18:40:49.817] { [18:40:49.817] { [18:40:49.817] base::options(mc.cores = ...future.mc.cores.old) [18:40:49.817] NULL [18:40:49.817] } [18:40:49.817] options(future.plan = NULL) [18:40:49.817] if (is.na(NA_character_)) [18:40:49.817] Sys.unsetenv("R_FUTURE_PLAN") [18:40:49.817] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:40:49.817] future::plan(...future.strategy.old, .cleanup = FALSE, [18:40:49.817] .init = FALSE) [18:40:49.817] } [18:40:49.817] } [18:40:49.817] } [18:40:49.817] }) [18:40:49.817] if (TRUE) { [18:40:49.817] base::sink(type = "output", split = FALSE) [18:40:49.817] if (TRUE) { [18:40:49.817] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:40:49.817] } [18:40:49.817] else { [18:40:49.817] ...future.result["stdout"] <- base::list(NULL) [18:40:49.817] } [18:40:49.817] base::close(...future.stdout) [18:40:49.817] ...future.stdout <- NULL [18:40:49.817] } [18:40:49.817] ...future.result$conditions <- ...future.conditions [18:40:49.817] ...future.result$finished <- base::Sys.time() [18:40:49.817] ...future.result [18:40:49.817] } [18:40:49.822] Exporting 5 global objects (1.92 KiB) to cluster node #1 ... [18:40:49.822] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:40:49.823] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:40:49.823] Exporting '...future.FUN' (1.28 KiB) to cluster node #1 ... [18:40:49.823] Exporting '...future.FUN' (1.28 KiB) to cluster node #1 ... DONE [18:40:49.824] Exporting '...future.elements_ii' (47 bytes) to cluster node #1 ... [18:40:49.824] Exporting '...future.elements_ii' (47 bytes) to cluster node #1 ... DONE [18:40:49.824] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:40:49.825] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:40:49.825] Exporting '...future.globals.maxSize' (39 bytes) to cluster node #1 ... [18:40:49.825] Exporting '...future.globals.maxSize' (39 bytes) to cluster node #1 ... DONE [18:40:49.825] Exporting 5 global objects (1.92 KiB) to cluster node #1 ... DONE [18:40:49.826] MultisessionFuture started [18:40:49.826] - Launch lazy future ... done [18:40:49.826] run() for 'MultisessionFuture' ... done [18:40:49.826] Created future: [18:40:49.841] receiveMessageFromWorker() for ClusterFuture ... [18:40:49.841] - Validating connection of MultisessionFuture [18:40:49.841] - received message: FutureResult [18:40:49.842] - Received FutureResult [18:40:49.842] - Erased future from FutureRegistry [18:40:49.842] result() for ClusterFuture ... [18:40:49.842] - result already collected: FutureResult [18:40:49.842] result() for ClusterFuture ... done [18:40:49.842] receiveMessageFromWorker() for ClusterFuture ... done [18:40:49.827] MultisessionFuture: [18:40:49.827] Label: 'future_apply-1' [18:40:49.827] Expression: [18:40:49.827] { [18:40:49.827] do.call(function(...) { [18:40:49.827] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:49.827] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:49.827] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:49.827] on.exit(options(oopts), add = TRUE) [18:40:49.827] } [18:40:49.827] { [18:40:49.827] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:49.827] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:49.827] ...future.FUN(...future.X_jj, ...) [18:40:49.827] }) [18:40:49.827] } [18:40:49.827] }, args = future.call.arguments) [18:40:49.827] } [18:40:49.827] Lazy evaluation: FALSE [18:40:49.827] Asynchronous evaluation: TRUE [18:40:49.827] Local evaluation: TRUE [18:40:49.827] Environment: R_GlobalEnv [18:40:49.827] Capture standard output: TRUE [18:40:49.827] Capture condition classes: 'condition' (excluding 'nothing') [18:40:49.827] Globals: 5 objects totaling 1.49 KiB (DotDotDotList 'future.call.arguments' of 97 bytes, function '...future.FUN' of 1.28 KiB, list '...future.elements_ii' of 47 bytes, NULL '...future.seeds_ii' of 27 bytes, numeric '...future.globals.maxSize' of 39 bytes) [18:40:49.827] Packages: [18:40:49.827] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:40:49.827] Resolved: TRUE [18:40:49.827] Value: [18:40:49.827] Conditions captured: [18:40:49.827] Early signaling: FALSE [18:40:49.827] Owner process: 2171382a-9202-bc7d-80d6-248e0cb487f4 [18:40:49.827] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:40:49.845] Chunk #1 of 2 ... DONE [18:40:49.846] Chunk #2 of 2 ... [18:40:49.846] - Adjusted option 'future.globals.maxSize': Inf -> 2 * Inf = Inf (bytes) [18:40:49.846] - seeds: [18:40:49.846] - All globals exported: [n=5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:49.846] getGlobalsAndPackages() ... [18:40:49.846] - globals passed as-is: [5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:49.847] Resolving globals: FALSE [18:40:49.847] Tweak future expression to call with '...' arguments ... [18:40:49.847] { [18:40:49.847] do.call(function(...) { [18:40:49.847] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:49.847] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:49.847] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:49.847] on.exit(options(oopts), add = TRUE) [18:40:49.847] } [18:40:49.847] { [18:40:49.847] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:49.847] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:49.847] ...future.FUN(...future.X_jj, ...) [18:40:49.847] }) [18:40:49.847] } [18:40:49.847] }, args = future.call.arguments) [18:40:49.847] } [18:40:49.848] Tweak future expression to call with '...' arguments ... DONE [18:40:49.848] - globals: [5] 'future.call.arguments', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:49.848] [18:40:49.848] getGlobalsAndPackages() ... DONE [18:40:49.849] run() for 'Future' ... [18:40:49.849] - state: 'created' [18:40:49.849] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:40:49.864] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:40:49.864] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:40:49.865] - Field: 'node' [18:40:49.865] - Field: 'label' [18:40:49.865] - Field: 'local' [18:40:49.865] - Field: 'owner' [18:40:49.865] - Field: 'envir' [18:40:49.865] - Field: 'workers' [18:40:49.866] - Field: 'packages' [18:40:49.866] - Field: 'gc' [18:40:49.866] - Field: 'conditions' [18:40:49.866] - Field: 'persistent' [18:40:49.866] - Field: 'expr' [18:40:49.866] - Field: 'uuid' [18:40:49.867] - Field: 'seed' [18:40:49.867] - Field: 'version' [18:40:49.867] - Field: 'result' [18:40:49.867] - Field: 'asynchronous' [18:40:49.867] - Field: 'calls' [18:40:49.868] - Field: 'globals' [18:40:49.868] - Field: 'stdout' [18:40:49.868] - Field: 'earlySignal' [18:40:49.868] - Field: 'lazy' [18:40:49.868] - Field: 'state' [18:40:49.868] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:40:49.869] - Launch lazy future ... [18:40:49.869] Packages needed by the future expression (n = 0): [18:40:49.869] Packages needed by future strategies (n = 0): [18:40:49.870] { [18:40:49.870] { [18:40:49.870] { [18:40:49.870] ...future.startTime <- base::Sys.time() [18:40:49.870] { [18:40:49.870] { [18:40:49.870] { [18:40:49.870] { [18:40:49.870] base::local({ [18:40:49.870] has_future <- base::requireNamespace("future", [18:40:49.870] quietly = TRUE) [18:40:49.870] if (has_future) { [18:40:49.870] ns <- base::getNamespace("future") [18:40:49.870] version <- ns[[".package"]][["version"]] [18:40:49.870] if (is.null(version)) [18:40:49.870] version <- utils::packageVersion("future") [18:40:49.870] } [18:40:49.870] else { [18:40:49.870] version <- NULL [18:40:49.870] } [18:40:49.870] if (!has_future || version < "1.8.0") { [18:40:49.870] info <- base::c(r_version = base::gsub("R version ", [18:40:49.870] "", base::R.version$version.string), [18:40:49.870] platform = base::sprintf("%s (%s-bit)", [18:40:49.870] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:40:49.870] os = base::paste(base::Sys.info()[base::c("sysname", [18:40:49.870] "release", "version")], collapse = " "), [18:40:49.870] hostname = base::Sys.info()[["nodename"]]) [18:40:49.870] info <- base::sprintf("%s: %s", base::names(info), [18:40:49.870] info) [18:40:49.870] info <- base::paste(info, collapse = "; ") [18:40:49.870] if (!has_future) { [18:40:49.870] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:40:49.870] info) [18:40:49.870] } [18:40:49.870] else { [18:40:49.870] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:40:49.870] info, version) [18:40:49.870] } [18:40:49.870] base::stop(msg) [18:40:49.870] } [18:40:49.870] }) [18:40:49.870] } [18:40:49.870] ...future.mc.cores.old <- base::getOption("mc.cores") [18:40:49.870] base::options(mc.cores = 1L) [18:40:49.870] } [18:40:49.870] ...future.strategy.old <- future::plan("list") [18:40:49.870] options(future.plan = NULL) [18:40:49.870] Sys.unsetenv("R_FUTURE_PLAN") [18:40:49.870] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:40:49.870] } [18:40:49.870] ...future.workdir <- getwd() [18:40:49.870] } [18:40:49.870] ...future.oldOptions <- base::as.list(base::.Options) [18:40:49.870] ...future.oldEnvVars <- base::Sys.getenv() [18:40:49.870] } [18:40:49.870] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:40:49.870] future.globals.maxSize = Inf, future.globals.method = NULL, [18:40:49.870] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:40:49.870] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:40:49.870] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:40:49.870] future.stdout.windows.reencode = NULL, width = 80L) [18:40:49.870] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:40:49.870] base::names(...future.oldOptions)) [18:40:49.870] } [18:40:49.870] if (FALSE) { [18:40:49.870] } [18:40:49.870] else { [18:40:49.870] if (TRUE) { [18:40:49.870] ...future.stdout <- base::rawConnection(base::raw(0L), [18:40:49.870] open = "w") [18:40:49.870] } [18:40:49.870] else { [18:40:49.870] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:40:49.870] windows = "NUL", "/dev/null"), open = "w") [18:40:49.870] } [18:40:49.870] base::sink(...future.stdout, type = "output", split = FALSE) [18:40:49.870] base::on.exit(if (!base::is.null(...future.stdout)) { [18:40:49.870] base::sink(type = "output", split = FALSE) [18:40:49.870] base::close(...future.stdout) [18:40:49.870] }, add = TRUE) [18:40:49.870] } [18:40:49.870] ...future.frame <- base::sys.nframe() [18:40:49.870] ...future.conditions <- base::list() [18:40:49.870] ...future.rng <- base::globalenv()$.Random.seed [18:40:49.870] if (FALSE) { [18:40:49.870] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:40:49.870] "...future.value", "...future.globalenv.names", ".Random.seed") [18:40:49.870] } [18:40:49.870] ...future.result <- base::tryCatch({ [18:40:49.870] base::withCallingHandlers({ [18:40:49.870] ...future.value <- base::withVisible(base::local({ [18:40:49.870] ...future.makeSendCondition <- base::local({ [18:40:49.870] sendCondition <- NULL [18:40:49.870] function(frame = 1L) { [18:40:49.870] if (is.function(sendCondition)) [18:40:49.870] return(sendCondition) [18:40:49.870] ns <- getNamespace("parallel") [18:40:49.870] if (exists("sendData", mode = "function", [18:40:49.870] envir = ns)) { [18:40:49.870] parallel_sendData <- get("sendData", mode = "function", [18:40:49.870] envir = ns) [18:40:49.870] envir <- sys.frame(frame) [18:40:49.870] master <- NULL [18:40:49.870] while (!identical(envir, .GlobalEnv) && [18:40:49.870] !identical(envir, emptyenv())) { [18:40:49.870] if (exists("master", mode = "list", envir = envir, [18:40:49.870] inherits = FALSE)) { [18:40:49.870] master <- get("master", mode = "list", [18:40:49.870] envir = envir, inherits = FALSE) [18:40:49.870] if (inherits(master, c("SOCKnode", [18:40:49.870] "SOCK0node"))) { [18:40:49.870] sendCondition <<- function(cond) { [18:40:49.870] data <- list(type = "VALUE", value = cond, [18:40:49.870] success = TRUE) [18:40:49.870] parallel_sendData(master, data) [18:40:49.870] } [18:40:49.870] return(sendCondition) [18:40:49.870] } [18:40:49.870] } [18:40:49.870] frame <- frame + 1L [18:40:49.870] envir <- sys.frame(frame) [18:40:49.870] } [18:40:49.870] } [18:40:49.870] sendCondition <<- function(cond) NULL [18:40:49.870] } [18:40:49.870] }) [18:40:49.870] withCallingHandlers({ [18:40:49.870] { [18:40:49.870] do.call(function(...) { [18:40:49.870] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:49.870] if (!identical(...future.globals.maxSize.org, [18:40:49.870] ...future.globals.maxSize)) { [18:40:49.870] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:49.870] on.exit(options(oopts), add = TRUE) [18:40:49.870] } [18:40:49.870] { [18:40:49.870] lapply(seq_along(...future.elements_ii), [18:40:49.870] FUN = function(jj) { [18:40:49.870] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:49.870] ...future.FUN(...future.X_jj, ...) [18:40:49.870] }) [18:40:49.870] } [18:40:49.870] }, args = future.call.arguments) [18:40:49.870] } [18:40:49.870] }, immediateCondition = function(cond) { [18:40:49.870] sendCondition <- ...future.makeSendCondition() [18:40:49.870] sendCondition(cond) [18:40:49.870] muffleCondition <- function (cond, pattern = "^muffle") [18:40:49.870] { [18:40:49.870] inherits <- base::inherits [18:40:49.870] invokeRestart <- base::invokeRestart [18:40:49.870] is.null <- base::is.null [18:40:49.870] muffled <- FALSE [18:40:49.870] if (inherits(cond, "message")) { [18:40:49.870] muffled <- grepl(pattern, "muffleMessage") [18:40:49.870] if (muffled) [18:40:49.870] invokeRestart("muffleMessage") [18:40:49.870] } [18:40:49.870] else if (inherits(cond, "warning")) { [18:40:49.870] muffled <- grepl(pattern, "muffleWarning") [18:40:49.870] if (muffled) [18:40:49.870] invokeRestart("muffleWarning") [18:40:49.870] } [18:40:49.870] else if (inherits(cond, "condition")) { [18:40:49.870] if (!is.null(pattern)) { [18:40:49.870] computeRestarts <- base::computeRestarts [18:40:49.870] grepl <- base::grepl [18:40:49.870] restarts <- computeRestarts(cond) [18:40:49.870] for (restart in restarts) { [18:40:49.870] name <- restart$name [18:40:49.870] if (is.null(name)) [18:40:49.870] next [18:40:49.870] if (!grepl(pattern, name)) [18:40:49.870] next [18:40:49.870] invokeRestart(restart) [18:40:49.870] muffled <- TRUE [18:40:49.870] break [18:40:49.870] } [18:40:49.870] } [18:40:49.870] } [18:40:49.870] invisible(muffled) [18:40:49.870] } [18:40:49.870] muffleCondition(cond) [18:40:49.870] }) [18:40:49.870] })) [18:40:49.870] future::FutureResult(value = ...future.value$value, [18:40:49.870] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:40:49.870] ...future.rng), globalenv = if (FALSE) [18:40:49.870] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:40:49.870] ...future.globalenv.names)) [18:40:49.870] else NULL, started = ...future.startTime, version = "1.8") [18:40:49.870] }, condition = base::local({ [18:40:49.870] c <- base::c [18:40:49.870] inherits <- base::inherits [18:40:49.870] invokeRestart <- base::invokeRestart [18:40:49.870] length <- base::length [18:40:49.870] list <- base::list [18:40:49.870] seq.int <- base::seq.int [18:40:49.870] signalCondition <- base::signalCondition [18:40:49.870] sys.calls <- base::sys.calls [18:40:49.870] `[[` <- base::`[[` [18:40:49.870] `+` <- base::`+` [18:40:49.870] `<<-` <- base::`<<-` [18:40:49.870] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:40:49.870] calls[seq.int(from = from + 12L, to = length(calls) - [18:40:49.870] 3L)] [18:40:49.870] } [18:40:49.870] function(cond) { [18:40:49.870] is_error <- inherits(cond, "error") [18:40:49.870] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:40:49.870] NULL) [18:40:49.870] if (is_error) { [18:40:49.870] sessionInformation <- function() { [18:40:49.870] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:40:49.870] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:40:49.870] search = base::search(), system = base::Sys.info()) [18:40:49.870] } [18:40:49.870] ...future.conditions[[length(...future.conditions) + [18:40:49.870] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:40:49.870] cond$call), session = sessionInformation(), [18:40:49.870] timestamp = base::Sys.time(), signaled = 0L) [18:40:49.870] signalCondition(cond) [18:40:49.870] } [18:40:49.870] else if (!ignore && TRUE && inherits(cond, c("condition", [18:40:49.870] "immediateCondition"))) { [18:40:49.870] signal <- TRUE && inherits(cond, "immediateCondition") [18:40:49.870] ...future.conditions[[length(...future.conditions) + [18:40:49.870] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:40:49.870] if (TRUE && !signal) { [18:40:49.870] muffleCondition <- function (cond, pattern = "^muffle") [18:40:49.870] { [18:40:49.870] inherits <- base::inherits [18:40:49.870] invokeRestart <- base::invokeRestart [18:40:49.870] is.null <- base::is.null [18:40:49.870] muffled <- FALSE [18:40:49.870] if (inherits(cond, "message")) { [18:40:49.870] muffled <- grepl(pattern, "muffleMessage") [18:40:49.870] if (muffled) [18:40:49.870] invokeRestart("muffleMessage") [18:40:49.870] } [18:40:49.870] else if (inherits(cond, "warning")) { [18:40:49.870] muffled <- grepl(pattern, "muffleWarning") [18:40:49.870] if (muffled) [18:40:49.870] invokeRestart("muffleWarning") [18:40:49.870] } [18:40:49.870] else if (inherits(cond, "condition")) { [18:40:49.870] if (!is.null(pattern)) { [18:40:49.870] computeRestarts <- base::computeRestarts [18:40:49.870] grepl <- base::grepl [18:40:49.870] restarts <- computeRestarts(cond) [18:40:49.870] for (restart in restarts) { [18:40:49.870] name <- restart$name [18:40:49.870] if (is.null(name)) [18:40:49.870] next [18:40:49.870] if (!grepl(pattern, name)) [18:40:49.870] next [18:40:49.870] invokeRestart(restart) [18:40:49.870] muffled <- TRUE [18:40:49.870] break [18:40:49.870] } [18:40:49.870] } [18:40:49.870] } [18:40:49.870] invisible(muffled) [18:40:49.870] } [18:40:49.870] muffleCondition(cond, pattern = "^muffle") [18:40:49.870] } [18:40:49.870] } [18:40:49.870] else { [18:40:49.870] if (TRUE) { [18:40:49.870] muffleCondition <- function (cond, pattern = "^muffle") [18:40:49.870] { [18:40:49.870] inherits <- base::inherits [18:40:49.870] invokeRestart <- base::invokeRestart [18:40:49.870] is.null <- base::is.null [18:40:49.870] muffled <- FALSE [18:40:49.870] if (inherits(cond, "message")) { [18:40:49.870] muffled <- grepl(pattern, "muffleMessage") [18:40:49.870] if (muffled) [18:40:49.870] invokeRestart("muffleMessage") [18:40:49.870] } [18:40:49.870] else if (inherits(cond, "warning")) { [18:40:49.870] muffled <- grepl(pattern, "muffleWarning") [18:40:49.870] if (muffled) [18:40:49.870] invokeRestart("muffleWarning") [18:40:49.870] } [18:40:49.870] else if (inherits(cond, "condition")) { [18:40:49.870] if (!is.null(pattern)) { [18:40:49.870] computeRestarts <- base::computeRestarts [18:40:49.870] grepl <- base::grepl [18:40:49.870] restarts <- computeRestarts(cond) [18:40:49.870] for (restart in restarts) { [18:40:49.870] name <- restart$name [18:40:49.870] if (is.null(name)) [18:40:49.870] next [18:40:49.870] if (!grepl(pattern, name)) [18:40:49.870] next [18:40:49.870] invokeRestart(restart) [18:40:49.870] muffled <- TRUE [18:40:49.870] break [18:40:49.870] } [18:40:49.870] } [18:40:49.870] } [18:40:49.870] invisible(muffled) [18:40:49.870] } [18:40:49.870] muffleCondition(cond, pattern = "^muffle") [18:40:49.870] } [18:40:49.870] } [18:40:49.870] } [18:40:49.870] })) [18:40:49.870] }, error = function(ex) { [18:40:49.870] base::structure(base::list(value = NULL, visible = NULL, [18:40:49.870] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:40:49.870] ...future.rng), started = ...future.startTime, [18:40:49.870] finished = Sys.time(), session_uuid = NA_character_, [18:40:49.870] version = "1.8"), class = "FutureResult") [18:40:49.870] }, finally = { [18:40:49.870] if (!identical(...future.workdir, getwd())) [18:40:49.870] setwd(...future.workdir) [18:40:49.870] { [18:40:49.870] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:40:49.870] ...future.oldOptions$nwarnings <- NULL [18:40:49.870] } [18:40:49.870] base::options(...future.oldOptions) [18:40:49.870] if (.Platform$OS.type == "windows") { [18:40:49.870] old_names <- names(...future.oldEnvVars) [18:40:49.870] envs <- base::Sys.getenv() [18:40:49.870] names <- names(envs) [18:40:49.870] common <- intersect(names, old_names) [18:40:49.870] added <- setdiff(names, old_names) [18:40:49.870] removed <- setdiff(old_names, names) [18:40:49.870] changed <- common[...future.oldEnvVars[common] != [18:40:49.870] envs[common]] [18:40:49.870] NAMES <- toupper(changed) [18:40:49.870] args <- list() [18:40:49.870] for (kk in seq_along(NAMES)) { [18:40:49.870] name <- changed[[kk]] [18:40:49.870] NAME <- NAMES[[kk]] [18:40:49.870] if (name != NAME && is.element(NAME, old_names)) [18:40:49.870] next [18:40:49.870] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:49.870] } [18:40:49.870] NAMES <- toupper(added) [18:40:49.870] for (kk in seq_along(NAMES)) { [18:40:49.870] name <- added[[kk]] [18:40:49.870] NAME <- NAMES[[kk]] [18:40:49.870] if (name != NAME && is.element(NAME, old_names)) [18:40:49.870] next [18:40:49.870] args[[name]] <- "" [18:40:49.870] } [18:40:49.870] NAMES <- toupper(removed) [18:40:49.870] for (kk in seq_along(NAMES)) { [18:40:49.870] name <- removed[[kk]] [18:40:49.870] NAME <- NAMES[[kk]] [18:40:49.870] if (name != NAME && is.element(NAME, old_names)) [18:40:49.870] next [18:40:49.870] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:49.870] } [18:40:49.870] if (length(args) > 0) [18:40:49.870] base::do.call(base::Sys.setenv, args = args) [18:40:49.870] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:40:49.870] } [18:40:49.870] else { [18:40:49.870] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:40:49.870] } [18:40:49.870] { [18:40:49.870] if (base::length(...future.futureOptionsAdded) > [18:40:49.870] 0L) { [18:40:49.870] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:40:49.870] base::names(opts) <- ...future.futureOptionsAdded [18:40:49.870] base::options(opts) [18:40:49.870] } [18:40:49.870] { [18:40:49.870] { [18:40:49.870] base::options(mc.cores = ...future.mc.cores.old) [18:40:49.870] NULL [18:40:49.870] } [18:40:49.870] options(future.plan = NULL) [18:40:49.870] if (is.na(NA_character_)) [18:40:49.870] Sys.unsetenv("R_FUTURE_PLAN") [18:40:49.870] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:40:49.870] future::plan(...future.strategy.old, .cleanup = FALSE, [18:40:49.870] .init = FALSE) [18:40:49.870] } [18:40:49.870] } [18:40:49.870] } [18:40:49.870] }) [18:40:49.870] if (TRUE) { [18:40:49.870] base::sink(type = "output", split = FALSE) [18:40:49.870] if (TRUE) { [18:40:49.870] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:40:49.870] } [18:40:49.870] else { [18:40:49.870] ...future.result["stdout"] <- base::list(NULL) [18:40:49.870] } [18:40:49.870] base::close(...future.stdout) [18:40:49.870] ...future.stdout <- NULL [18:40:49.870] } [18:40:49.870] ...future.result$conditions <- ...future.conditions [18:40:49.870] ...future.result$finished <- base::Sys.time() [18:40:49.870] ...future.result [18:40:49.870] } [18:40:49.875] Exporting 5 global objects (1.92 KiB) to cluster node #1 ... [18:40:49.875] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:40:49.875] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:40:49.876] Exporting '...future.FUN' (1.28 KiB) to cluster node #1 ... [18:40:49.876] Exporting '...future.FUN' (1.28 KiB) to cluster node #1 ... DONE [18:40:49.876] Exporting '...future.elements_ii' (47 bytes) to cluster node #1 ... [18:40:49.876] Exporting '...future.elements_ii' (47 bytes) to cluster node #1 ... DONE [18:40:49.877] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:40:49.877] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:40:49.877] Exporting '...future.globals.maxSize' (39 bytes) to cluster node #1 ... [18:40:49.878] Exporting '...future.globals.maxSize' (39 bytes) to cluster node #1 ... DONE [18:40:49.878] Exporting 5 global objects (1.92 KiB) to cluster node #1 ... DONE [18:40:49.878] MultisessionFuture started [18:40:49.878] - Launch lazy future ... done [18:40:49.879] run() for 'MultisessionFuture' ... done [18:40:49.879] Created future: [18:40:49.895] receiveMessageFromWorker() for ClusterFuture ... [18:40:49.895] - Validating connection of MultisessionFuture [18:40:49.896] - received message: FutureResult [18:40:49.896] - Received FutureResult [18:40:49.896] - Erased future from FutureRegistry [18:40:49.896] result() for ClusterFuture ... [18:40:49.896] - result already collected: FutureResult [18:40:49.896] result() for ClusterFuture ... done [18:40:49.897] receiveMessageFromWorker() for ClusterFuture ... done [18:40:49.879] MultisessionFuture: [18:40:49.879] Label: 'future_apply-2' [18:40:49.879] Expression: [18:40:49.879] { [18:40:49.879] do.call(function(...) { [18:40:49.879] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:49.879] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:49.879] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:49.879] on.exit(options(oopts), add = TRUE) [18:40:49.879] } [18:40:49.879] { [18:40:49.879] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:49.879] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:49.879] ...future.FUN(...future.X_jj, ...) [18:40:49.879] }) [18:40:49.879] } [18:40:49.879] }, args = future.call.arguments) [18:40:49.879] } [18:40:49.879] Lazy evaluation: FALSE [18:40:49.879] Asynchronous evaluation: TRUE [18:40:49.879] Local evaluation: TRUE [18:40:49.879] Environment: R_GlobalEnv [18:40:49.879] Capture standard output: TRUE [18:40:49.879] Capture condition classes: 'condition' (excluding 'nothing') [18:40:49.879] Globals: 5 objects totaling 1.49 KiB (DotDotDotList 'future.call.arguments' of 97 bytes, function '...future.FUN' of 1.28 KiB, list '...future.elements_ii' of 47 bytes, NULL '...future.seeds_ii' of 27 bytes, numeric '...future.globals.maxSize' of 39 bytes) [18:40:49.879] Packages: [18:40:49.879] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:40:49.879] Resolved: TRUE [18:40:49.879] Value: [18:40:49.879] Conditions captured: [18:40:49.879] Early signaling: FALSE [18:40:49.879] Owner process: 2171382a-9202-bc7d-80d6-248e0cb487f4 [18:40:49.879] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:40:49.897] Chunk #2 of 2 ... DONE [18:40:49.897] Launching 2 futures (chunks) ... DONE [18:40:49.897] Resolving 2 futures (chunks) ... [18:40:49.897] resolve() on list ... [18:40:49.898] recursive: 0 [18:40:49.898] length: 2 [18:40:49.898] [18:40:49.898] Future #1 [18:40:49.898] result() for ClusterFuture ... [18:40:49.898] - result already collected: FutureResult [18:40:49.899] result() for ClusterFuture ... done [18:40:49.899] result() for ClusterFuture ... [18:40:49.899] - result already collected: FutureResult [18:40:49.899] result() for ClusterFuture ... done [18:40:49.899] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:40:49.899] - nx: 2 [18:40:49.899] - relay: TRUE [18:40:49.900] - stdout: TRUE [18:40:49.900] - signal: TRUE [18:40:49.900] - resignal: FALSE [18:40:49.900] - force: TRUE [18:40:49.900] - relayed: [n=2] FALSE, FALSE [18:40:49.900] - queued futures: [n=2] FALSE, FALSE [18:40:49.901] - until=1 [18:40:49.901] - relaying element #1 [18:40:49.901] result() for ClusterFuture ... [18:40:49.901] - result already collected: FutureResult [18:40:49.901] result() for ClusterFuture ... done [18:40:49.901] result() for ClusterFuture ... [18:40:49.901] - result already collected: FutureResult [18:40:49.902] result() for ClusterFuture ... done [18:40:49.902] result() for ClusterFuture ... [18:40:49.902] - result already collected: FutureResult [18:40:49.902] result() for ClusterFuture ... done [18:40:49.902] result() for ClusterFuture ... [18:40:49.902] - result already collected: FutureResult [18:40:49.903] result() for ClusterFuture ... done [18:40:49.903] - relayed: [n=2] TRUE, FALSE [18:40:49.903] - queued futures: [n=2] TRUE, FALSE [18:40:49.903] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:40:49.903] length: 1 (resolved future 1) [18:40:49.903] Future #2 [18:40:49.904] result() for ClusterFuture ... [18:40:49.904] - result already collected: FutureResult [18:40:49.904] result() for ClusterFuture ... done [18:40:49.904] result() for ClusterFuture ... [18:40:49.904] - result already collected: FutureResult [18:40:49.904] result() for ClusterFuture ... done [18:40:49.905] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:40:49.905] - nx: 2 [18:40:49.905] - relay: TRUE [18:40:49.905] - stdout: TRUE [18:40:49.905] - signal: TRUE [18:40:49.905] - resignal: FALSE [18:40:49.905] - force: TRUE [18:40:49.906] - relayed: [n=2] TRUE, FALSE [18:40:49.906] - queued futures: [n=2] TRUE, FALSE [18:40:49.906] - until=2 [18:40:49.906] - relaying element #2 [18:40:49.906] result() for ClusterFuture ... [18:40:49.906] - result already collected: FutureResult [18:40:49.906] result() for ClusterFuture ... done [18:40:49.907] result() for ClusterFuture ... [18:40:49.907] - result already collected: FutureResult [18:40:49.907] result() for ClusterFuture ... done [18:40:49.907] result() for ClusterFuture ... [18:40:49.907] - result already collected: FutureResult [18:40:49.907] result() for ClusterFuture ... done [18:40:49.908] result() for ClusterFuture ... [18:40:49.908] - result already collected: FutureResult [18:40:49.908] result() for ClusterFuture ... done [18:40:49.908] - relayed: [n=2] TRUE, TRUE [18:40:49.908] - queued futures: [n=2] TRUE, TRUE [18:40:49.908] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:40:49.909] length: 0 (resolved future 2) [18:40:49.909] Relaying remaining futures [18:40:49.909] signalConditionsASAP(NULL, pos=0) ... [18:40:49.909] - nx: 2 [18:40:49.909] - relay: TRUE [18:40:49.909] - stdout: TRUE [18:40:49.909] - signal: TRUE [18:40:49.910] - resignal: FALSE [18:40:49.910] - force: TRUE [18:40:49.910] - relayed: [n=2] TRUE, TRUE [18:40:49.910] - queued futures: [n=2] TRUE, TRUE - flush all [18:40:49.910] - relayed: [n=2] TRUE, TRUE [18:40:49.910] - queued futures: [n=2] TRUE, TRUE [18:40:49.911] signalConditionsASAP(NULL, pos=0) ... done [18:40:49.911] resolve() on list ... DONE [18:40:49.911] result() for ClusterFuture ... [18:40:49.911] - result already collected: FutureResult [18:40:49.911] result() for ClusterFuture ... done [18:40:49.911] result() for ClusterFuture ... [18:40:49.912] - result already collected: FutureResult [18:40:49.912] result() for ClusterFuture ... done [18:40:49.912] result() for ClusterFuture ... [18:40:49.912] - result already collected: FutureResult [18:40:49.912] result() for ClusterFuture ... done [18:40:49.912] result() for ClusterFuture ... [18:40:49.912] - result already collected: FutureResult [18:40:49.913] result() for ClusterFuture ... done [18:40:49.913] - Number of value chunks collected: 2 [18:40:49.913] Resolving 2 futures (chunks) ... DONE [18:40:49.913] Reducing values from 2 chunks ... [18:40:49.913] - Number of values collected after concatenation: 2 [18:40:49.913] - Number of values expected: 2 [18:40:49.914] Reducing values from 2 chunks ... DONE [18:40:49.914] future_lapply() ... DONE [,1] [,2] [1,] 1 2 [2,] 3 4 - example(future_apply) - reproducible RNG ... [18:40:49.914] getGlobalsAndPackagesXApply() ... [18:40:49.914] - future.globals: TRUE [18:40:49.914] getGlobalsAndPackages() ... [18:40:49.915] Searching for globals... [18:40:49.918] - globals found: [13] 'FUN', '{', 'if', '&&', '==', 'length', 'is.numeric', 'is.finite', '>=', 'missing', '<-', 'sample.int', '[' [18:40:49.918] Searching for globals ... DONE [18:40:49.919] Resolving globals: FALSE [18:40:49.919] The total size of the 1 globals is 3.66 KiB (3746 bytes) [18:40:49.920] The total size of the 1 globals exported for future expression ('FUN(X = structure(1:4, dim = c(2L, 2L)))') is 3.66 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (3.66 KiB of class 'function') [18:40:49.920] - globals: [1] 'FUN' [18:40:49.920] [18:40:49.920] getGlobalsAndPackages() ... DONE [18:40:49.921] - globals found/used: [n=1] 'FUN' [18:40:49.921] - needed namespaces: [n=0] [18:40:49.921] Finding globals ... DONE [18:40:49.921] - use_args: TRUE [18:40:49.921] - Getting '...' globals ... [18:40:49.922] resolve() on list ... [18:40:49.922] recursive: 0 [18:40:49.922] length: 1 [18:40:49.922] elements: '...' [18:40:49.922] length: 0 (resolved future 1) [18:40:49.923] resolve() on list ... DONE [18:40:49.923] - '...' content: [n=0] [18:40:49.923] List of 1 [18:40:49.923] $ ...: list() [18:40:49.923] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:49.923] - attr(*, "where")=List of 1 [18:40:49.923] ..$ ...: [18:40:49.923] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:49.923] - attr(*, "resolved")= logi TRUE [18:40:49.923] - attr(*, "total_size")= num NA [18:40:49.926] - Getting '...' globals ... DONE [18:40:49.926] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:40:49.926] List of 2 [18:40:49.926] $ ...future.FUN:function (x, size, replace = FALSE, prob = NULL) [18:40:49.926] $ ... : list() [18:40:49.926] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:49.926] - attr(*, "where")=List of 2 [18:40:49.926] ..$ ...future.FUN: [18:40:49.926] ..$ ... : [18:40:49.926] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:49.926] - attr(*, "resolved")= logi FALSE [18:40:49.926] - attr(*, "total_size")= int 9424 [18:40:49.929] Packages to be attached in all futures: [n=0] [18:40:49.930] getGlobalsAndPackagesXApply() ... DONE [18:40:49.932] future_lapply() ... [18:40:49.935] Generating random seeds ... [18:40:49.935] Generating random seed streams for 2 elements ... [18:40:49.935] Generating random seed streams for 2 elements ... DONE [18:40:49.935] Generating random seeds ... DONE [18:40:49.935] Will set RNG state on exit: 10407, 331696693, 1645604058, 1272151983, 336250629, 763913256, 1641349428 [18:40:49.938] Number of chunks: 2 [18:40:49.938] getGlobalsAndPackagesXApply() ... [18:40:49.938] - future.globals: with names 'list()' [18:40:49.939] - use_args: TRUE [18:40:49.939] Globals to be used in all futures (chunks): [n=2] '...', '...future.FUN' [18:40:49.939] List of 2 [18:40:49.939] $ ... : list() [18:40:49.939] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:40:49.939] $ ...future.FUN:function (x, size, replace = FALSE, prob = NULL) [18:40:49.939] - attr(*, "where")=List of 2 [18:40:49.939] ..$ ... : [18:40:49.939] ..$ ...future.FUN: [18:40:49.939] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:40:49.939] - attr(*, "resolved")= logi FALSE [18:40:49.939] - attr(*, "total_size")= num NA [18:40:49.943] Packages to be attached in all futures: [n=0] [18:40:49.943] getGlobalsAndPackagesXApply() ... DONE [18:40:49.943] Number of futures (= number of chunks): 2 [18:40:49.944] Launching 2 futures (chunks) ... [18:40:49.944] Chunk #1 of 2 ... [18:40:49.944] - Adjusted option 'future.globals.maxSize': Inf -> 2 * Inf = Inf (bytes) [18:40:49.944] - seeds: [1] [18:40:49.944] - All globals exported: [n=5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:49.945] getGlobalsAndPackages() ... [18:40:49.945] - globals passed as-is: [5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:49.945] Resolving globals: FALSE [18:40:49.945] Tweak future expression to call with '...' arguments ... [18:40:49.945] { [18:40:49.945] do.call(function(...) { [18:40:49.945] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:49.945] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:49.945] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:49.945] on.exit(options(oopts), add = TRUE) [18:40:49.945] } [18:40:49.945] { [18:40:49.945] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:49.945] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:49.945] assign(".Random.seed", ...future.seeds_ii[[jj]], [18:40:49.945] envir = globalenv(), inherits = FALSE) [18:40:49.945] ...future.FUN(...future.X_jj, ...) [18:40:49.945] }) [18:40:49.945] } [18:40:49.945] }, args = future.call.arguments) [18:40:49.945] } [18:40:49.946] Tweak future expression to call with '...' arguments ... DONE [18:40:49.946] - globals: [5] 'future.call.arguments', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:49.947] [18:40:49.947] getGlobalsAndPackages() ... DONE [18:40:49.947] run() for 'Future' ... [18:40:49.947] - state: 'created' [18:40:49.947] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:40:49.963] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:40:49.963] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:40:49.963] - Field: 'node' [18:40:49.963] - Field: 'label' [18:40:49.963] - Field: 'local' [18:40:49.964] - Field: 'owner' [18:40:49.964] - Field: 'envir' [18:40:49.964] - Field: 'workers' [18:40:49.964] - Field: 'packages' [18:40:49.964] - Field: 'gc' [18:40:49.964] - Field: 'conditions' [18:40:49.965] - Field: 'persistent' [18:40:49.965] - Field: 'expr' [18:40:49.965] - Field: 'uuid' [18:40:49.965] - Field: 'seed' [18:40:49.965] - Field: 'version' [18:40:49.966] - Field: 'result' [18:40:49.966] - Field: 'asynchronous' [18:40:49.966] - Field: 'calls' [18:40:49.966] - Field: 'globals' [18:40:49.966] - Field: 'stdout' [18:40:49.966] - Field: 'earlySignal' [18:40:49.967] - Field: 'lazy' [18:40:49.967] - Field: 'state' [18:40:49.967] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:40:49.967] - Launch lazy future ... [18:40:49.967] Packages needed by the future expression (n = 0): [18:40:49.968] Packages needed by future strategies (n = 0): [18:40:49.968] { [18:40:49.968] { [18:40:49.968] { [18:40:49.968] ...future.startTime <- base::Sys.time() [18:40:49.968] { [18:40:49.968] { [18:40:49.968] { [18:40:49.968] { [18:40:49.968] base::local({ [18:40:49.968] has_future <- base::requireNamespace("future", [18:40:49.968] quietly = TRUE) [18:40:49.968] if (has_future) { [18:40:49.968] ns <- base::getNamespace("future") [18:40:49.968] version <- ns[[".package"]][["version"]] [18:40:49.968] if (is.null(version)) [18:40:49.968] version <- utils::packageVersion("future") [18:40:49.968] } [18:40:49.968] else { [18:40:49.968] version <- NULL [18:40:49.968] } [18:40:49.968] if (!has_future || version < "1.8.0") { [18:40:49.968] info <- base::c(r_version = base::gsub("R version ", [18:40:49.968] "", base::R.version$version.string), [18:40:49.968] platform = base::sprintf("%s (%s-bit)", [18:40:49.968] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:40:49.968] os = base::paste(base::Sys.info()[base::c("sysname", [18:40:49.968] "release", "version")], collapse = " "), [18:40:49.968] hostname = base::Sys.info()[["nodename"]]) [18:40:49.968] info <- base::sprintf("%s: %s", base::names(info), [18:40:49.968] info) [18:40:49.968] info <- base::paste(info, collapse = "; ") [18:40:49.968] if (!has_future) { [18:40:49.968] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:40:49.968] info) [18:40:49.968] } [18:40:49.968] else { [18:40:49.968] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:40:49.968] info, version) [18:40:49.968] } [18:40:49.968] base::stop(msg) [18:40:49.968] } [18:40:49.968] }) [18:40:49.968] } [18:40:49.968] ...future.mc.cores.old <- base::getOption("mc.cores") [18:40:49.968] base::options(mc.cores = 1L) [18:40:49.968] } [18:40:49.968] ...future.strategy.old <- future::plan("list") [18:40:49.968] options(future.plan = NULL) [18:40:49.968] Sys.unsetenv("R_FUTURE_PLAN") [18:40:49.968] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:40:49.968] } [18:40:49.968] ...future.workdir <- getwd() [18:40:49.968] } [18:40:49.968] ...future.oldOptions <- base::as.list(base::.Options) [18:40:49.968] ...future.oldEnvVars <- base::Sys.getenv() [18:40:49.968] } [18:40:49.968] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:40:49.968] future.globals.maxSize = Inf, future.globals.method = NULL, [18:40:49.968] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:40:49.968] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:40:49.968] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:40:49.968] future.stdout.windows.reencode = NULL, width = 80L) [18:40:49.968] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:40:49.968] base::names(...future.oldOptions)) [18:40:49.968] } [18:40:49.968] if (FALSE) { [18:40:49.968] } [18:40:49.968] else { [18:40:49.968] if (TRUE) { [18:40:49.968] ...future.stdout <- base::rawConnection(base::raw(0L), [18:40:49.968] open = "w") [18:40:49.968] } [18:40:49.968] else { [18:40:49.968] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:40:49.968] windows = "NUL", "/dev/null"), open = "w") [18:40:49.968] } [18:40:49.968] base::sink(...future.stdout, type = "output", split = FALSE) [18:40:49.968] base::on.exit(if (!base::is.null(...future.stdout)) { [18:40:49.968] base::sink(type = "output", split = FALSE) [18:40:49.968] base::close(...future.stdout) [18:40:49.968] }, add = TRUE) [18:40:49.968] } [18:40:49.968] ...future.frame <- base::sys.nframe() [18:40:49.968] ...future.conditions <- base::list() [18:40:49.968] ...future.rng <- base::globalenv()$.Random.seed [18:40:49.968] if (FALSE) { [18:40:49.968] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:40:49.968] "...future.value", "...future.globalenv.names", ".Random.seed") [18:40:49.968] } [18:40:49.968] ...future.result <- base::tryCatch({ [18:40:49.968] base::withCallingHandlers({ [18:40:49.968] ...future.value <- base::withVisible(base::local({ [18:40:49.968] ...future.makeSendCondition <- base::local({ [18:40:49.968] sendCondition <- NULL [18:40:49.968] function(frame = 1L) { [18:40:49.968] if (is.function(sendCondition)) [18:40:49.968] return(sendCondition) [18:40:49.968] ns <- getNamespace("parallel") [18:40:49.968] if (exists("sendData", mode = "function", [18:40:49.968] envir = ns)) { [18:40:49.968] parallel_sendData <- get("sendData", mode = "function", [18:40:49.968] envir = ns) [18:40:49.968] envir <- sys.frame(frame) [18:40:49.968] master <- NULL [18:40:49.968] while (!identical(envir, .GlobalEnv) && [18:40:49.968] !identical(envir, emptyenv())) { [18:40:49.968] if (exists("master", mode = "list", envir = envir, [18:40:49.968] inherits = FALSE)) { [18:40:49.968] master <- get("master", mode = "list", [18:40:49.968] envir = envir, inherits = FALSE) [18:40:49.968] if (inherits(master, c("SOCKnode", [18:40:49.968] "SOCK0node"))) { [18:40:49.968] sendCondition <<- function(cond) { [18:40:49.968] data <- list(type = "VALUE", value = cond, [18:40:49.968] success = TRUE) [18:40:49.968] parallel_sendData(master, data) [18:40:49.968] } [18:40:49.968] return(sendCondition) [18:40:49.968] } [18:40:49.968] } [18:40:49.968] frame <- frame + 1L [18:40:49.968] envir <- sys.frame(frame) [18:40:49.968] } [18:40:49.968] } [18:40:49.968] sendCondition <<- function(cond) NULL [18:40:49.968] } [18:40:49.968] }) [18:40:49.968] withCallingHandlers({ [18:40:49.968] { [18:40:49.968] do.call(function(...) { [18:40:49.968] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:49.968] if (!identical(...future.globals.maxSize.org, [18:40:49.968] ...future.globals.maxSize)) { [18:40:49.968] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:49.968] on.exit(options(oopts), add = TRUE) [18:40:49.968] } [18:40:49.968] { [18:40:49.968] lapply(seq_along(...future.elements_ii), [18:40:49.968] FUN = function(jj) { [18:40:49.968] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:49.968] assign(".Random.seed", ...future.seeds_ii[[jj]], [18:40:49.968] envir = globalenv(), inherits = FALSE) [18:40:49.968] ...future.FUN(...future.X_jj, ...) [18:40:49.968] }) [18:40:49.968] } [18:40:49.968] }, args = future.call.arguments) [18:40:49.968] } [18:40:49.968] }, immediateCondition = function(cond) { [18:40:49.968] sendCondition <- ...future.makeSendCondition() [18:40:49.968] sendCondition(cond) [18:40:49.968] muffleCondition <- function (cond, pattern = "^muffle") [18:40:49.968] { [18:40:49.968] inherits <- base::inherits [18:40:49.968] invokeRestart <- base::invokeRestart [18:40:49.968] is.null <- base::is.null [18:40:49.968] muffled <- FALSE [18:40:49.968] if (inherits(cond, "message")) { [18:40:49.968] muffled <- grepl(pattern, "muffleMessage") [18:40:49.968] if (muffled) [18:40:49.968] invokeRestart("muffleMessage") [18:40:49.968] } [18:40:49.968] else if (inherits(cond, "warning")) { [18:40:49.968] muffled <- grepl(pattern, "muffleWarning") [18:40:49.968] if (muffled) [18:40:49.968] invokeRestart("muffleWarning") [18:40:49.968] } [18:40:49.968] else if (inherits(cond, "condition")) { [18:40:49.968] if (!is.null(pattern)) { [18:40:49.968] computeRestarts <- base::computeRestarts [18:40:49.968] grepl <- base::grepl [18:40:49.968] restarts <- computeRestarts(cond) [18:40:49.968] for (restart in restarts) { [18:40:49.968] name <- restart$name [18:40:49.968] if (is.null(name)) [18:40:49.968] next [18:40:49.968] if (!grepl(pattern, name)) [18:40:49.968] next [18:40:49.968] invokeRestart(restart) [18:40:49.968] muffled <- TRUE [18:40:49.968] break [18:40:49.968] } [18:40:49.968] } [18:40:49.968] } [18:40:49.968] invisible(muffled) [18:40:49.968] } [18:40:49.968] muffleCondition(cond) [18:40:49.968] }) [18:40:49.968] })) [18:40:49.968] future::FutureResult(value = ...future.value$value, [18:40:49.968] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:40:49.968] ...future.rng), globalenv = if (FALSE) [18:40:49.968] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:40:49.968] ...future.globalenv.names)) [18:40:49.968] else NULL, started = ...future.startTime, version = "1.8") [18:40:49.968] }, condition = base::local({ [18:40:49.968] c <- base::c [18:40:49.968] inherits <- base::inherits [18:40:49.968] invokeRestart <- base::invokeRestart [18:40:49.968] length <- base::length [18:40:49.968] list <- base::list [18:40:49.968] seq.int <- base::seq.int [18:40:49.968] signalCondition <- base::signalCondition [18:40:49.968] sys.calls <- base::sys.calls [18:40:49.968] `[[` <- base::`[[` [18:40:49.968] `+` <- base::`+` [18:40:49.968] `<<-` <- base::`<<-` [18:40:49.968] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:40:49.968] calls[seq.int(from = from + 12L, to = length(calls) - [18:40:49.968] 3L)] [18:40:49.968] } [18:40:49.968] function(cond) { [18:40:49.968] is_error <- inherits(cond, "error") [18:40:49.968] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:40:49.968] NULL) [18:40:49.968] if (is_error) { [18:40:49.968] sessionInformation <- function() { [18:40:49.968] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:40:49.968] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:40:49.968] search = base::search(), system = base::Sys.info()) [18:40:49.968] } [18:40:49.968] ...future.conditions[[length(...future.conditions) + [18:40:49.968] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:40:49.968] cond$call), session = sessionInformation(), [18:40:49.968] timestamp = base::Sys.time(), signaled = 0L) [18:40:49.968] signalCondition(cond) [18:40:49.968] } [18:40:49.968] else if (!ignore && TRUE && inherits(cond, "immediateCondition")) { [18:40:49.968] signal <- TRUE && inherits(cond, "immediateCondition") [18:40:49.968] ...future.conditions[[length(...future.conditions) + [18:40:49.968] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:40:49.968] if (TRUE && !signal) { [18:40:49.968] muffleCondition <- function (cond, pattern = "^muffle") [18:40:49.968] { [18:40:49.968] inherits <- base::inherits [18:40:49.968] invokeRestart <- base::invokeRestart [18:40:49.968] is.null <- base::is.null [18:40:49.968] muffled <- FALSE [18:40:49.968] if (inherits(cond, "message")) { [18:40:49.968] muffled <- grepl(pattern, "muffleMessage") [18:40:49.968] if (muffled) [18:40:49.968] invokeRestart("muffleMessage") [18:40:49.968] } [18:40:49.968] else if (inherits(cond, "warning")) { [18:40:49.968] muffled <- grepl(pattern, "muffleWarning") [18:40:49.968] if (muffled) [18:40:49.968] invokeRestart("muffleWarning") [18:40:49.968] } [18:40:49.968] else if (inherits(cond, "condition")) { [18:40:49.968] if (!is.null(pattern)) { [18:40:49.968] computeRestarts <- base::computeRestarts [18:40:49.968] grepl <- base::grepl [18:40:49.968] restarts <- computeRestarts(cond) [18:40:49.968] for (restart in restarts) { [18:40:49.968] name <- restart$name [18:40:49.968] if (is.null(name)) [18:40:49.968] next [18:40:49.968] if (!grepl(pattern, name)) [18:40:49.968] next [18:40:49.968] invokeRestart(restart) [18:40:49.968] muffled <- TRUE [18:40:49.968] break [18:40:49.968] } [18:40:49.968] } [18:40:49.968] } [18:40:49.968] invisible(muffled) [18:40:49.968] } [18:40:49.968] muffleCondition(cond, pattern = "^muffle") [18:40:49.968] } [18:40:49.968] } [18:40:49.968] else { [18:40:49.968] if (TRUE) { [18:40:49.968] muffleCondition <- function (cond, pattern = "^muffle") [18:40:49.968] { [18:40:49.968] inherits <- base::inherits [18:40:49.968] invokeRestart <- base::invokeRestart [18:40:49.968] is.null <- base::is.null [18:40:49.968] muffled <- FALSE [18:40:49.968] if (inherits(cond, "message")) { [18:40:49.968] muffled <- grepl(pattern, "muffleMessage") [18:40:49.968] if (muffled) [18:40:49.968] invokeRestart("muffleMessage") [18:40:49.968] } [18:40:49.968] else if (inherits(cond, "warning")) { [18:40:49.968] muffled <- grepl(pattern, "muffleWarning") [18:40:49.968] if (muffled) [18:40:49.968] invokeRestart("muffleWarning") [18:40:49.968] } [18:40:49.968] else if (inherits(cond, "condition")) { [18:40:49.968] if (!is.null(pattern)) { [18:40:49.968] computeRestarts <- base::computeRestarts [18:40:49.968] grepl <- base::grepl [18:40:49.968] restarts <- computeRestarts(cond) [18:40:49.968] for (restart in restarts) { [18:40:49.968] name <- restart$name [18:40:49.968] if (is.null(name)) [18:40:49.968] next [18:40:49.968] if (!grepl(pattern, name)) [18:40:49.968] next [18:40:49.968] invokeRestart(restart) [18:40:49.968] muffled <- TRUE [18:40:49.968] break [18:40:49.968] } [18:40:49.968] } [18:40:49.968] } [18:40:49.968] invisible(muffled) [18:40:49.968] } [18:40:49.968] muffleCondition(cond, pattern = "^muffle") [18:40:49.968] } [18:40:49.968] } [18:40:49.968] } [18:40:49.968] })) [18:40:49.968] }, error = function(ex) { [18:40:49.968] base::structure(base::list(value = NULL, visible = NULL, [18:40:49.968] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:40:49.968] ...future.rng), started = ...future.startTime, [18:40:49.968] finished = Sys.time(), session_uuid = NA_character_, [18:40:49.968] version = "1.8"), class = "FutureResult") [18:40:49.968] }, finally = { [18:40:49.968] if (!identical(...future.workdir, getwd())) [18:40:49.968] setwd(...future.workdir) [18:40:49.968] { [18:40:49.968] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:40:49.968] ...future.oldOptions$nwarnings <- NULL [18:40:49.968] } [18:40:49.968] base::options(...future.oldOptions) [18:40:49.968] if (.Platform$OS.type == "windows") { [18:40:49.968] old_names <- names(...future.oldEnvVars) [18:40:49.968] envs <- base::Sys.getenv() [18:40:49.968] names <- names(envs) [18:40:49.968] common <- intersect(names, old_names) [18:40:49.968] added <- setdiff(names, old_names) [18:40:49.968] removed <- setdiff(old_names, names) [18:40:49.968] changed <- common[...future.oldEnvVars[common] != [18:40:49.968] envs[common]] [18:40:49.968] NAMES <- toupper(changed) [18:40:49.968] args <- list() [18:40:49.968] for (kk in seq_along(NAMES)) { [18:40:49.968] name <- changed[[kk]] [18:40:49.968] NAME <- NAMES[[kk]] [18:40:49.968] if (name != NAME && is.element(NAME, old_names)) [18:40:49.968] next [18:40:49.968] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:49.968] } [18:40:49.968] NAMES <- toupper(added) [18:40:49.968] for (kk in seq_along(NAMES)) { [18:40:49.968] name <- added[[kk]] [18:40:49.968] NAME <- NAMES[[kk]] [18:40:49.968] if (name != NAME && is.element(NAME, old_names)) [18:40:49.968] next [18:40:49.968] args[[name]] <- "" [18:40:49.968] } [18:40:49.968] NAMES <- toupper(removed) [18:40:49.968] for (kk in seq_along(NAMES)) { [18:40:49.968] name <- removed[[kk]] [18:40:49.968] NAME <- NAMES[[kk]] [18:40:49.968] if (name != NAME && is.element(NAME, old_names)) [18:40:49.968] next [18:40:49.968] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:49.968] } [18:40:49.968] if (length(args) > 0) [18:40:49.968] base::do.call(base::Sys.setenv, args = args) [18:40:49.968] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:40:49.968] } [18:40:49.968] else { [18:40:49.968] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:40:49.968] } [18:40:49.968] { [18:40:49.968] if (base::length(...future.futureOptionsAdded) > [18:40:49.968] 0L) { [18:40:49.968] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:40:49.968] base::names(opts) <- ...future.futureOptionsAdded [18:40:49.968] base::options(opts) [18:40:49.968] } [18:40:49.968] { [18:40:49.968] { [18:40:49.968] base::options(mc.cores = ...future.mc.cores.old) [18:40:49.968] NULL [18:40:49.968] } [18:40:49.968] options(future.plan = NULL) [18:40:49.968] if (is.na(NA_character_)) [18:40:49.968] Sys.unsetenv("R_FUTURE_PLAN") [18:40:49.968] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:40:49.968] future::plan(...future.strategy.old, .cleanup = FALSE, [18:40:49.968] .init = FALSE) [18:40:49.968] } [18:40:49.968] } [18:40:49.968] } [18:40:49.968] }) [18:40:49.968] if (TRUE) { [18:40:49.968] base::sink(type = "output", split = FALSE) [18:40:49.968] if (TRUE) { [18:40:49.968] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:40:49.968] } [18:40:49.968] else { [18:40:49.968] ...future.result["stdout"] <- base::list(NULL) [18:40:49.968] } [18:40:49.968] base::close(...future.stdout) [18:40:49.968] ...future.stdout <- NULL [18:40:49.968] } [18:40:49.968] ...future.result$conditions <- ...future.conditions [18:40:49.968] ...future.result$finished <- base::Sys.time() [18:40:49.968] ...future.result [18:40:49.968] } [18:40:49.974] Exporting 5 global objects (4.35 KiB) to cluster node #1 ... [18:40:49.974] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:40:49.974] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:40:49.975] Exporting '...future.FUN' (3.66 KiB) to cluster node #1 ... [18:40:49.975] Exporting '...future.FUN' (3.66 KiB) to cluster node #1 ... DONE [18:40:49.975] Exporting '...future.elements_ii' (47 bytes) to cluster node #1 ... [18:40:49.975] Exporting '...future.elements_ii' (47 bytes) to cluster node #1 ... DONE [18:40:49.976] Exporting '...future.seeds_ii' (67 bytes) to cluster node #1 ... [18:40:49.976] Exporting '...future.seeds_ii' (67 bytes) to cluster node #1 ... DONE [18:40:49.976] Exporting '...future.globals.maxSize' (39 bytes) to cluster node #1 ... [18:40:49.977] Exporting '...future.globals.maxSize' (39 bytes) to cluster node #1 ... DONE [18:40:49.977] Exporting 5 global objects (4.35 KiB) to cluster node #1 ... DONE [18:40:49.977] MultisessionFuture started [18:40:49.978] - Launch lazy future ... done [18:40:49.978] run() for 'MultisessionFuture' ... done [18:40:49.978] Created future: [18:40:49.991] receiveMessageFromWorker() for ClusterFuture ... [18:40:49.991] - Validating connection of MultisessionFuture [18:40:49.992] - received message: FutureResult [18:40:49.992] - Received FutureResult [18:40:49.992] - Erased future from FutureRegistry [18:40:49.992] result() for ClusterFuture ... [18:40:49.992] - result already collected: FutureResult [18:40:49.993] result() for ClusterFuture ... done [18:40:49.993] receiveMessageFromWorker() for ClusterFuture ... done [18:40:49.978] MultisessionFuture: [18:40:49.978] Label: 'future_apply-1' [18:40:49.978] Expression: [18:40:49.978] { [18:40:49.978] do.call(function(...) { [18:40:49.978] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:49.978] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:49.978] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:49.978] on.exit(options(oopts), add = TRUE) [18:40:49.978] } [18:40:49.978] { [18:40:49.978] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:49.978] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:49.978] assign(".Random.seed", ...future.seeds_ii[[jj]], [18:40:49.978] envir = globalenv(), inherits = FALSE) [18:40:49.978] ...future.FUN(...future.X_jj, ...) [18:40:49.978] }) [18:40:49.978] } [18:40:49.978] }, args = future.call.arguments) [18:40:49.978] } [18:40:49.978] Lazy evaluation: FALSE [18:40:49.978] Asynchronous evaluation: TRUE [18:40:49.978] Local evaluation: TRUE [18:40:49.978] Environment: R_GlobalEnv [18:40:49.978] Capture standard output: TRUE [18:40:49.978] Capture condition classes: [18:40:49.978] Globals: 5 objects totaling 3.90 KiB (DotDotDotList 'future.call.arguments' of 97 bytes, function '...future.FUN' of 3.66 KiB, list '...future.elements_ii' of 47 bytes, list '...future.seeds_ii' of 67 bytes, numeric '...future.globals.maxSize' of 39 bytes) [18:40:49.978] Packages: [18:40:49.978] L'Ecuyer-CMRG RNG seed: (seed = NULL) [18:40:49.978] Resolved: TRUE [18:40:49.978] Value: [18:40:49.978] Conditions captured: [18:40:49.978] Early signaling: FALSE [18:40:49.978] Owner process: 2171382a-9202-bc7d-80d6-248e0cb487f4 [18:40:49.978] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:40:49.993] Chunk #1 of 2 ... DONE [18:40:49.993] Chunk #2 of 2 ... [18:40:49.994] - Adjusted option 'future.globals.maxSize': Inf -> 2 * Inf = Inf (bytes) [18:40:49.994] - seeds: [1] [18:40:49.994] - All globals exported: [n=5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:49.994] getGlobalsAndPackages() ... [18:40:49.994] - globals passed as-is: [5] '...', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:49.995] Resolving globals: FALSE [18:40:49.995] Tweak future expression to call with '...' arguments ... [18:40:49.995] { [18:40:49.995] do.call(function(...) { [18:40:49.995] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:49.995] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:49.995] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:49.995] on.exit(options(oopts), add = TRUE) [18:40:49.995] } [18:40:49.995] { [18:40:49.995] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:49.995] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:49.995] assign(".Random.seed", ...future.seeds_ii[[jj]], [18:40:49.995] envir = globalenv(), inherits = FALSE) [18:40:49.995] ...future.FUN(...future.X_jj, ...) [18:40:49.995] }) [18:40:49.995] } [18:40:49.995] }, args = future.call.arguments) [18:40:49.995] } [18:40:49.995] Tweak future expression to call with '...' arguments ... DONE [18:40:49.996] - globals: [5] 'future.call.arguments', '...future.FUN', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:40:49.996] [18:40:49.996] getGlobalsAndPackages() ... DONE [18:40:49.997] run() for 'Future' ... [18:40:49.997] - state: 'created' [18:40:49.997] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:40:50.014] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:40:50.015] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:40:50.015] - Field: 'node' [18:40:50.015] - Field: 'label' [18:40:50.015] - Field: 'local' [18:40:50.015] - Field: 'owner' [18:40:50.016] - Field: 'envir' [18:40:50.016] - Field: 'workers' [18:40:50.016] - Field: 'packages' [18:40:50.016] - Field: 'gc' [18:40:50.016] - Field: 'conditions' [18:40:50.016] - Field: 'persistent' [18:40:50.017] - Field: 'expr' [18:40:50.017] - Field: 'uuid' [18:40:50.017] - Field: 'seed' [18:40:50.017] - Field: 'version' [18:40:50.017] - Field: 'result' [18:40:50.017] - Field: 'asynchronous' [18:40:50.018] - Field: 'calls' [18:40:50.018] - Field: 'globals' [18:40:50.018] - Field: 'stdout' [18:40:50.018] - Field: 'earlySignal' [18:40:50.018] - Field: 'lazy' [18:40:50.018] - Field: 'state' [18:40:50.019] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:40:50.019] - Launch lazy future ... [18:40:50.019] Packages needed by the future expression (n = 0): [18:40:50.019] Packages needed by future strategies (n = 0): [18:40:50.020] { [18:40:50.020] { [18:40:50.020] { [18:40:50.020] ...future.startTime <- base::Sys.time() [18:40:50.020] { [18:40:50.020] { [18:40:50.020] { [18:40:50.020] { [18:40:50.020] base::local({ [18:40:50.020] has_future <- base::requireNamespace("future", [18:40:50.020] quietly = TRUE) [18:40:50.020] if (has_future) { [18:40:50.020] ns <- base::getNamespace("future") [18:40:50.020] version <- ns[[".package"]][["version"]] [18:40:50.020] if (is.null(version)) [18:40:50.020] version <- utils::packageVersion("future") [18:40:50.020] } [18:40:50.020] else { [18:40:50.020] version <- NULL [18:40:50.020] } [18:40:50.020] if (!has_future || version < "1.8.0") { [18:40:50.020] info <- base::c(r_version = base::gsub("R version ", [18:40:50.020] "", base::R.version$version.string), [18:40:50.020] platform = base::sprintf("%s (%s-bit)", [18:40:50.020] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:40:50.020] os = base::paste(base::Sys.info()[base::c("sysname", [18:40:50.020] "release", "version")], collapse = " "), [18:40:50.020] hostname = base::Sys.info()[["nodename"]]) [18:40:50.020] info <- base::sprintf("%s: %s", base::names(info), [18:40:50.020] info) [18:40:50.020] info <- base::paste(info, collapse = "; ") [18:40:50.020] if (!has_future) { [18:40:50.020] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:40:50.020] info) [18:40:50.020] } [18:40:50.020] else { [18:40:50.020] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:40:50.020] info, version) [18:40:50.020] } [18:40:50.020] base::stop(msg) [18:40:50.020] } [18:40:50.020] }) [18:40:50.020] } [18:40:50.020] ...future.mc.cores.old <- base::getOption("mc.cores") [18:40:50.020] base::options(mc.cores = 1L) [18:40:50.020] } [18:40:50.020] ...future.strategy.old <- future::plan("list") [18:40:50.020] options(future.plan = NULL) [18:40:50.020] Sys.unsetenv("R_FUTURE_PLAN") [18:40:50.020] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:40:50.020] } [18:40:50.020] ...future.workdir <- getwd() [18:40:50.020] } [18:40:50.020] ...future.oldOptions <- base::as.list(base::.Options) [18:40:50.020] ...future.oldEnvVars <- base::Sys.getenv() [18:40:50.020] } [18:40:50.020] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:40:50.020] future.globals.maxSize = Inf, future.globals.method = NULL, [18:40:50.020] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:40:50.020] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:40:50.020] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:40:50.020] future.stdout.windows.reencode = NULL, width = 80L) [18:40:50.020] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:40:50.020] base::names(...future.oldOptions)) [18:40:50.020] } [18:40:50.020] if (FALSE) { [18:40:50.020] } [18:40:50.020] else { [18:40:50.020] if (TRUE) { [18:40:50.020] ...future.stdout <- base::rawConnection(base::raw(0L), [18:40:50.020] open = "w") [18:40:50.020] } [18:40:50.020] else { [18:40:50.020] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:40:50.020] windows = "NUL", "/dev/null"), open = "w") [18:40:50.020] } [18:40:50.020] base::sink(...future.stdout, type = "output", split = FALSE) [18:40:50.020] base::on.exit(if (!base::is.null(...future.stdout)) { [18:40:50.020] base::sink(type = "output", split = FALSE) [18:40:50.020] base::close(...future.stdout) [18:40:50.020] }, add = TRUE) [18:40:50.020] } [18:40:50.020] ...future.frame <- base::sys.nframe() [18:40:50.020] ...future.conditions <- base::list() [18:40:50.020] ...future.rng <- base::globalenv()$.Random.seed [18:40:50.020] if (FALSE) { [18:40:50.020] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:40:50.020] "...future.value", "...future.globalenv.names", ".Random.seed") [18:40:50.020] } [18:40:50.020] ...future.result <- base::tryCatch({ [18:40:50.020] base::withCallingHandlers({ [18:40:50.020] ...future.value <- base::withVisible(base::local({ [18:40:50.020] ...future.makeSendCondition <- base::local({ [18:40:50.020] sendCondition <- NULL [18:40:50.020] function(frame = 1L) { [18:40:50.020] if (is.function(sendCondition)) [18:40:50.020] return(sendCondition) [18:40:50.020] ns <- getNamespace("parallel") [18:40:50.020] if (exists("sendData", mode = "function", [18:40:50.020] envir = ns)) { [18:40:50.020] parallel_sendData <- get("sendData", mode = "function", [18:40:50.020] envir = ns) [18:40:50.020] envir <- sys.frame(frame) [18:40:50.020] master <- NULL [18:40:50.020] while (!identical(envir, .GlobalEnv) && [18:40:50.020] !identical(envir, emptyenv())) { [18:40:50.020] if (exists("master", mode = "list", envir = envir, [18:40:50.020] inherits = FALSE)) { [18:40:50.020] master <- get("master", mode = "list", [18:40:50.020] envir = envir, inherits = FALSE) [18:40:50.020] if (inherits(master, c("SOCKnode", [18:40:50.020] "SOCK0node"))) { [18:40:50.020] sendCondition <<- function(cond) { [18:40:50.020] data <- list(type = "VALUE", value = cond, [18:40:50.020] success = TRUE) [18:40:50.020] parallel_sendData(master, data) [18:40:50.020] } [18:40:50.020] return(sendCondition) [18:40:50.020] } [18:40:50.020] } [18:40:50.020] frame <- frame + 1L [18:40:50.020] envir <- sys.frame(frame) [18:40:50.020] } [18:40:50.020] } [18:40:50.020] sendCondition <<- function(cond) NULL [18:40:50.020] } [18:40:50.020] }) [18:40:50.020] withCallingHandlers({ [18:40:50.020] { [18:40:50.020] do.call(function(...) { [18:40:50.020] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:50.020] if (!identical(...future.globals.maxSize.org, [18:40:50.020] ...future.globals.maxSize)) { [18:40:50.020] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:50.020] on.exit(options(oopts), add = TRUE) [18:40:50.020] } [18:40:50.020] { [18:40:50.020] lapply(seq_along(...future.elements_ii), [18:40:50.020] FUN = function(jj) { [18:40:50.020] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:50.020] assign(".Random.seed", ...future.seeds_ii[[jj]], [18:40:50.020] envir = globalenv(), inherits = FALSE) [18:40:50.020] ...future.FUN(...future.X_jj, ...) [18:40:50.020] }) [18:40:50.020] } [18:40:50.020] }, args = future.call.arguments) [18:40:50.020] } [18:40:50.020] }, immediateCondition = function(cond) { [18:40:50.020] sendCondition <- ...future.makeSendCondition() [18:40:50.020] sendCondition(cond) [18:40:50.020] muffleCondition <- function (cond, pattern = "^muffle") [18:40:50.020] { [18:40:50.020] inherits <- base::inherits [18:40:50.020] invokeRestart <- base::invokeRestart [18:40:50.020] is.null <- base::is.null [18:40:50.020] muffled <- FALSE [18:40:50.020] if (inherits(cond, "message")) { [18:40:50.020] muffled <- grepl(pattern, "muffleMessage") [18:40:50.020] if (muffled) [18:40:50.020] invokeRestart("muffleMessage") [18:40:50.020] } [18:40:50.020] else if (inherits(cond, "warning")) { [18:40:50.020] muffled <- grepl(pattern, "muffleWarning") [18:40:50.020] if (muffled) [18:40:50.020] invokeRestart("muffleWarning") [18:40:50.020] } [18:40:50.020] else if (inherits(cond, "condition")) { [18:40:50.020] if (!is.null(pattern)) { [18:40:50.020] computeRestarts <- base::computeRestarts [18:40:50.020] grepl <- base::grepl [18:40:50.020] restarts <- computeRestarts(cond) [18:40:50.020] for (restart in restarts) { [18:40:50.020] name <- restart$name [18:40:50.020] if (is.null(name)) [18:40:50.020] next [18:40:50.020] if (!grepl(pattern, name)) [18:40:50.020] next [18:40:50.020] invokeRestart(restart) [18:40:50.020] muffled <- TRUE [18:40:50.020] break [18:40:50.020] } [18:40:50.020] } [18:40:50.020] } [18:40:50.020] invisible(muffled) [18:40:50.020] } [18:40:50.020] muffleCondition(cond) [18:40:50.020] }) [18:40:50.020] })) [18:40:50.020] future::FutureResult(value = ...future.value$value, [18:40:50.020] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:40:50.020] ...future.rng), globalenv = if (FALSE) [18:40:50.020] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:40:50.020] ...future.globalenv.names)) [18:40:50.020] else NULL, started = ...future.startTime, version = "1.8") [18:40:50.020] }, condition = base::local({ [18:40:50.020] c <- base::c [18:40:50.020] inherits <- base::inherits [18:40:50.020] invokeRestart <- base::invokeRestart [18:40:50.020] length <- base::length [18:40:50.020] list <- base::list [18:40:50.020] seq.int <- base::seq.int [18:40:50.020] signalCondition <- base::signalCondition [18:40:50.020] sys.calls <- base::sys.calls [18:40:50.020] `[[` <- base::`[[` [18:40:50.020] `+` <- base::`+` [18:40:50.020] `<<-` <- base::`<<-` [18:40:50.020] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:40:50.020] calls[seq.int(from = from + 12L, to = length(calls) - [18:40:50.020] 3L)] [18:40:50.020] } [18:40:50.020] function(cond) { [18:40:50.020] is_error <- inherits(cond, "error") [18:40:50.020] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:40:50.020] NULL) [18:40:50.020] if (is_error) { [18:40:50.020] sessionInformation <- function() { [18:40:50.020] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:40:50.020] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:40:50.020] search = base::search(), system = base::Sys.info()) [18:40:50.020] } [18:40:50.020] ...future.conditions[[length(...future.conditions) + [18:40:50.020] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:40:50.020] cond$call), session = sessionInformation(), [18:40:50.020] timestamp = base::Sys.time(), signaled = 0L) [18:40:50.020] signalCondition(cond) [18:40:50.020] } [18:40:50.020] else if (!ignore && TRUE && inherits(cond, "immediateCondition")) { [18:40:50.020] signal <- TRUE && inherits(cond, "immediateCondition") [18:40:50.020] ...future.conditions[[length(...future.conditions) + [18:40:50.020] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:40:50.020] if (TRUE && !signal) { [18:40:50.020] muffleCondition <- function (cond, pattern = "^muffle") [18:40:50.020] { [18:40:50.020] inherits <- base::inherits [18:40:50.020] invokeRestart <- base::invokeRestart [18:40:50.020] is.null <- base::is.null [18:40:50.020] muffled <- FALSE [18:40:50.020] if (inherits(cond, "message")) { [18:40:50.020] muffled <- grepl(pattern, "muffleMessage") [18:40:50.020] if (muffled) [18:40:50.020] invokeRestart("muffleMessage") [18:40:50.020] } [18:40:50.020] else if (inherits(cond, "warning")) { [18:40:50.020] muffled <- grepl(pattern, "muffleWarning") [18:40:50.020] if (muffled) [18:40:50.020] invokeRestart("muffleWarning") [18:40:50.020] } [18:40:50.020] else if (inherits(cond, "condition")) { [18:40:50.020] if (!is.null(pattern)) { [18:40:50.020] computeRestarts <- base::computeRestarts [18:40:50.020] grepl <- base::grepl [18:40:50.020] restarts <- computeRestarts(cond) [18:40:50.020] for (restart in restarts) { [18:40:50.020] name <- restart$name [18:40:50.020] if (is.null(name)) [18:40:50.020] next [18:40:50.020] if (!grepl(pattern, name)) [18:40:50.020] next [18:40:50.020] invokeRestart(restart) [18:40:50.020] muffled <- TRUE [18:40:50.020] break [18:40:50.020] } [18:40:50.020] } [18:40:50.020] } [18:40:50.020] invisible(muffled) [18:40:50.020] } [18:40:50.020] muffleCondition(cond, pattern = "^muffle") [18:40:50.020] } [18:40:50.020] } [18:40:50.020] else { [18:40:50.020] if (TRUE) { [18:40:50.020] muffleCondition <- function (cond, pattern = "^muffle") [18:40:50.020] { [18:40:50.020] inherits <- base::inherits [18:40:50.020] invokeRestart <- base::invokeRestart [18:40:50.020] is.null <- base::is.null [18:40:50.020] muffled <- FALSE [18:40:50.020] if (inherits(cond, "message")) { [18:40:50.020] muffled <- grepl(pattern, "muffleMessage") [18:40:50.020] if (muffled) [18:40:50.020] invokeRestart("muffleMessage") [18:40:50.020] } [18:40:50.020] else if (inherits(cond, "warning")) { [18:40:50.020] muffled <- grepl(pattern, "muffleWarning") [18:40:50.020] if (muffled) [18:40:50.020] invokeRestart("muffleWarning") [18:40:50.020] } [18:40:50.020] else if (inherits(cond, "condition")) { [18:40:50.020] if (!is.null(pattern)) { [18:40:50.020] computeRestarts <- base::computeRestarts [18:40:50.020] grepl <- base::grepl [18:40:50.020] restarts <- computeRestarts(cond) [18:40:50.020] for (restart in restarts) { [18:40:50.020] name <- restart$name [18:40:50.020] if (is.null(name)) [18:40:50.020] next [18:40:50.020] if (!grepl(pattern, name)) [18:40:50.020] next [18:40:50.020] invokeRestart(restart) [18:40:50.020] muffled <- TRUE [18:40:50.020] break [18:40:50.020] } [18:40:50.020] } [18:40:50.020] } [18:40:50.020] invisible(muffled) [18:40:50.020] } [18:40:50.020] muffleCondition(cond, pattern = "^muffle") [18:40:50.020] } [18:40:50.020] } [18:40:50.020] } [18:40:50.020] })) [18:40:50.020] }, error = function(ex) { [18:40:50.020] base::structure(base::list(value = NULL, visible = NULL, [18:40:50.020] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:40:50.020] ...future.rng), started = ...future.startTime, [18:40:50.020] finished = Sys.time(), session_uuid = NA_character_, [18:40:50.020] version = "1.8"), class = "FutureResult") [18:40:50.020] }, finally = { [18:40:50.020] if (!identical(...future.workdir, getwd())) [18:40:50.020] setwd(...future.workdir) [18:40:50.020] { [18:40:50.020] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:40:50.020] ...future.oldOptions$nwarnings <- NULL [18:40:50.020] } [18:40:50.020] base::options(...future.oldOptions) [18:40:50.020] if (.Platform$OS.type == "windows") { [18:40:50.020] old_names <- names(...future.oldEnvVars) [18:40:50.020] envs <- base::Sys.getenv() [18:40:50.020] names <- names(envs) [18:40:50.020] common <- intersect(names, old_names) [18:40:50.020] added <- setdiff(names, old_names) [18:40:50.020] removed <- setdiff(old_names, names) [18:40:50.020] changed <- common[...future.oldEnvVars[common] != [18:40:50.020] envs[common]] [18:40:50.020] NAMES <- toupper(changed) [18:40:50.020] args <- list() [18:40:50.020] for (kk in seq_along(NAMES)) { [18:40:50.020] name <- changed[[kk]] [18:40:50.020] NAME <- NAMES[[kk]] [18:40:50.020] if (name != NAME && is.element(NAME, old_names)) [18:40:50.020] next [18:40:50.020] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:50.020] } [18:40:50.020] NAMES <- toupper(added) [18:40:50.020] for (kk in seq_along(NAMES)) { [18:40:50.020] name <- added[[kk]] [18:40:50.020] NAME <- NAMES[[kk]] [18:40:50.020] if (name != NAME && is.element(NAME, old_names)) [18:40:50.020] next [18:40:50.020] args[[name]] <- "" [18:40:50.020] } [18:40:50.020] NAMES <- toupper(removed) [18:40:50.020] for (kk in seq_along(NAMES)) { [18:40:50.020] name <- removed[[kk]] [18:40:50.020] NAME <- NAMES[[kk]] [18:40:50.020] if (name != NAME && is.element(NAME, old_names)) [18:40:50.020] next [18:40:50.020] args[[name]] <- ...future.oldEnvVars[[name]] [18:40:50.020] } [18:40:50.020] if (length(args) > 0) [18:40:50.020] base::do.call(base::Sys.setenv, args = args) [18:40:50.020] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:40:50.020] } [18:40:50.020] else { [18:40:50.020] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:40:50.020] } [18:40:50.020] { [18:40:50.020] if (base::length(...future.futureOptionsAdded) > [18:40:50.020] 0L) { [18:40:50.020] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:40:50.020] base::names(opts) <- ...future.futureOptionsAdded [18:40:50.020] base::options(opts) [18:40:50.020] } [18:40:50.020] { [18:40:50.020] { [18:40:50.020] base::options(mc.cores = ...future.mc.cores.old) [18:40:50.020] NULL [18:40:50.020] } [18:40:50.020] options(future.plan = NULL) [18:40:50.020] if (is.na(NA_character_)) [18:40:50.020] Sys.unsetenv("R_FUTURE_PLAN") [18:40:50.020] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:40:50.020] future::plan(...future.strategy.old, .cleanup = FALSE, [18:40:50.020] .init = FALSE) [18:40:50.020] } [18:40:50.020] } [18:40:50.020] } [18:40:50.020] }) [18:40:50.020] if (TRUE) { [18:40:50.020] base::sink(type = "output", split = FALSE) [18:40:50.020] if (TRUE) { [18:40:50.020] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:40:50.020] } [18:40:50.020] else { [18:40:50.020] ...future.result["stdout"] <- base::list(NULL) [18:40:50.020] } [18:40:50.020] base::close(...future.stdout) [18:40:50.020] ...future.stdout <- NULL [18:40:50.020] } [18:40:50.020] ...future.result$conditions <- ...future.conditions [18:40:50.020] ...future.result$finished <- base::Sys.time() [18:40:50.020] ...future.result [18:40:50.020] } [18:40:50.025] Exporting 5 global objects (4.35 KiB) to cluster node #1 ... [18:40:50.025] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:40:50.026] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:40:50.026] Exporting '...future.FUN' (3.66 KiB) to cluster node #1 ... [18:40:50.026] Exporting '...future.FUN' (3.66 KiB) to cluster node #1 ... DONE [18:40:50.027] Exporting '...future.elements_ii' (47 bytes) to cluster node #1 ... [18:40:50.027] Exporting '...future.elements_ii' (47 bytes) to cluster node #1 ... DONE [18:40:50.027] Exporting '...future.seeds_ii' (67 bytes) to cluster node #1 ... [18:40:50.027] Exporting '...future.seeds_ii' (67 bytes) to cluster node #1 ... DONE [18:40:50.028] Exporting '...future.globals.maxSize' (39 bytes) to cluster node #1 ... [18:40:50.028] Exporting '...future.globals.maxSize' (39 bytes) to cluster node #1 ... DONE [18:40:50.028] Exporting 5 global objects (4.35 KiB) to cluster node #1 ... DONE [18:40:50.029] MultisessionFuture started [18:40:50.029] - Launch lazy future ... done [18:40:50.029] run() for 'MultisessionFuture' ... done [18:40:50.029] Created future: [18:40:50.044] receiveMessageFromWorker() for ClusterFuture ... [18:40:50.044] - Validating connection of MultisessionFuture [18:40:50.044] - received message: FutureResult [18:40:50.044] - Received FutureResult [18:40:50.045] - Erased future from FutureRegistry [18:40:50.045] result() for ClusterFuture ... [18:40:50.045] - result already collected: FutureResult [18:40:50.045] result() for ClusterFuture ... done [18:40:50.045] receiveMessageFromWorker() for ClusterFuture ... done [18:40:50.029] MultisessionFuture: [18:40:50.029] Label: 'future_apply-2' [18:40:50.029] Expression: [18:40:50.029] { [18:40:50.029] do.call(function(...) { [18:40:50.029] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:40:50.029] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:40:50.029] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:40:50.029] on.exit(options(oopts), add = TRUE) [18:40:50.029] } [18:40:50.029] { [18:40:50.029] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:40:50.029] ...future.X_jj <- ...future.elements_ii[[jj]] [18:40:50.029] assign(".Random.seed", ...future.seeds_ii[[jj]], [18:40:50.029] envir = globalenv(), inherits = FALSE) [18:40:50.029] ...future.FUN(...future.X_jj, ...) [18:40:50.029] }) [18:40:50.029] } [18:40:50.029] }, args = future.call.arguments) [18:40:50.029] } [18:40:50.029] Lazy evaluation: FALSE [18:40:50.029] Asynchronous evaluation: TRUE [18:40:50.029] Local evaluation: TRUE [18:40:50.029] Environment: R_GlobalEnv [18:40:50.029] Capture standard output: TRUE [18:40:50.029] Capture condition classes: [18:40:50.029] Globals: 5 objects totaling 3.90 KiB (DotDotDotList 'future.call.arguments' of 97 bytes, function '...future.FUN' of 3.66 KiB, list '...future.elements_ii' of 47 bytes, list '...future.seeds_ii' of 67 bytes, numeric '...future.globals.maxSize' of 39 bytes) [18:40:50.029] Packages: [18:40:50.029] L'Ecuyer-CMRG RNG seed: (seed = NULL) [18:40:50.029] Resolved: TRUE [18:40:50.029] Value: [18:40:50.029] Conditions captured: [18:40:50.029] Early signaling: FALSE [18:40:50.029] Owner process: 2171382a-9202-bc7d-80d6-248e0cb487f4 [18:40:50.029] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:40:50.046] Chunk #2 of 2 ... DONE [18:40:50.046] Launching 2 futures (chunks) ... DONE [18:40:50.046] Resolving 2 futures (chunks) ... [18:40:50.046] resolve() on list ... [18:40:50.046] recursive: 0 [18:40:50.047] length: 2 [18:40:50.047] [18:40:50.047] Future #1 [18:40:50.047] result() for ClusterFuture ... [18:40:50.050] - result already collected: FutureResult [18:40:50.050] result() for ClusterFuture ... done [18:40:50.050] result() for ClusterFuture ... [18:40:50.050] - result already collected: FutureResult [18:40:50.050] result() for ClusterFuture ... done [18:40:50.050] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:40:50.051] - nx: 2 [18:40:50.051] - relay: TRUE [18:40:50.051] - stdout: TRUE [18:40:50.051] - signal: TRUE [18:40:50.051] - resignal: FALSE [18:40:50.051] - force: TRUE [18:40:50.051] - relayed: [n=2] FALSE, FALSE [18:40:50.052] - queued futures: [n=2] FALSE, FALSE [18:40:50.052] - until=1 [18:40:50.052] - relaying element #1 [18:40:50.052] result() for ClusterFuture ... [18:40:50.052] - result already collected: FutureResult [18:40:50.052] result() for ClusterFuture ... done [18:40:50.053] result() for ClusterFuture ... [18:40:50.053] - result already collected: FutureResult [18:40:50.053] result() for ClusterFuture ... done [18:40:50.053] result() for ClusterFuture ... [18:40:50.053] - result already collected: FutureResult [18:40:50.053] result() for ClusterFuture ... done [18:40:50.054] result() for ClusterFuture ... [18:40:50.054] - result already collected: FutureResult [18:40:50.054] result() for ClusterFuture ... done [18:40:50.054] - relayed: [n=2] TRUE, FALSE [18:40:50.054] - queued futures: [n=2] TRUE, FALSE [18:40:50.054] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:40:50.054] length: 1 (resolved future 1) [18:40:50.055] Future #2 [18:40:50.055] result() for ClusterFuture ... [18:40:50.055] - result already collected: FutureResult [18:40:50.055] result() for ClusterFuture ... done [18:40:50.055] result() for ClusterFuture ... [18:40:50.055] - result already collected: FutureResult [18:40:50.056] result() for ClusterFuture ... done [18:40:50.056] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:40:50.056] - nx: 2 [18:40:50.056] - relay: TRUE [18:40:50.056] - stdout: TRUE [18:40:50.056] - signal: TRUE [18:40:50.057] - resignal: FALSE [18:40:50.057] - force: TRUE [18:40:50.057] - relayed: [n=2] TRUE, FALSE [18:40:50.057] - queued futures: [n=2] TRUE, FALSE [18:40:50.057] - until=2 [18:40:50.057] - relaying element #2 [18:40:50.057] result() for ClusterFuture ... [18:40:50.058] - result already collected: FutureResult [18:40:50.058] result() for ClusterFuture ... done [18:40:50.058] result() for ClusterFuture ... [18:40:50.058] - result already collected: FutureResult [18:40:50.058] result() for ClusterFuture ... done [18:40:50.058] result() for ClusterFuture ... [18:40:50.059] - result already collected: FutureResult [18:40:50.059] result() for ClusterFuture ... done [18:40:50.059] result() for ClusterFuture ... [18:40:50.059] - result already collected: FutureResult [18:40:50.059] result() for ClusterFuture ... done [18:40:50.059] - relayed: [n=2] TRUE, TRUE [18:40:50.059] - queued futures: [n=2] TRUE, TRUE [18:40:50.060] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:40:50.060] length: 0 (resolved future 2) [18:40:50.060] Relaying remaining futures [18:40:50.060] signalConditionsASAP(NULL, pos=0) ... [18:40:50.060] - nx: 2 [18:40:50.060] - relay: TRUE [18:40:50.061] - stdout: TRUE [18:40:50.061] - signal: TRUE [18:40:50.061] - resignal: FALSE [18:40:50.061] - force: TRUE [18:40:50.061] - relayed: [n=2] TRUE, TRUE [18:40:50.061] - queued futures: [n=2] TRUE, TRUE - flush all [18:40:50.062] - relayed: [n=2] TRUE, TRUE [18:40:50.062] - queued futures: [n=2] TRUE, TRUE [18:40:50.062] signalConditionsASAP(NULL, pos=0) ... done [18:40:50.062] resolve() on list ... DONE [18:40:50.062] result() for ClusterFuture ... [18:40:50.062] - result already collected: FutureResult [18:40:50.062] result() for ClusterFuture ... done [18:40:50.063] result() for ClusterFuture ... [18:40:50.063] - result already collected: FutureResult [18:40:50.063] result() for ClusterFuture ... done [18:40:50.063] result() for ClusterFuture ... [18:40:50.063] - result already collected: FutureResult [18:40:50.063] result() for ClusterFuture ... done [18:40:50.064] result() for ClusterFuture ... [18:40:50.064] - result already collected: FutureResult [18:40:50.064] result() for ClusterFuture ... done [18:40:50.064] - Number of value chunks collected: 2 [18:40:50.064] Resolving 2 futures (chunks) ... DONE [18:40:50.064] Reducing values from 2 chunks ... [18:40:50.064] - Number of values collected after concatenation: 2 [18:40:50.065] - Number of values expected: 2 [18:40:50.065] Reducing values from 2 chunks ... DONE [18:40:50.065] future_lapply() ... DONE [,1] [,2] [1,] 3 2 [2,] 1 4 [18:40:50.065] plan(): Setting new future strategy stack: [18:40:50.065] List of future strategies: [18:40:50.065] 1. sequential: [18:40:50.065] - args: function (..., envir = parent.frame(), workers = "") [18:40:50.065] - tweaked: FALSE [18:40:50.065] - call: plan(sequential) [18:40:50.075] plan(): nbrOfWorkers() = 1 *** strategy = 'multisession' ... done > > > message("*** apply(X, ...) - prod(dim(X)) == 0 [non-parallel] ...") *** apply(X, ...) - prod(dim(X)) == 0 [non-parallel] ... > X <- matrix(nrow = 0L, ncol = 2L) > y0 <- apply(X, MARGIN = 1L, FUN = identity) > y1 <- future_apply(X, MARGIN = 1L, FUN = identity) > print(y1) logical(0) > stopifnot(identical(y1, y0)) > > > message("*** exceptions ...") *** exceptions ... > > ## Error: dim(X) must have a positive length > res <- tryCatch({ + y <- future_apply(1L, MARGIN = 1L, FUN = identity) + }, error = identity) > stopifnot(inherits(res, "error")) > > ## Error: 'X' must have named dimnames > X <- matrix(1:2, nrow = 2L, ncol = 1L) > res <- tryCatch({ + y <- future_apply(X, MARGIN = "rows", FUN = identity) + }, error = identity) > stopifnot(inherits(res, "error")) > > ## Error: not all elements of 'MARGIN' are names of dimensions > X <- matrix(1:2, nrow = 2L, ncol = 1L, dimnames = list(rows = c("a", "b"))) > res <- tryCatch({ + y <- future_apply(X, MARGIN = "cols", FUN = identity) + }, error = identity) > stopifnot(inherits(res, "error")) > > > message("*** future_apply() ... DONE") *** future_apply() ... DONE > > source("incl/end.R") [18:40:50.077] plan(): Setting new future strategy stack: [18:40:50.077] List of future strategies: [18:40:50.077] 1. FutureStrategy: [18:40:50.077] - args: function (..., envir = parent.frame(), workers = "") [18:40:50.077] - tweaked: FALSE [18:40:50.077] - call: future::plan(oplan) [18:40:50.078] plan(): nbrOfWorkers() = 1 > > proc.time() user system elapsed 2.53 0.14 3.53