R Under development (unstable) (2023-12-20 r85711 ucrt) -- "Unsuffered Consequences" Copyright (C) 2023 The R Foundation for Statistical Computing Platform: x86_64-w64-mingw32/x64 R is free software and comes with ABSOLUTELY NO WARRANTY. You are welcome to redistribute it under certain conditions. Type 'license()' or 'licence()' for distribution details. R is a collaborative project with many contributors. Type 'contributors()' for more information and 'citation()' on how to cite R or R packages in publications. Type 'demo()' for some demos, 'help()' for on-line help, or 'help.start()' for an HTML browser interface to help. Type 'q()' to quit R. > source("incl/start.R") Loading required package: future [13:13:17.749] plan(): Setting new future strategy stack: [13:13:17.750] List of future strategies: [13:13:17.750] 1. sequential: [13:13:17.750] - args: function (..., envir = parent.frame(), workers = "") [13:13:17.750] - tweaked: FALSE [13:13:17.750] - call: future::plan("sequential") [13:13:17.765] plan(): nbrOfWorkers() = 1 > > message("*** future_eapply() ...") *** future_eapply() ... > > message("- From example(eapply) ...") - From example(eapply) ... > > for (strategy in supportedStrategies()) { + message(sprintf("*** strategy = %s ...", sQuote(strategy))) + plan(strategy) + + env <- new.env(hash = FALSE) + env$a <- 1:10 + env$beta <- exp(-3:3) + env$logic <- c(TRUE, FALSE, FALSE, TRUE) + + y0 <- unlist(eapply(env, mean, USE.NAMES = FALSE)) + y1 <- unlist(future_eapply(env, mean, USE.NAMES = FALSE)) + stopifnot(all.equal(y1, y0)) + + y0 <- eapply(env, quantile, probs = 1:3/4) + y1 <- future_eapply(env, quantile, probs = 1:3/4) + stopifnot(all.equal(y1, y0)) + + y0 <- eapply(env, quantile) + y1 <- future_eapply(env, quantile) + stopifnot(all.equal(y1, y0)) + y2 <- future_eapply(env, "quantile") + stopifnot(all.equal(y2, y0)) + + plan(sequential) + message(sprintf("*** strategy = %s ... done", sQuote(strategy))) + } ## for (strategy in ...) *** strategy = 'sequential' ... [13:13:17.788] plan(): Setting new future strategy stack: [13:13:17.788] List of future strategies: [13:13:17.788] 1. sequential: [13:13:17.788] - args: function (..., envir = parent.frame(), workers = "") [13:13:17.788] - tweaked: FALSE [13:13:17.788] - call: plan(strategy) [13:13:17.801] plan(): nbrOfWorkers() = 1 [13:13:17.801] future_lapply() ... [13:13:17.807] Number of chunks: 1 [13:13:17.807] getGlobalsAndPackagesXApply() ... [13:13:17.807] - future.globals: TRUE [13:13:17.808] getGlobalsAndPackages() ... [13:13:17.808] Searching for globals... [13:13:17.811] - globals found: [2] 'FUN', 'UseMethod' [13:13:17.811] Searching for globals ... DONE [13:13:17.811] Resolving globals: FALSE [13:13:17.812] The total size of the 1 globals is 1.21 KiB (1240 bytes) [13:13:17.813] The total size of the 1 globals exported for future expression ('FUN()') is 1.21 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (1.21 KiB of class 'function') [13:13:17.813] - globals: [1] 'FUN' [13:13:17.814] [13:13:17.814] getGlobalsAndPackages() ... DONE [13:13:17.815] - globals found/used: [n=1] 'FUN' [13:13:17.815] - needed namespaces: [n=0] [13:13:17.815] Finding globals ... DONE [13:13:17.816] - use_args: TRUE [13:13:17.816] - Getting '...' globals ... [13:13:17.817] resolve() on list ... [13:13:17.817] recursive: 0 [13:13:17.817] length: 1 [13:13:17.817] elements: '...' [13:13:17.818] length: 0 (resolved future 1) [13:13:17.818] resolve() on list ... DONE [13:13:17.818] - '...' content: [n=0] [13:13:17.818] List of 1 [13:13:17.818] $ ...: list() [13:13:17.818] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:17.818] - attr(*, "where")=List of 1 [13:13:17.818] ..$ ...: [13:13:17.818] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:17.818] - attr(*, "resolved")= logi TRUE [13:13:17.818] - attr(*, "total_size")= num NA [13:13:17.824] - Getting '...' globals ... DONE [13:13:17.824] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:17.825] List of 2 [13:13:17.825] $ ...future.FUN:function (x, ...) [13:13:17.825] $ ... : list() [13:13:17.825] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:17.825] - attr(*, "where")=List of 2 [13:13:17.825] ..$ ...future.FUN: [13:13:17.825] ..$ ... : [13:13:17.825] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:17.825] - attr(*, "resolved")= logi FALSE [13:13:17.825] - attr(*, "total_size")= num 1240 [13:13:17.828] Packages to be attached in all futures: [n=0] [13:13:17.828] getGlobalsAndPackagesXApply() ... DONE [13:13:17.828] Number of futures (= number of chunks): 1 [13:13:17.829] Launching 1 futures (chunks) ... [13:13:17.829] Chunk #1 of 1 ... [13:13:17.829] - Finding globals in 'X' for chunk #1 ... [13:13:17.829] getGlobalsAndPackages() ... [13:13:17.829] Searching for globals... [13:13:17.830] [13:13:17.830] Searching for globals ... DONE [13:13:17.830] - globals: [0] [13:13:17.830] getGlobalsAndPackages() ... DONE [13:13:17.831] + additional globals found: [n=0] [13:13:17.831] + additional namespaces needed: [n=0] [13:13:17.831] - Finding globals in 'X' for chunk #1 ... DONE [13:13:17.831] - seeds: [13:13:17.831] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:17.831] getGlobalsAndPackages() ... [13:13:17.832] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:17.832] Resolving globals: FALSE [13:13:17.832] Tweak future expression to call with '...' arguments ... [13:13:17.832] { [13:13:17.832] do.call(function(...) { [13:13:17.832] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:17.832] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:17.832] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:17.832] on.exit(options(oopts), add = TRUE) [13:13:17.832] } [13:13:17.832] { [13:13:17.832] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:17.832] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:17.832] ...future.FUN(...future.X_jj, ...) [13:13:17.832] }) [13:13:17.832] } [13:13:17.832] }, args = future.call.arguments) [13:13:17.832] } [13:13:17.833] Tweak future expression to call with '...' arguments ... DONE [13:13:17.833] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:17.833] [13:13:17.833] getGlobalsAndPackages() ... DONE [13:13:17.834] run() for 'Future' ... [13:13:17.835] - state: 'created' [13:13:17.835] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:17.835] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:17.836] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:17.836] - Field: 'label' [13:13:17.836] - Field: 'local' [13:13:17.836] - Field: 'owner' [13:13:17.836] - Field: 'envir' [13:13:17.836] - Field: 'packages' [13:13:17.837] - Field: 'gc' [13:13:17.837] - Field: 'conditions' [13:13:17.837] - Field: 'expr' [13:13:17.837] - Field: 'uuid' [13:13:17.837] - Field: 'seed' [13:13:17.837] - Field: 'version' [13:13:17.838] - Field: 'result' [13:13:17.838] - Field: 'asynchronous' [13:13:17.838] - Field: 'calls' [13:13:17.838] - Field: 'globals' [13:13:17.838] - Field: 'stdout' [13:13:17.839] - Field: 'earlySignal' [13:13:17.839] - Field: 'lazy' [13:13:17.839] - Field: 'state' [13:13:17.839] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:17.839] - Launch lazy future ... [13:13:17.840] Packages needed by the future expression (n = 0): [13:13:17.840] Packages needed by future strategies (n = 0): [13:13:17.841] { [13:13:17.841] { [13:13:17.841] { [13:13:17.841] ...future.startTime <- base::Sys.time() [13:13:17.841] { [13:13:17.841] { [13:13:17.841] { [13:13:17.841] base::local({ [13:13:17.841] has_future <- base::requireNamespace("future", [13:13:17.841] quietly = TRUE) [13:13:17.841] if (has_future) { [13:13:17.841] ns <- base::getNamespace("future") [13:13:17.841] version <- ns[[".package"]][["version"]] [13:13:17.841] if (is.null(version)) [13:13:17.841] version <- utils::packageVersion("future") [13:13:17.841] } [13:13:17.841] else { [13:13:17.841] version <- NULL [13:13:17.841] } [13:13:17.841] if (!has_future || version < "1.8.0") { [13:13:17.841] info <- base::c(r_version = base::gsub("R version ", [13:13:17.841] "", base::R.version$version.string), [13:13:17.841] platform = base::sprintf("%s (%s-bit)", [13:13:17.841] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:17.841] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:17.841] "release", "version")], collapse = " "), [13:13:17.841] hostname = base::Sys.info()[["nodename"]]) [13:13:17.841] info <- base::sprintf("%s: %s", base::names(info), [13:13:17.841] info) [13:13:17.841] info <- base::paste(info, collapse = "; ") [13:13:17.841] if (!has_future) { [13:13:17.841] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:17.841] info) [13:13:17.841] } [13:13:17.841] else { [13:13:17.841] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:17.841] info, version) [13:13:17.841] } [13:13:17.841] base::stop(msg) [13:13:17.841] } [13:13:17.841] }) [13:13:17.841] } [13:13:17.841] options(future.plan = NULL) [13:13:17.841] Sys.unsetenv("R_FUTURE_PLAN") [13:13:17.841] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:17.841] } [13:13:17.841] ...future.workdir <- getwd() [13:13:17.841] } [13:13:17.841] ...future.oldOptions <- base::as.list(base::.Options) [13:13:17.841] ...future.oldEnvVars <- base::Sys.getenv() [13:13:17.841] } [13:13:17.841] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:17.841] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:17.841] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:17.841] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:17.841] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:17.841] future.stdout.windows.reencode = NULL, width = 80L) [13:13:17.841] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:17.841] base::names(...future.oldOptions)) [13:13:17.841] } [13:13:17.841] if (FALSE) { [13:13:17.841] } [13:13:17.841] else { [13:13:17.841] if (TRUE) { [13:13:17.841] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:17.841] open = "w") [13:13:17.841] } [13:13:17.841] else { [13:13:17.841] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:17.841] windows = "NUL", "/dev/null"), open = "w") [13:13:17.841] } [13:13:17.841] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:17.841] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:17.841] base::sink(type = "output", split = FALSE) [13:13:17.841] base::close(...future.stdout) [13:13:17.841] }, add = TRUE) [13:13:17.841] } [13:13:17.841] ...future.frame <- base::sys.nframe() [13:13:17.841] ...future.conditions <- base::list() [13:13:17.841] ...future.rng <- base::globalenv()$.Random.seed [13:13:17.841] if (FALSE) { [13:13:17.841] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:17.841] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:17.841] } [13:13:17.841] ...future.result <- base::tryCatch({ [13:13:17.841] base::withCallingHandlers({ [13:13:17.841] ...future.value <- base::withVisible(base::local({ [13:13:17.841] do.call(function(...) { [13:13:17.841] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:17.841] if (!identical(...future.globals.maxSize.org, [13:13:17.841] ...future.globals.maxSize)) { [13:13:17.841] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:17.841] on.exit(options(oopts), add = TRUE) [13:13:17.841] } [13:13:17.841] { [13:13:17.841] lapply(seq_along(...future.elements_ii), [13:13:17.841] FUN = function(jj) { [13:13:17.841] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:17.841] ...future.FUN(...future.X_jj, ...) [13:13:17.841] }) [13:13:17.841] } [13:13:17.841] }, args = future.call.arguments) [13:13:17.841] })) [13:13:17.841] future::FutureResult(value = ...future.value$value, [13:13:17.841] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:17.841] ...future.rng), globalenv = if (FALSE) [13:13:17.841] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:17.841] ...future.globalenv.names)) [13:13:17.841] else NULL, started = ...future.startTime, version = "1.8") [13:13:17.841] }, condition = base::local({ [13:13:17.841] c <- base::c [13:13:17.841] inherits <- base::inherits [13:13:17.841] invokeRestart <- base::invokeRestart [13:13:17.841] length <- base::length [13:13:17.841] list <- base::list [13:13:17.841] seq.int <- base::seq.int [13:13:17.841] signalCondition <- base::signalCondition [13:13:17.841] sys.calls <- base::sys.calls [13:13:17.841] `[[` <- base::`[[` [13:13:17.841] `+` <- base::`+` [13:13:17.841] `<<-` <- base::`<<-` [13:13:17.841] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:17.841] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:17.841] 3L)] [13:13:17.841] } [13:13:17.841] function(cond) { [13:13:17.841] is_error <- inherits(cond, "error") [13:13:17.841] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:17.841] NULL) [13:13:17.841] if (is_error) { [13:13:17.841] sessionInformation <- function() { [13:13:17.841] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:17.841] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:17.841] search = base::search(), system = base::Sys.info()) [13:13:17.841] } [13:13:17.841] ...future.conditions[[length(...future.conditions) + [13:13:17.841] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:17.841] cond$call), session = sessionInformation(), [13:13:17.841] timestamp = base::Sys.time(), signaled = 0L) [13:13:17.841] signalCondition(cond) [13:13:17.841] } [13:13:17.841] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:17.841] "immediateCondition"))) { [13:13:17.841] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:17.841] ...future.conditions[[length(...future.conditions) + [13:13:17.841] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:17.841] if (TRUE && !signal) { [13:13:17.841] muffleCondition <- function (cond, pattern = "^muffle") [13:13:17.841] { [13:13:17.841] inherits <- base::inherits [13:13:17.841] invokeRestart <- base::invokeRestart [13:13:17.841] is.null <- base::is.null [13:13:17.841] muffled <- FALSE [13:13:17.841] if (inherits(cond, "message")) { [13:13:17.841] muffled <- grepl(pattern, "muffleMessage") [13:13:17.841] if (muffled) [13:13:17.841] invokeRestart("muffleMessage") [13:13:17.841] } [13:13:17.841] else if (inherits(cond, "warning")) { [13:13:17.841] muffled <- grepl(pattern, "muffleWarning") [13:13:17.841] if (muffled) [13:13:17.841] invokeRestart("muffleWarning") [13:13:17.841] } [13:13:17.841] else if (inherits(cond, "condition")) { [13:13:17.841] if (!is.null(pattern)) { [13:13:17.841] computeRestarts <- base::computeRestarts [13:13:17.841] grepl <- base::grepl [13:13:17.841] restarts <- computeRestarts(cond) [13:13:17.841] for (restart in restarts) { [13:13:17.841] name <- restart$name [13:13:17.841] if (is.null(name)) [13:13:17.841] next [13:13:17.841] if (!grepl(pattern, name)) [13:13:17.841] next [13:13:17.841] invokeRestart(restart) [13:13:17.841] muffled <- TRUE [13:13:17.841] break [13:13:17.841] } [13:13:17.841] } [13:13:17.841] } [13:13:17.841] invisible(muffled) [13:13:17.841] } [13:13:17.841] muffleCondition(cond, pattern = "^muffle") [13:13:17.841] } [13:13:17.841] } [13:13:17.841] else { [13:13:17.841] if (TRUE) { [13:13:17.841] muffleCondition <- function (cond, pattern = "^muffle") [13:13:17.841] { [13:13:17.841] inherits <- base::inherits [13:13:17.841] invokeRestart <- base::invokeRestart [13:13:17.841] is.null <- base::is.null [13:13:17.841] muffled <- FALSE [13:13:17.841] if (inherits(cond, "message")) { [13:13:17.841] muffled <- grepl(pattern, "muffleMessage") [13:13:17.841] if (muffled) [13:13:17.841] invokeRestart("muffleMessage") [13:13:17.841] } [13:13:17.841] else if (inherits(cond, "warning")) { [13:13:17.841] muffled <- grepl(pattern, "muffleWarning") [13:13:17.841] if (muffled) [13:13:17.841] invokeRestart("muffleWarning") [13:13:17.841] } [13:13:17.841] else if (inherits(cond, "condition")) { [13:13:17.841] if (!is.null(pattern)) { [13:13:17.841] computeRestarts <- base::computeRestarts [13:13:17.841] grepl <- base::grepl [13:13:17.841] restarts <- computeRestarts(cond) [13:13:17.841] for (restart in restarts) { [13:13:17.841] name <- restart$name [13:13:17.841] if (is.null(name)) [13:13:17.841] next [13:13:17.841] if (!grepl(pattern, name)) [13:13:17.841] next [13:13:17.841] invokeRestart(restart) [13:13:17.841] muffled <- TRUE [13:13:17.841] break [13:13:17.841] } [13:13:17.841] } [13:13:17.841] } [13:13:17.841] invisible(muffled) [13:13:17.841] } [13:13:17.841] muffleCondition(cond, pattern = "^muffle") [13:13:17.841] } [13:13:17.841] } [13:13:17.841] } [13:13:17.841] })) [13:13:17.841] }, error = function(ex) { [13:13:17.841] base::structure(base::list(value = NULL, visible = NULL, [13:13:17.841] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:17.841] ...future.rng), started = ...future.startTime, [13:13:17.841] finished = Sys.time(), session_uuid = NA_character_, [13:13:17.841] version = "1.8"), class = "FutureResult") [13:13:17.841] }, finally = { [13:13:17.841] if (!identical(...future.workdir, getwd())) [13:13:17.841] setwd(...future.workdir) [13:13:17.841] { [13:13:17.841] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:17.841] ...future.oldOptions$nwarnings <- NULL [13:13:17.841] } [13:13:17.841] base::options(...future.oldOptions) [13:13:17.841] if (.Platform$OS.type == "windows") { [13:13:17.841] old_names <- names(...future.oldEnvVars) [13:13:17.841] envs <- base::Sys.getenv() [13:13:17.841] names <- names(envs) [13:13:17.841] common <- intersect(names, old_names) [13:13:17.841] added <- setdiff(names, old_names) [13:13:17.841] removed <- setdiff(old_names, names) [13:13:17.841] changed <- common[...future.oldEnvVars[common] != [13:13:17.841] envs[common]] [13:13:17.841] NAMES <- toupper(changed) [13:13:17.841] args <- list() [13:13:17.841] for (kk in seq_along(NAMES)) { [13:13:17.841] name <- changed[[kk]] [13:13:17.841] NAME <- NAMES[[kk]] [13:13:17.841] if (name != NAME && is.element(NAME, old_names)) [13:13:17.841] next [13:13:17.841] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:17.841] } [13:13:17.841] NAMES <- toupper(added) [13:13:17.841] for (kk in seq_along(NAMES)) { [13:13:17.841] name <- added[[kk]] [13:13:17.841] NAME <- NAMES[[kk]] [13:13:17.841] if (name != NAME && is.element(NAME, old_names)) [13:13:17.841] next [13:13:17.841] args[[name]] <- "" [13:13:17.841] } [13:13:17.841] NAMES <- toupper(removed) [13:13:17.841] for (kk in seq_along(NAMES)) { [13:13:17.841] name <- removed[[kk]] [13:13:17.841] NAME <- NAMES[[kk]] [13:13:17.841] if (name != NAME && is.element(NAME, old_names)) [13:13:17.841] next [13:13:17.841] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:17.841] } [13:13:17.841] if (length(args) > 0) [13:13:17.841] base::do.call(base::Sys.setenv, args = args) [13:13:17.841] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:17.841] } [13:13:17.841] else { [13:13:17.841] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:17.841] } [13:13:17.841] { [13:13:17.841] if (base::length(...future.futureOptionsAdded) > [13:13:17.841] 0L) { [13:13:17.841] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:17.841] base::names(opts) <- ...future.futureOptionsAdded [13:13:17.841] base::options(opts) [13:13:17.841] } [13:13:17.841] { [13:13:17.841] { [13:13:17.841] NULL [13:13:17.841] RNGkind("Mersenne-Twister") [13:13:17.841] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:17.841] inherits = FALSE) [13:13:17.841] } [13:13:17.841] options(future.plan = NULL) [13:13:17.841] if (is.na(NA_character_)) [13:13:17.841] Sys.unsetenv("R_FUTURE_PLAN") [13:13:17.841] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:17.841] future::plan(list(function (..., envir = parent.frame()) [13:13:17.841] { [13:13:17.841] future <- SequentialFuture(..., envir = envir) [13:13:17.841] if (!future$lazy) [13:13:17.841] future <- run(future) [13:13:17.841] invisible(future) [13:13:17.841] }), .cleanup = FALSE, .init = FALSE) [13:13:17.841] } [13:13:17.841] } [13:13:17.841] } [13:13:17.841] }) [13:13:17.841] if (TRUE) { [13:13:17.841] base::sink(type = "output", split = FALSE) [13:13:17.841] if (TRUE) { [13:13:17.841] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:17.841] } [13:13:17.841] else { [13:13:17.841] ...future.result["stdout"] <- base::list(NULL) [13:13:17.841] } [13:13:17.841] base::close(...future.stdout) [13:13:17.841] ...future.stdout <- NULL [13:13:17.841] } [13:13:17.841] ...future.result$conditions <- ...future.conditions [13:13:17.841] ...future.result$finished <- base::Sys.time() [13:13:17.841] ...future.result [13:13:17.841] } [13:13:17.846] assign_globals() ... [13:13:17.846] List of 5 [13:13:17.846] $ ...future.FUN :function (x, ...) [13:13:17.846] $ future.call.arguments : list() [13:13:17.846] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:17.846] $ ...future.elements_ii :List of 3 [13:13:17.846] ..$ : logi [1:4] TRUE FALSE FALSE TRUE [13:13:17.846] ..$ : num [1:7] 0.0498 0.1353 0.3679 1 2.7183 ... [13:13:17.846] ..$ : int [1:10] 1 2 3 4 5 6 7 8 9 10 [13:13:17.846] $ ...future.seeds_ii : NULL [13:13:17.846] $ ...future.globals.maxSize: NULL [13:13:17.846] - attr(*, "where")=List of 5 [13:13:17.846] ..$ ...future.FUN : [13:13:17.846] ..$ future.call.arguments : [13:13:17.846] ..$ ...future.elements_ii : [13:13:17.846] ..$ ...future.seeds_ii : [13:13:17.846] ..$ ...future.globals.maxSize: [13:13:17.846] - attr(*, "resolved")= logi FALSE [13:13:17.846] - attr(*, "total_size")= num 1240 [13:13:17.846] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:17.846] - attr(*, "already-done")= logi TRUE [13:13:17.854] - copied '...future.FUN' to environment [13:13:17.854] - copied 'future.call.arguments' to environment [13:13:17.854] - copied '...future.elements_ii' to environment [13:13:17.854] - copied '...future.seeds_ii' to environment [13:13:17.854] - copied '...future.globals.maxSize' to environment [13:13:17.854] assign_globals() ... done [13:13:17.855] plan(): Setting new future strategy stack: [13:13:17.855] List of future strategies: [13:13:17.855] 1. sequential: [13:13:17.855] - args: function (..., envir = parent.frame(), workers = "") [13:13:17.855] - tweaked: FALSE [13:13:17.855] - call: NULL [13:13:17.856] plan(): nbrOfWorkers() = 1 [13:13:17.858] plan(): Setting new future strategy stack: [13:13:17.858] List of future strategies: [13:13:17.858] 1. sequential: [13:13:17.858] - args: function (..., envir = parent.frame(), workers = "") [13:13:17.858] - tweaked: FALSE [13:13:17.858] - call: plan(strategy) [13:13:17.859] plan(): nbrOfWorkers() = 1 [13:13:17.859] SequentialFuture started (and completed) [13:13:17.859] - Launch lazy future ... done [13:13:17.860] run() for 'SequentialFuture' ... done [13:13:17.860] Created future: [13:13:17.860] SequentialFuture: [13:13:17.860] Label: 'future_eapply-1' [13:13:17.860] Expression: [13:13:17.860] { [13:13:17.860] do.call(function(...) { [13:13:17.860] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:17.860] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:17.860] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:17.860] on.exit(options(oopts), add = TRUE) [13:13:17.860] } [13:13:17.860] { [13:13:17.860] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:17.860] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:17.860] ...future.FUN(...future.X_jj, ...) [13:13:17.860] }) [13:13:17.860] } [13:13:17.860] }, args = future.call.arguments) [13:13:17.860] } [13:13:17.860] Lazy evaluation: FALSE [13:13:17.860] Asynchronous evaluation: FALSE [13:13:17.860] Local evaluation: TRUE [13:13:17.860] Environment: R_GlobalEnv [13:13:17.860] Capture standard output: TRUE [13:13:17.860] Capture condition classes: 'condition' (excluding 'nothing') [13:13:17.860] Globals: 5 objects totaling 1.48 KiB (function '...future.FUN' of 1.21 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 272 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:13:17.860] Packages: [13:13:17.860] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:17.860] Resolved: TRUE [13:13:17.860] Value: 168 bytes of class 'list' [13:13:17.860] Early signaling: FALSE [13:13:17.860] Owner process: 9511365f-3977-b8d2-248f-88bd32fc0252 [13:13:17.860] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:17.862] Chunk #1 of 1 ... DONE [13:13:17.862] Launching 1 futures (chunks) ... DONE [13:13:17.862] Resolving 1 futures (chunks) ... [13:13:17.863] resolve() on list ... [13:13:17.863] recursive: 0 [13:13:17.863] length: 1 [13:13:17.863] [13:13:17.863] resolved() for 'SequentialFuture' ... [13:13:17.863] - state: 'finished' [13:13:17.864] - run: TRUE [13:13:17.864] - result: 'FutureResult' [13:13:17.864] resolved() for 'SequentialFuture' ... done [13:13:17.864] Future #1 [13:13:17.865] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:17.865] - nx: 1 [13:13:17.865] - relay: TRUE [13:13:17.865] - stdout: TRUE [13:13:17.865] - signal: TRUE [13:13:17.865] - resignal: FALSE [13:13:17.866] - force: TRUE [13:13:17.866] - relayed: [n=1] FALSE [13:13:17.866] - queued futures: [n=1] FALSE [13:13:17.866] - until=1 [13:13:17.866] - relaying element #1 [13:13:17.867] - relayed: [n=1] TRUE [13:13:17.867] - queued futures: [n=1] TRUE [13:13:17.867] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:17.867] length: 0 (resolved future 1) [13:13:17.867] Relaying remaining futures [13:13:17.867] signalConditionsASAP(NULL, pos=0) ... [13:13:17.868] - nx: 1 [13:13:17.868] - relay: TRUE [13:13:17.868] - stdout: TRUE [13:13:17.868] - signal: TRUE [13:13:17.868] - resignal: FALSE [13:13:17.868] - force: TRUE [13:13:17.868] - relayed: [n=1] TRUE [13:13:17.869] - queued futures: [n=1] TRUE - flush all [13:13:17.869] - relayed: [n=1] TRUE [13:13:17.869] - queued futures: [n=1] TRUE [13:13:17.869] signalConditionsASAP(NULL, pos=0) ... done [13:13:17.869] resolve() on list ... DONE [13:13:17.870] - Number of value chunks collected: 1 [13:13:17.870] Resolving 1 futures (chunks) ... DONE [13:13:17.870] Reducing values from 1 chunks ... [13:13:17.870] - Number of values collected after concatenation: 3 [13:13:17.870] - Number of values expected: 3 [13:13:17.870] Reducing values from 1 chunks ... DONE [13:13:17.871] future_lapply() ... DONE [13:13:17.873] future_lapply() ... [13:13:17.874] Number of chunks: 1 [13:13:17.874] getGlobalsAndPackagesXApply() ... [13:13:17.874] - future.globals: TRUE [13:13:17.874] getGlobalsAndPackages() ... [13:13:17.874] Searching for globals... [13:13:17.876] - globals found: [2] 'FUN', 'UseMethod' [13:13:17.876] Searching for globals ... DONE [13:13:17.876] Resolving globals: FALSE [13:13:17.877] The total size of the 1 globals is 1.22 KiB (1248 bytes) [13:13:17.877] The total size of the 1 globals exported for future expression ('FUN(probs = c(0.25, 0.5, 0.75))') is 1.22 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (1.22 KiB of class 'function') [13:13:17.877] - globals: [1] 'FUN' [13:13:17.877] - packages: [1] 'stats' [13:13:17.878] getGlobalsAndPackages() ... DONE [13:13:17.878] - globals found/used: [n=1] 'FUN' [13:13:17.878] - needed namespaces: [n=1] 'stats' [13:13:17.878] Finding globals ... DONE [13:13:17.878] - use_args: TRUE [13:13:17.878] - Getting '...' globals ... [13:13:17.879] resolve() on list ... [13:13:17.879] recursive: 0 [13:13:17.879] length: 1 [13:13:17.879] elements: '...' [13:13:17.879] length: 0 (resolved future 1) [13:13:17.880] resolve() on list ... DONE [13:13:17.880] - '...' content: [n=1] 'probs' [13:13:17.880] List of 1 [13:13:17.880] $ ...:List of 1 [13:13:17.880] ..$ probs: num [1:3] 0.25 0.5 0.75 [13:13:17.880] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:17.880] - attr(*, "where")=List of 1 [13:13:17.880] ..$ ...: [13:13:17.880] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:17.880] - attr(*, "resolved")= logi TRUE [13:13:17.880] - attr(*, "total_size")= num NA [13:13:17.883] - Getting '...' globals ... DONE [13:13:17.884] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:17.884] List of 2 [13:13:17.884] $ ...future.FUN:function (x, ...) [13:13:17.884] $ ... :List of 1 [13:13:17.884] ..$ probs: num [1:3] 0.25 0.5 0.75 [13:13:17.884] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:17.884] - attr(*, "where")=List of 2 [13:13:17.884] ..$ ...future.FUN: [13:13:17.884] ..$ ... : [13:13:17.884] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:17.884] - attr(*, "resolved")= logi FALSE [13:13:17.884] - attr(*, "total_size")= num 1328 [13:13:17.889] Packages to be attached in all futures: [n=1] 'stats' [13:13:17.889] getGlobalsAndPackagesXApply() ... DONE [13:13:17.889] Number of futures (= number of chunks): 1 [13:13:17.889] Launching 1 futures (chunks) ... [13:13:17.889] Chunk #1 of 1 ... [13:13:17.890] - Finding globals in 'X' for chunk #1 ... [13:13:17.890] getGlobalsAndPackages() ... [13:13:17.890] Searching for globals... [13:13:17.890] [13:13:17.890] Searching for globals ... DONE [13:13:17.891] - globals: [0] [13:13:17.891] getGlobalsAndPackages() ... DONE [13:13:17.891] + additional globals found: [n=0] [13:13:17.891] + additional namespaces needed: [n=0] [13:13:17.891] - Finding globals in 'X' for chunk #1 ... DONE [13:13:17.891] - seeds: [13:13:17.892] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:17.892] getGlobalsAndPackages() ... [13:13:17.892] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:17.892] Resolving globals: FALSE [13:13:17.892] Tweak future expression to call with '...' arguments ... [13:13:17.892] { [13:13:17.892] do.call(function(...) { [13:13:17.892] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:17.892] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:17.892] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:17.892] on.exit(options(oopts), add = TRUE) [13:13:17.892] } [13:13:17.892] { [13:13:17.892] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:17.892] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:17.892] ...future.FUN(...future.X_jj, ...) [13:13:17.892] }) [13:13:17.892] } [13:13:17.892] }, args = future.call.arguments) [13:13:17.892] } [13:13:17.893] Tweak future expression to call with '...' arguments ... DONE [13:13:17.893] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:17.894] - packages: [1] 'stats' [13:13:17.894] getGlobalsAndPackages() ... DONE [13:13:17.894] run() for 'Future' ... [13:13:17.894] - state: 'created' [13:13:17.894] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:17.895] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:17.895] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:17.895] - Field: 'label' [13:13:17.895] - Field: 'local' [13:13:17.896] - Field: 'owner' [13:13:17.896] - Field: 'envir' [13:13:17.896] - Field: 'packages' [13:13:17.896] - Field: 'gc' [13:13:17.896] - Field: 'conditions' [13:13:17.896] - Field: 'expr' [13:13:17.897] - Field: 'uuid' [13:13:17.897] - Field: 'seed' [13:13:17.897] - Field: 'version' [13:13:17.897] - Field: 'result' [13:13:17.897] - Field: 'asynchronous' [13:13:17.897] - Field: 'calls' [13:13:17.898] - Field: 'globals' [13:13:17.898] - Field: 'stdout' [13:13:17.898] - Field: 'earlySignal' [13:13:17.898] - Field: 'lazy' [13:13:17.898] - Field: 'state' [13:13:17.899] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:17.899] - Launch lazy future ... [13:13:17.899] Packages needed by the future expression (n = 1): 'stats' [13:13:17.899] Packages needed by future strategies (n = 0): [13:13:17.900] { [13:13:17.900] { [13:13:17.900] { [13:13:17.900] ...future.startTime <- base::Sys.time() [13:13:17.900] { [13:13:17.900] { [13:13:17.900] { [13:13:17.900] { [13:13:17.900] base::local({ [13:13:17.900] has_future <- base::requireNamespace("future", [13:13:17.900] quietly = TRUE) [13:13:17.900] if (has_future) { [13:13:17.900] ns <- base::getNamespace("future") [13:13:17.900] version <- ns[[".package"]][["version"]] [13:13:17.900] if (is.null(version)) [13:13:17.900] version <- utils::packageVersion("future") [13:13:17.900] } [13:13:17.900] else { [13:13:17.900] version <- NULL [13:13:17.900] } [13:13:17.900] if (!has_future || version < "1.8.0") { [13:13:17.900] info <- base::c(r_version = base::gsub("R version ", [13:13:17.900] "", base::R.version$version.string), [13:13:17.900] platform = base::sprintf("%s (%s-bit)", [13:13:17.900] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:17.900] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:17.900] "release", "version")], collapse = " "), [13:13:17.900] hostname = base::Sys.info()[["nodename"]]) [13:13:17.900] info <- base::sprintf("%s: %s", base::names(info), [13:13:17.900] info) [13:13:17.900] info <- base::paste(info, collapse = "; ") [13:13:17.900] if (!has_future) { [13:13:17.900] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:17.900] info) [13:13:17.900] } [13:13:17.900] else { [13:13:17.900] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:17.900] info, version) [13:13:17.900] } [13:13:17.900] base::stop(msg) [13:13:17.900] } [13:13:17.900] }) [13:13:17.900] } [13:13:17.900] base::local({ [13:13:17.900] for (pkg in "stats") { [13:13:17.900] base::loadNamespace(pkg) [13:13:17.900] base::library(pkg, character.only = TRUE) [13:13:17.900] } [13:13:17.900] }) [13:13:17.900] } [13:13:17.900] options(future.plan = NULL) [13:13:17.900] Sys.unsetenv("R_FUTURE_PLAN") [13:13:17.900] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:17.900] } [13:13:17.900] ...future.workdir <- getwd() [13:13:17.900] } [13:13:17.900] ...future.oldOptions <- base::as.list(base::.Options) [13:13:17.900] ...future.oldEnvVars <- base::Sys.getenv() [13:13:17.900] } [13:13:17.900] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:17.900] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:17.900] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:17.900] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:17.900] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:17.900] future.stdout.windows.reencode = NULL, width = 80L) [13:13:17.900] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:17.900] base::names(...future.oldOptions)) [13:13:17.900] } [13:13:17.900] if (FALSE) { [13:13:17.900] } [13:13:17.900] else { [13:13:17.900] if (TRUE) { [13:13:17.900] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:17.900] open = "w") [13:13:17.900] } [13:13:17.900] else { [13:13:17.900] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:17.900] windows = "NUL", "/dev/null"), open = "w") [13:13:17.900] } [13:13:17.900] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:17.900] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:17.900] base::sink(type = "output", split = FALSE) [13:13:17.900] base::close(...future.stdout) [13:13:17.900] }, add = TRUE) [13:13:17.900] } [13:13:17.900] ...future.frame <- base::sys.nframe() [13:13:17.900] ...future.conditions <- base::list() [13:13:17.900] ...future.rng <- base::globalenv()$.Random.seed [13:13:17.900] if (FALSE) { [13:13:17.900] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:17.900] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:17.900] } [13:13:17.900] ...future.result <- base::tryCatch({ [13:13:17.900] base::withCallingHandlers({ [13:13:17.900] ...future.value <- base::withVisible(base::local({ [13:13:17.900] do.call(function(...) { [13:13:17.900] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:17.900] if (!identical(...future.globals.maxSize.org, [13:13:17.900] ...future.globals.maxSize)) { [13:13:17.900] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:17.900] on.exit(options(oopts), add = TRUE) [13:13:17.900] } [13:13:17.900] { [13:13:17.900] lapply(seq_along(...future.elements_ii), [13:13:17.900] FUN = function(jj) { [13:13:17.900] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:17.900] ...future.FUN(...future.X_jj, ...) [13:13:17.900] }) [13:13:17.900] } [13:13:17.900] }, args = future.call.arguments) [13:13:17.900] })) [13:13:17.900] future::FutureResult(value = ...future.value$value, [13:13:17.900] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:17.900] ...future.rng), globalenv = if (FALSE) [13:13:17.900] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:17.900] ...future.globalenv.names)) [13:13:17.900] else NULL, started = ...future.startTime, version = "1.8") [13:13:17.900] }, condition = base::local({ [13:13:17.900] c <- base::c [13:13:17.900] inherits <- base::inherits [13:13:17.900] invokeRestart <- base::invokeRestart [13:13:17.900] length <- base::length [13:13:17.900] list <- base::list [13:13:17.900] seq.int <- base::seq.int [13:13:17.900] signalCondition <- base::signalCondition [13:13:17.900] sys.calls <- base::sys.calls [13:13:17.900] `[[` <- base::`[[` [13:13:17.900] `+` <- base::`+` [13:13:17.900] `<<-` <- base::`<<-` [13:13:17.900] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:17.900] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:17.900] 3L)] [13:13:17.900] } [13:13:17.900] function(cond) { [13:13:17.900] is_error <- inherits(cond, "error") [13:13:17.900] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:17.900] NULL) [13:13:17.900] if (is_error) { [13:13:17.900] sessionInformation <- function() { [13:13:17.900] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:17.900] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:17.900] search = base::search(), system = base::Sys.info()) [13:13:17.900] } [13:13:17.900] ...future.conditions[[length(...future.conditions) + [13:13:17.900] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:17.900] cond$call), session = sessionInformation(), [13:13:17.900] timestamp = base::Sys.time(), signaled = 0L) [13:13:17.900] signalCondition(cond) [13:13:17.900] } [13:13:17.900] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:17.900] "immediateCondition"))) { [13:13:17.900] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:17.900] ...future.conditions[[length(...future.conditions) + [13:13:17.900] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:17.900] if (TRUE && !signal) { [13:13:17.900] muffleCondition <- function (cond, pattern = "^muffle") [13:13:17.900] { [13:13:17.900] inherits <- base::inherits [13:13:17.900] invokeRestart <- base::invokeRestart [13:13:17.900] is.null <- base::is.null [13:13:17.900] muffled <- FALSE [13:13:17.900] if (inherits(cond, "message")) { [13:13:17.900] muffled <- grepl(pattern, "muffleMessage") [13:13:17.900] if (muffled) [13:13:17.900] invokeRestart("muffleMessage") [13:13:17.900] } [13:13:17.900] else if (inherits(cond, "warning")) { [13:13:17.900] muffled <- grepl(pattern, "muffleWarning") [13:13:17.900] if (muffled) [13:13:17.900] invokeRestart("muffleWarning") [13:13:17.900] } [13:13:17.900] else if (inherits(cond, "condition")) { [13:13:17.900] if (!is.null(pattern)) { [13:13:17.900] computeRestarts <- base::computeRestarts [13:13:17.900] grepl <- base::grepl [13:13:17.900] restarts <- computeRestarts(cond) [13:13:17.900] for (restart in restarts) { [13:13:17.900] name <- restart$name [13:13:17.900] if (is.null(name)) [13:13:17.900] next [13:13:17.900] if (!grepl(pattern, name)) [13:13:17.900] next [13:13:17.900] invokeRestart(restart) [13:13:17.900] muffled <- TRUE [13:13:17.900] break [13:13:17.900] } [13:13:17.900] } [13:13:17.900] } [13:13:17.900] invisible(muffled) [13:13:17.900] } [13:13:17.900] muffleCondition(cond, pattern = "^muffle") [13:13:17.900] } [13:13:17.900] } [13:13:17.900] else { [13:13:17.900] if (TRUE) { [13:13:17.900] muffleCondition <- function (cond, pattern = "^muffle") [13:13:17.900] { [13:13:17.900] inherits <- base::inherits [13:13:17.900] invokeRestart <- base::invokeRestart [13:13:17.900] is.null <- base::is.null [13:13:17.900] muffled <- FALSE [13:13:17.900] if (inherits(cond, "message")) { [13:13:17.900] muffled <- grepl(pattern, "muffleMessage") [13:13:17.900] if (muffled) [13:13:17.900] invokeRestart("muffleMessage") [13:13:17.900] } [13:13:17.900] else if (inherits(cond, "warning")) { [13:13:17.900] muffled <- grepl(pattern, "muffleWarning") [13:13:17.900] if (muffled) [13:13:17.900] invokeRestart("muffleWarning") [13:13:17.900] } [13:13:17.900] else if (inherits(cond, "condition")) { [13:13:17.900] if (!is.null(pattern)) { [13:13:17.900] computeRestarts <- base::computeRestarts [13:13:17.900] grepl <- base::grepl [13:13:17.900] restarts <- computeRestarts(cond) [13:13:17.900] for (restart in restarts) { [13:13:17.900] name <- restart$name [13:13:17.900] if (is.null(name)) [13:13:17.900] next [13:13:17.900] if (!grepl(pattern, name)) [13:13:17.900] next [13:13:17.900] invokeRestart(restart) [13:13:17.900] muffled <- TRUE [13:13:17.900] break [13:13:17.900] } [13:13:17.900] } [13:13:17.900] } [13:13:17.900] invisible(muffled) [13:13:17.900] } [13:13:17.900] muffleCondition(cond, pattern = "^muffle") [13:13:17.900] } [13:13:17.900] } [13:13:17.900] } [13:13:17.900] })) [13:13:17.900] }, error = function(ex) { [13:13:17.900] base::structure(base::list(value = NULL, visible = NULL, [13:13:17.900] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:17.900] ...future.rng), started = ...future.startTime, [13:13:17.900] finished = Sys.time(), session_uuid = NA_character_, [13:13:17.900] version = "1.8"), class = "FutureResult") [13:13:17.900] }, finally = { [13:13:17.900] if (!identical(...future.workdir, getwd())) [13:13:17.900] setwd(...future.workdir) [13:13:17.900] { [13:13:17.900] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:17.900] ...future.oldOptions$nwarnings <- NULL [13:13:17.900] } [13:13:17.900] base::options(...future.oldOptions) [13:13:17.900] if (.Platform$OS.type == "windows") { [13:13:17.900] old_names <- names(...future.oldEnvVars) [13:13:17.900] envs <- base::Sys.getenv() [13:13:17.900] names <- names(envs) [13:13:17.900] common <- intersect(names, old_names) [13:13:17.900] added <- setdiff(names, old_names) [13:13:17.900] removed <- setdiff(old_names, names) [13:13:17.900] changed <- common[...future.oldEnvVars[common] != [13:13:17.900] envs[common]] [13:13:17.900] NAMES <- toupper(changed) [13:13:17.900] args <- list() [13:13:17.900] for (kk in seq_along(NAMES)) { [13:13:17.900] name <- changed[[kk]] [13:13:17.900] NAME <- NAMES[[kk]] [13:13:17.900] if (name != NAME && is.element(NAME, old_names)) [13:13:17.900] next [13:13:17.900] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:17.900] } [13:13:17.900] NAMES <- toupper(added) [13:13:17.900] for (kk in seq_along(NAMES)) { [13:13:17.900] name <- added[[kk]] [13:13:17.900] NAME <- NAMES[[kk]] [13:13:17.900] if (name != NAME && is.element(NAME, old_names)) [13:13:17.900] next [13:13:17.900] args[[name]] <- "" [13:13:17.900] } [13:13:17.900] NAMES <- toupper(removed) [13:13:17.900] for (kk in seq_along(NAMES)) { [13:13:17.900] name <- removed[[kk]] [13:13:17.900] NAME <- NAMES[[kk]] [13:13:17.900] if (name != NAME && is.element(NAME, old_names)) [13:13:17.900] next [13:13:17.900] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:17.900] } [13:13:17.900] if (length(args) > 0) [13:13:17.900] base::do.call(base::Sys.setenv, args = args) [13:13:17.900] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:17.900] } [13:13:17.900] else { [13:13:17.900] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:17.900] } [13:13:17.900] { [13:13:17.900] if (base::length(...future.futureOptionsAdded) > [13:13:17.900] 0L) { [13:13:17.900] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:17.900] base::names(opts) <- ...future.futureOptionsAdded [13:13:17.900] base::options(opts) [13:13:17.900] } [13:13:17.900] { [13:13:17.900] { [13:13:17.900] NULL [13:13:17.900] RNGkind("Mersenne-Twister") [13:13:17.900] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:17.900] inherits = FALSE) [13:13:17.900] } [13:13:17.900] options(future.plan = NULL) [13:13:17.900] if (is.na(NA_character_)) [13:13:17.900] Sys.unsetenv("R_FUTURE_PLAN") [13:13:17.900] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:17.900] future::plan(list(function (..., envir = parent.frame()) [13:13:17.900] { [13:13:17.900] future <- SequentialFuture(..., envir = envir) [13:13:17.900] if (!future$lazy) [13:13:17.900] future <- run(future) [13:13:17.900] invisible(future) [13:13:17.900] }), .cleanup = FALSE, .init = FALSE) [13:13:17.900] } [13:13:17.900] } [13:13:17.900] } [13:13:17.900] }) [13:13:17.900] if (TRUE) { [13:13:17.900] base::sink(type = "output", split = FALSE) [13:13:17.900] if (TRUE) { [13:13:17.900] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:17.900] } [13:13:17.900] else { [13:13:17.900] ...future.result["stdout"] <- base::list(NULL) [13:13:17.900] } [13:13:17.900] base::close(...future.stdout) [13:13:17.900] ...future.stdout <- NULL [13:13:17.900] } [13:13:17.900] ...future.result$conditions <- ...future.conditions [13:13:17.900] ...future.result$finished <- base::Sys.time() [13:13:17.900] ...future.result [13:13:17.900] } [13:13:17.904] assign_globals() ... [13:13:17.904] List of 5 [13:13:17.904] $ ...future.FUN :function (x, ...) [13:13:17.904] $ future.call.arguments :List of 1 [13:13:17.904] ..$ probs: num [1:3] 0.25 0.5 0.75 [13:13:17.904] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:17.904] $ ...future.elements_ii :List of 3 [13:13:17.904] ..$ logic: logi [1:4] TRUE FALSE FALSE TRUE [13:13:17.904] ..$ beta : num [1:7] 0.0498 0.1353 0.3679 1 2.7183 ... [13:13:17.904] ..$ a : int [1:10] 1 2 3 4 5 6 7 8 9 10 [13:13:17.904] $ ...future.seeds_ii : NULL [13:13:17.904] $ ...future.globals.maxSize: NULL [13:13:17.904] - attr(*, "where")=List of 5 [13:13:17.904] ..$ ...future.FUN : [13:13:17.904] ..$ future.call.arguments : [13:13:17.904] ..$ ...future.elements_ii : [13:13:17.904] ..$ ...future.seeds_ii : [13:13:17.904] ..$ ...future.globals.maxSize: [13:13:17.904] - attr(*, "resolved")= logi FALSE [13:13:17.904] - attr(*, "total_size")= num 1328 [13:13:17.904] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:17.904] - attr(*, "already-done")= logi TRUE [13:13:17.911] - copied '...future.FUN' to environment [13:13:17.911] - copied 'future.call.arguments' to environment [13:13:17.911] - copied '...future.elements_ii' to environment [13:13:17.911] - copied '...future.seeds_ii' to environment [13:13:17.911] - copied '...future.globals.maxSize' to environment [13:13:17.912] assign_globals() ... done [13:13:17.912] plan(): Setting new future strategy stack: [13:13:17.912] List of future strategies: [13:13:17.912] 1. sequential: [13:13:17.912] - args: function (..., envir = parent.frame(), workers = "") [13:13:17.912] - tweaked: FALSE [13:13:17.912] - call: NULL [13:13:17.913] plan(): nbrOfWorkers() = 1 [13:13:17.915] plan(): Setting new future strategy stack: [13:13:17.916] List of future strategies: [13:13:17.916] 1. sequential: [13:13:17.916] - args: function (..., envir = parent.frame(), workers = "") [13:13:17.916] - tweaked: FALSE [13:13:17.916] - call: plan(strategy) [13:13:17.916] plan(): nbrOfWorkers() = 1 [13:13:17.916] SequentialFuture started (and completed) [13:13:17.917] - Launch lazy future ... done [13:13:17.917] run() for 'SequentialFuture' ... done [13:13:17.917] Created future: [13:13:17.917] SequentialFuture: [13:13:17.917] Label: 'future_eapply-1' [13:13:17.917] Expression: [13:13:17.917] { [13:13:17.917] do.call(function(...) { [13:13:17.917] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:17.917] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:17.917] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:17.917] on.exit(options(oopts), add = TRUE) [13:13:17.917] } [13:13:17.917] { [13:13:17.917] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:17.917] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:17.917] ...future.FUN(...future.X_jj, ...) [13:13:17.917] }) [13:13:17.917] } [13:13:17.917] }, args = future.call.arguments) [13:13:17.917] } [13:13:17.917] Lazy evaluation: FALSE [13:13:17.917] Asynchronous evaluation: FALSE [13:13:17.917] Local evaluation: TRUE [13:13:17.917] Environment: R_GlobalEnv [13:13:17.917] Capture standard output: TRUE [13:13:17.917] Capture condition classes: 'condition' (excluding 'nothing') [13:13:17.917] Globals: 5 objects totaling 1.56 KiB (function '...future.FUN' of 1.22 KiB, DotDotDotList 'future.call.arguments' of 80 bytes, list '...future.elements_ii' of 272 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:13:17.917] Packages: 1 packages ('stats') [13:13:17.917] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:17.917] Resolved: TRUE [13:13:17.917] Value: 1.29 KiB of class 'list' [13:13:17.917] Early signaling: FALSE [13:13:17.917] Owner process: 9511365f-3977-b8d2-248f-88bd32fc0252 [13:13:17.917] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:17.918] Chunk #1 of 1 ... DONE [13:13:17.919] Launching 1 futures (chunks) ... DONE [13:13:17.919] Resolving 1 futures (chunks) ... [13:13:17.919] resolve() on list ... [13:13:17.919] recursive: 0 [13:13:17.919] length: 1 [13:13:17.919] [13:13:17.920] resolved() for 'SequentialFuture' ... [13:13:17.920] - state: 'finished' [13:13:17.920] - run: TRUE [13:13:17.920] - result: 'FutureResult' [13:13:17.920] resolved() for 'SequentialFuture' ... done [13:13:17.921] Future #1 [13:13:17.921] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:17.921] - nx: 1 [13:13:17.921] - relay: TRUE [13:13:17.921] - stdout: TRUE [13:13:17.921] - signal: TRUE [13:13:17.922] - resignal: FALSE [13:13:17.922] - force: TRUE [13:13:17.922] - relayed: [n=1] FALSE [13:13:17.922] - queued futures: [n=1] FALSE [13:13:17.922] - until=1 [13:13:17.922] - relaying element #1 [13:13:17.923] - relayed: [n=1] TRUE [13:13:17.923] - queued futures: [n=1] TRUE [13:13:17.923] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:17.923] length: 0 (resolved future 1) [13:13:17.923] Relaying remaining futures [13:13:17.923] signalConditionsASAP(NULL, pos=0) ... [13:13:17.924] - nx: 1 [13:13:17.924] - relay: TRUE [13:13:17.924] - stdout: TRUE [13:13:17.924] - signal: TRUE [13:13:17.924] - resignal: FALSE [13:13:17.924] - force: TRUE [13:13:17.924] - relayed: [n=1] TRUE [13:13:17.925] - queued futures: [n=1] TRUE - flush all [13:13:17.925] - relayed: [n=1] TRUE [13:13:17.925] - queued futures: [n=1] TRUE [13:13:17.925] signalConditionsASAP(NULL, pos=0) ... done [13:13:17.925] resolve() on list ... DONE [13:13:17.926] - Number of value chunks collected: 1 [13:13:17.926] Resolving 1 futures (chunks) ... DONE [13:13:17.926] Reducing values from 1 chunks ... [13:13:17.926] - Number of values collected after concatenation: 3 [13:13:17.926] - Number of values expected: 3 [13:13:17.926] Reducing values from 1 chunks ... DONE [13:13:17.926] future_lapply() ... DONE [13:13:17.928] future_lapply() ... [13:13:17.929] Number of chunks: 1 [13:13:17.929] getGlobalsAndPackagesXApply() ... [13:13:17.929] - future.globals: TRUE [13:13:17.929] getGlobalsAndPackages() ... [13:13:17.929] Searching for globals... [13:13:17.931] - globals found: [2] 'FUN', 'UseMethod' [13:13:17.931] Searching for globals ... DONE [13:13:17.931] Resolving globals: FALSE [13:13:17.931] The total size of the 1 globals is 1.22 KiB (1248 bytes) [13:13:17.932] The total size of the 1 globals exported for future expression ('FUN()') is 1.22 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (1.22 KiB of class 'function') [13:13:17.932] - globals: [1] 'FUN' [13:13:17.932] - packages: [1] 'stats' [13:13:17.932] getGlobalsAndPackages() ... DONE [13:13:17.933] - globals found/used: [n=1] 'FUN' [13:13:17.933] - needed namespaces: [n=1] 'stats' [13:13:17.933] Finding globals ... DONE [13:13:17.933] - use_args: TRUE [13:13:17.933] - Getting '...' globals ... [13:13:17.934] resolve() on list ... [13:13:17.934] recursive: 0 [13:13:17.934] length: 1 [13:13:17.934] elements: '...' [13:13:17.934] length: 0 (resolved future 1) [13:13:17.934] resolve() on list ... DONE [13:13:17.935] - '...' content: [n=0] [13:13:17.935] List of 1 [13:13:17.935] $ ...: list() [13:13:17.935] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:17.935] - attr(*, "where")=List of 1 [13:13:17.935] ..$ ...: [13:13:17.935] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:17.935] - attr(*, "resolved")= logi TRUE [13:13:17.935] - attr(*, "total_size")= num NA [13:13:17.938] - Getting '...' globals ... DONE [13:13:17.938] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:17.938] List of 2 [13:13:17.938] $ ...future.FUN:function (x, ...) [13:13:17.938] $ ... : list() [13:13:17.938] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:17.938] - attr(*, "where")=List of 2 [13:13:17.938] ..$ ...future.FUN: [13:13:17.938] ..$ ... : [13:13:17.938] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:17.938] - attr(*, "resolved")= logi FALSE [13:13:17.938] - attr(*, "total_size")= num 1248 [13:13:17.942] Packages to be attached in all futures: [n=1] 'stats' [13:13:17.942] getGlobalsAndPackagesXApply() ... DONE [13:13:17.942] Number of futures (= number of chunks): 1 [13:13:17.943] Launching 1 futures (chunks) ... [13:13:17.943] Chunk #1 of 1 ... [13:13:17.943] - Finding globals in 'X' for chunk #1 ... [13:13:17.943] getGlobalsAndPackages() ... [13:13:17.943] Searching for globals... [13:13:17.944] [13:13:17.944] Searching for globals ... DONE [13:13:17.944] - globals: [0] [13:13:17.944] getGlobalsAndPackages() ... DONE [13:13:17.944] + additional globals found: [n=0] [13:13:17.944] + additional namespaces needed: [n=0] [13:13:17.945] - Finding globals in 'X' for chunk #1 ... DONE [13:13:17.945] - seeds: [13:13:17.945] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:17.945] getGlobalsAndPackages() ... [13:13:17.945] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:17.945] Resolving globals: FALSE [13:13:17.946] Tweak future expression to call with '...' arguments ... [13:13:17.946] { [13:13:17.946] do.call(function(...) { [13:13:17.946] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:17.946] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:17.946] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:17.946] on.exit(options(oopts), add = TRUE) [13:13:17.946] } [13:13:17.946] { [13:13:17.946] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:17.946] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:17.946] ...future.FUN(...future.X_jj, ...) [13:13:17.946] }) [13:13:17.946] } [13:13:17.946] }, args = future.call.arguments) [13:13:17.946] } [13:13:17.946] Tweak future expression to call with '...' arguments ... DONE [13:13:17.947] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:17.947] - packages: [1] 'stats' [13:13:17.947] getGlobalsAndPackages() ... DONE [13:13:17.947] run() for 'Future' ... [13:13:17.948] - state: 'created' [13:13:17.948] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:17.948] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:17.948] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:17.948] - Field: 'label' [13:13:17.949] - Field: 'local' [13:13:17.949] - Field: 'owner' [13:13:17.949] - Field: 'envir' [13:13:17.949] - Field: 'packages' [13:13:17.949] - Field: 'gc' [13:13:17.950] - Field: 'conditions' [13:13:17.950] - Field: 'expr' [13:13:17.950] - Field: 'uuid' [13:13:17.950] - Field: 'seed' [13:13:17.950] - Field: 'version' [13:13:17.950] - Field: 'result' [13:13:17.951] - Field: 'asynchronous' [13:13:17.951] - Field: 'calls' [13:13:17.951] - Field: 'globals' [13:13:17.951] - Field: 'stdout' [13:13:17.951] - Field: 'earlySignal' [13:13:17.951] - Field: 'lazy' [13:13:17.952] - Field: 'state' [13:13:17.952] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:17.952] - Launch lazy future ... [13:13:17.952] Packages needed by the future expression (n = 1): 'stats' [13:13:17.952] Packages needed by future strategies (n = 0): [13:13:17.953] { [13:13:17.953] { [13:13:17.953] { [13:13:17.953] ...future.startTime <- base::Sys.time() [13:13:17.953] { [13:13:17.953] { [13:13:17.953] { [13:13:17.953] { [13:13:17.953] base::local({ [13:13:17.953] has_future <- base::requireNamespace("future", [13:13:17.953] quietly = TRUE) [13:13:17.953] if (has_future) { [13:13:17.953] ns <- base::getNamespace("future") [13:13:17.953] version <- ns[[".package"]][["version"]] [13:13:17.953] if (is.null(version)) [13:13:17.953] version <- utils::packageVersion("future") [13:13:17.953] } [13:13:17.953] else { [13:13:17.953] version <- NULL [13:13:17.953] } [13:13:17.953] if (!has_future || version < "1.8.0") { [13:13:17.953] info <- base::c(r_version = base::gsub("R version ", [13:13:17.953] "", base::R.version$version.string), [13:13:17.953] platform = base::sprintf("%s (%s-bit)", [13:13:17.953] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:17.953] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:17.953] "release", "version")], collapse = " "), [13:13:17.953] hostname = base::Sys.info()[["nodename"]]) [13:13:17.953] info <- base::sprintf("%s: %s", base::names(info), [13:13:17.953] info) [13:13:17.953] info <- base::paste(info, collapse = "; ") [13:13:17.953] if (!has_future) { [13:13:17.953] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:17.953] info) [13:13:17.953] } [13:13:17.953] else { [13:13:17.953] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:17.953] info, version) [13:13:17.953] } [13:13:17.953] base::stop(msg) [13:13:17.953] } [13:13:17.953] }) [13:13:17.953] } [13:13:17.953] base::local({ [13:13:17.953] for (pkg in "stats") { [13:13:17.953] base::loadNamespace(pkg) [13:13:17.953] base::library(pkg, character.only = TRUE) [13:13:17.953] } [13:13:17.953] }) [13:13:17.953] } [13:13:17.953] options(future.plan = NULL) [13:13:17.953] Sys.unsetenv("R_FUTURE_PLAN") [13:13:17.953] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:17.953] } [13:13:17.953] ...future.workdir <- getwd() [13:13:17.953] } [13:13:17.953] ...future.oldOptions <- base::as.list(base::.Options) [13:13:17.953] ...future.oldEnvVars <- base::Sys.getenv() [13:13:17.953] } [13:13:17.953] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:17.953] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:17.953] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:17.953] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:17.953] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:17.953] future.stdout.windows.reencode = NULL, width = 80L) [13:13:17.953] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:17.953] base::names(...future.oldOptions)) [13:13:17.953] } [13:13:17.953] if (FALSE) { [13:13:17.953] } [13:13:17.953] else { [13:13:17.953] if (TRUE) { [13:13:17.953] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:17.953] open = "w") [13:13:17.953] } [13:13:17.953] else { [13:13:17.953] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:17.953] windows = "NUL", "/dev/null"), open = "w") [13:13:17.953] } [13:13:17.953] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:17.953] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:17.953] base::sink(type = "output", split = FALSE) [13:13:17.953] base::close(...future.stdout) [13:13:17.953] }, add = TRUE) [13:13:17.953] } [13:13:17.953] ...future.frame <- base::sys.nframe() [13:13:17.953] ...future.conditions <- base::list() [13:13:17.953] ...future.rng <- base::globalenv()$.Random.seed [13:13:17.953] if (FALSE) { [13:13:17.953] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:17.953] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:17.953] } [13:13:17.953] ...future.result <- base::tryCatch({ [13:13:17.953] base::withCallingHandlers({ [13:13:17.953] ...future.value <- base::withVisible(base::local({ [13:13:17.953] do.call(function(...) { [13:13:17.953] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:17.953] if (!identical(...future.globals.maxSize.org, [13:13:17.953] ...future.globals.maxSize)) { [13:13:17.953] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:17.953] on.exit(options(oopts), add = TRUE) [13:13:17.953] } [13:13:17.953] { [13:13:17.953] lapply(seq_along(...future.elements_ii), [13:13:17.953] FUN = function(jj) { [13:13:17.953] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:17.953] ...future.FUN(...future.X_jj, ...) [13:13:17.953] }) [13:13:17.953] } [13:13:17.953] }, args = future.call.arguments) [13:13:17.953] })) [13:13:17.953] future::FutureResult(value = ...future.value$value, [13:13:17.953] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:17.953] ...future.rng), globalenv = if (FALSE) [13:13:17.953] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:17.953] ...future.globalenv.names)) [13:13:17.953] else NULL, started = ...future.startTime, version = "1.8") [13:13:17.953] }, condition = base::local({ [13:13:17.953] c <- base::c [13:13:17.953] inherits <- base::inherits [13:13:17.953] invokeRestart <- base::invokeRestart [13:13:17.953] length <- base::length [13:13:17.953] list <- base::list [13:13:17.953] seq.int <- base::seq.int [13:13:17.953] signalCondition <- base::signalCondition [13:13:17.953] sys.calls <- base::sys.calls [13:13:17.953] `[[` <- base::`[[` [13:13:17.953] `+` <- base::`+` [13:13:17.953] `<<-` <- base::`<<-` [13:13:17.953] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:17.953] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:17.953] 3L)] [13:13:17.953] } [13:13:17.953] function(cond) { [13:13:17.953] is_error <- inherits(cond, "error") [13:13:17.953] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:17.953] NULL) [13:13:17.953] if (is_error) { [13:13:17.953] sessionInformation <- function() { [13:13:17.953] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:17.953] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:17.953] search = base::search(), system = base::Sys.info()) [13:13:17.953] } [13:13:17.953] ...future.conditions[[length(...future.conditions) + [13:13:17.953] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:17.953] cond$call), session = sessionInformation(), [13:13:17.953] timestamp = base::Sys.time(), signaled = 0L) [13:13:17.953] signalCondition(cond) [13:13:17.953] } [13:13:17.953] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:17.953] "immediateCondition"))) { [13:13:17.953] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:17.953] ...future.conditions[[length(...future.conditions) + [13:13:17.953] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:17.953] if (TRUE && !signal) { [13:13:17.953] muffleCondition <- function (cond, pattern = "^muffle") [13:13:17.953] { [13:13:17.953] inherits <- base::inherits [13:13:17.953] invokeRestart <- base::invokeRestart [13:13:17.953] is.null <- base::is.null [13:13:17.953] muffled <- FALSE [13:13:17.953] if (inherits(cond, "message")) { [13:13:17.953] muffled <- grepl(pattern, "muffleMessage") [13:13:17.953] if (muffled) [13:13:17.953] invokeRestart("muffleMessage") [13:13:17.953] } [13:13:17.953] else if (inherits(cond, "warning")) { [13:13:17.953] muffled <- grepl(pattern, "muffleWarning") [13:13:17.953] if (muffled) [13:13:17.953] invokeRestart("muffleWarning") [13:13:17.953] } [13:13:17.953] else if (inherits(cond, "condition")) { [13:13:17.953] if (!is.null(pattern)) { [13:13:17.953] computeRestarts <- base::computeRestarts [13:13:17.953] grepl <- base::grepl [13:13:17.953] restarts <- computeRestarts(cond) [13:13:17.953] for (restart in restarts) { [13:13:17.953] name <- restart$name [13:13:17.953] if (is.null(name)) [13:13:17.953] next [13:13:17.953] if (!grepl(pattern, name)) [13:13:17.953] next [13:13:17.953] invokeRestart(restart) [13:13:17.953] muffled <- TRUE [13:13:17.953] break [13:13:17.953] } [13:13:17.953] } [13:13:17.953] } [13:13:17.953] invisible(muffled) [13:13:17.953] } [13:13:17.953] muffleCondition(cond, pattern = "^muffle") [13:13:17.953] } [13:13:17.953] } [13:13:17.953] else { [13:13:17.953] if (TRUE) { [13:13:17.953] muffleCondition <- function (cond, pattern = "^muffle") [13:13:17.953] { [13:13:17.953] inherits <- base::inherits [13:13:17.953] invokeRestart <- base::invokeRestart [13:13:17.953] is.null <- base::is.null [13:13:17.953] muffled <- FALSE [13:13:17.953] if (inherits(cond, "message")) { [13:13:17.953] muffled <- grepl(pattern, "muffleMessage") [13:13:17.953] if (muffled) [13:13:17.953] invokeRestart("muffleMessage") [13:13:17.953] } [13:13:17.953] else if (inherits(cond, "warning")) { [13:13:17.953] muffled <- grepl(pattern, "muffleWarning") [13:13:17.953] if (muffled) [13:13:17.953] invokeRestart("muffleWarning") [13:13:17.953] } [13:13:17.953] else if (inherits(cond, "condition")) { [13:13:17.953] if (!is.null(pattern)) { [13:13:17.953] computeRestarts <- base::computeRestarts [13:13:17.953] grepl <- base::grepl [13:13:17.953] restarts <- computeRestarts(cond) [13:13:17.953] for (restart in restarts) { [13:13:17.953] name <- restart$name [13:13:17.953] if (is.null(name)) [13:13:17.953] next [13:13:17.953] if (!grepl(pattern, name)) [13:13:17.953] next [13:13:17.953] invokeRestart(restart) [13:13:17.953] muffled <- TRUE [13:13:17.953] break [13:13:17.953] } [13:13:17.953] } [13:13:17.953] } [13:13:17.953] invisible(muffled) [13:13:17.953] } [13:13:17.953] muffleCondition(cond, pattern = "^muffle") [13:13:17.953] } [13:13:17.953] } [13:13:17.953] } [13:13:17.953] })) [13:13:17.953] }, error = function(ex) { [13:13:17.953] base::structure(base::list(value = NULL, visible = NULL, [13:13:17.953] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:17.953] ...future.rng), started = ...future.startTime, [13:13:17.953] finished = Sys.time(), session_uuid = NA_character_, [13:13:17.953] version = "1.8"), class = "FutureResult") [13:13:17.953] }, finally = { [13:13:17.953] if (!identical(...future.workdir, getwd())) [13:13:17.953] setwd(...future.workdir) [13:13:17.953] { [13:13:17.953] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:17.953] ...future.oldOptions$nwarnings <- NULL [13:13:17.953] } [13:13:17.953] base::options(...future.oldOptions) [13:13:17.953] if (.Platform$OS.type == "windows") { [13:13:17.953] old_names <- names(...future.oldEnvVars) [13:13:17.953] envs <- base::Sys.getenv() [13:13:17.953] names <- names(envs) [13:13:17.953] common <- intersect(names, old_names) [13:13:17.953] added <- setdiff(names, old_names) [13:13:17.953] removed <- setdiff(old_names, names) [13:13:17.953] changed <- common[...future.oldEnvVars[common] != [13:13:17.953] envs[common]] [13:13:17.953] NAMES <- toupper(changed) [13:13:17.953] args <- list() [13:13:17.953] for (kk in seq_along(NAMES)) { [13:13:17.953] name <- changed[[kk]] [13:13:17.953] NAME <- NAMES[[kk]] [13:13:17.953] if (name != NAME && is.element(NAME, old_names)) [13:13:17.953] next [13:13:17.953] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:17.953] } [13:13:17.953] NAMES <- toupper(added) [13:13:17.953] for (kk in seq_along(NAMES)) { [13:13:17.953] name <- added[[kk]] [13:13:17.953] NAME <- NAMES[[kk]] [13:13:17.953] if (name != NAME && is.element(NAME, old_names)) [13:13:17.953] next [13:13:17.953] args[[name]] <- "" [13:13:17.953] } [13:13:17.953] NAMES <- toupper(removed) [13:13:17.953] for (kk in seq_along(NAMES)) { [13:13:17.953] name <- removed[[kk]] [13:13:17.953] NAME <- NAMES[[kk]] [13:13:17.953] if (name != NAME && is.element(NAME, old_names)) [13:13:17.953] next [13:13:17.953] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:17.953] } [13:13:17.953] if (length(args) > 0) [13:13:17.953] base::do.call(base::Sys.setenv, args = args) [13:13:17.953] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:17.953] } [13:13:17.953] else { [13:13:17.953] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:17.953] } [13:13:17.953] { [13:13:17.953] if (base::length(...future.futureOptionsAdded) > [13:13:17.953] 0L) { [13:13:17.953] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:17.953] base::names(opts) <- ...future.futureOptionsAdded [13:13:17.953] base::options(opts) [13:13:17.953] } [13:13:17.953] { [13:13:17.953] { [13:13:17.953] NULL [13:13:17.953] RNGkind("Mersenne-Twister") [13:13:17.953] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:17.953] inherits = FALSE) [13:13:17.953] } [13:13:17.953] options(future.plan = NULL) [13:13:17.953] if (is.na(NA_character_)) [13:13:17.953] Sys.unsetenv("R_FUTURE_PLAN") [13:13:17.953] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:17.953] future::plan(list(function (..., envir = parent.frame()) [13:13:17.953] { [13:13:17.953] future <- SequentialFuture(..., envir = envir) [13:13:17.953] if (!future$lazy) [13:13:17.953] future <- run(future) [13:13:17.953] invisible(future) [13:13:17.953] }), .cleanup = FALSE, .init = FALSE) [13:13:17.953] } [13:13:17.953] } [13:13:17.953] } [13:13:17.953] }) [13:13:17.953] if (TRUE) { [13:13:17.953] base::sink(type = "output", split = FALSE) [13:13:17.953] if (TRUE) { [13:13:17.953] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:17.953] } [13:13:17.953] else { [13:13:17.953] ...future.result["stdout"] <- base::list(NULL) [13:13:17.953] } [13:13:17.953] base::close(...future.stdout) [13:13:17.953] ...future.stdout <- NULL [13:13:17.953] } [13:13:17.953] ...future.result$conditions <- ...future.conditions [13:13:17.953] ...future.result$finished <- base::Sys.time() [13:13:17.953] ...future.result [13:13:17.953] } [13:13:17.957] assign_globals() ... [13:13:17.957] List of 5 [13:13:17.957] $ ...future.FUN :function (x, ...) [13:13:17.957] $ future.call.arguments : list() [13:13:17.957] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:17.957] $ ...future.elements_ii :List of 3 [13:13:17.957] ..$ logic: logi [1:4] TRUE FALSE FALSE TRUE [13:13:17.957] ..$ beta : num [1:7] 0.0498 0.1353 0.3679 1 2.7183 ... [13:13:17.957] ..$ a : int [1:10] 1 2 3 4 5 6 7 8 9 10 [13:13:17.957] $ ...future.seeds_ii : NULL [13:13:17.957] $ ...future.globals.maxSize: NULL [13:13:17.957] - attr(*, "where")=List of 5 [13:13:17.957] ..$ ...future.FUN : [13:13:17.957] ..$ future.call.arguments : [13:13:17.957] ..$ ...future.elements_ii : [13:13:17.957] ..$ ...future.seeds_ii : [13:13:17.957] ..$ ...future.globals.maxSize: [13:13:17.957] - attr(*, "resolved")= logi FALSE [13:13:17.957] - attr(*, "total_size")= num 1248 [13:13:17.957] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:17.957] - attr(*, "already-done")= logi TRUE [13:13:17.963] - copied '...future.FUN' to environment [13:13:17.963] - copied 'future.call.arguments' to environment [13:13:17.964] - copied '...future.elements_ii' to environment [13:13:17.964] - copied '...future.seeds_ii' to environment [13:13:17.964] - copied '...future.globals.maxSize' to environment [13:13:17.964] assign_globals() ... done [13:13:17.965] plan(): Setting new future strategy stack: [13:13:17.965] List of future strategies: [13:13:17.965] 1. sequential: [13:13:17.965] - args: function (..., envir = parent.frame(), workers = "") [13:13:17.965] - tweaked: FALSE [13:13:17.965] - call: NULL [13:13:17.965] plan(): nbrOfWorkers() = 1 [13:13:17.967] plan(): Setting new future strategy stack: [13:13:17.967] List of future strategies: [13:13:17.967] 1. sequential: [13:13:17.967] - args: function (..., envir = parent.frame(), workers = "") [13:13:17.967] - tweaked: FALSE [13:13:17.967] - call: plan(strategy) [13:13:17.968] plan(): nbrOfWorkers() = 1 [13:13:17.968] SequentialFuture started (and completed) [13:13:17.968] - Launch lazy future ... done [13:13:17.968] run() for 'SequentialFuture' ... done [13:13:17.969] Created future: [13:13:17.969] SequentialFuture: [13:13:17.969] Label: 'future_eapply-1' [13:13:17.969] Expression: [13:13:17.969] { [13:13:17.969] do.call(function(...) { [13:13:17.969] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:17.969] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:17.969] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:17.969] on.exit(options(oopts), add = TRUE) [13:13:17.969] } [13:13:17.969] { [13:13:17.969] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:17.969] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:17.969] ...future.FUN(...future.X_jj, ...) [13:13:17.969] }) [13:13:17.969] } [13:13:17.969] }, args = future.call.arguments) [13:13:17.969] } [13:13:17.969] Lazy evaluation: FALSE [13:13:17.969] Asynchronous evaluation: FALSE [13:13:17.969] Local evaluation: TRUE [13:13:17.969] Environment: R_GlobalEnv [13:13:17.969] Capture standard output: TRUE [13:13:17.969] Capture condition classes: 'condition' (excluding 'nothing') [13:13:17.969] Globals: 5 objects totaling 1.48 KiB (function '...future.FUN' of 1.22 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 272 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:13:17.969] Packages: 1 packages ('stats') [13:13:17.969] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:17.969] Resolved: TRUE [13:13:17.969] Value: 1.71 KiB of class 'list' [13:13:17.969] Early signaling: FALSE [13:13:17.969] Owner process: 9511365f-3977-b8d2-248f-88bd32fc0252 [13:13:17.969] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:17.971] Chunk #1 of 1 ... DONE [13:13:17.971] Launching 1 futures (chunks) ... DONE [13:13:17.971] Resolving 1 futures (chunks) ... [13:13:17.972] resolve() on list ... [13:13:17.972] recursive: 0 [13:13:17.972] length: 1 [13:13:17.972] [13:13:17.972] resolved() for 'SequentialFuture' ... [13:13:17.972] - state: 'finished' [13:13:17.973] - run: TRUE [13:13:17.973] - result: 'FutureResult' [13:13:17.973] resolved() for 'SequentialFuture' ... done [13:13:17.973] Future #1 [13:13:17.973] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:17.974] - nx: 1 [13:13:17.974] - relay: TRUE [13:13:17.974] - stdout: TRUE [13:13:17.974] - signal: TRUE [13:13:17.974] - resignal: FALSE [13:13:17.974] - force: TRUE [13:13:17.974] - relayed: [n=1] FALSE [13:13:17.975] - queued futures: [n=1] FALSE [13:13:17.975] - until=1 [13:13:17.975] - relaying element #1 [13:13:17.975] - relayed: [n=1] TRUE [13:13:17.975] - queued futures: [n=1] TRUE [13:13:17.976] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:17.976] length: 0 (resolved future 1) [13:13:17.976] Relaying remaining futures [13:13:17.976] signalConditionsASAP(NULL, pos=0) ... [13:13:17.976] - nx: 1 [13:13:17.976] - relay: TRUE [13:13:17.976] - stdout: TRUE [13:13:17.977] - signal: TRUE [13:13:17.977] - resignal: FALSE [13:13:17.977] - force: TRUE [13:13:17.977] - relayed: [n=1] TRUE [13:13:17.977] - queued futures: [n=1] TRUE - flush all [13:13:17.977] - relayed: [n=1] TRUE [13:13:17.978] - queued futures: [n=1] TRUE [13:13:17.978] signalConditionsASAP(NULL, pos=0) ... done [13:13:17.978] resolve() on list ... DONE [13:13:17.978] - Number of value chunks collected: 1 [13:13:17.978] Resolving 1 futures (chunks) ... DONE [13:13:17.978] Reducing values from 1 chunks ... [13:13:17.979] - Number of values collected after concatenation: 3 [13:13:17.979] - Number of values expected: 3 [13:13:17.979] Reducing values from 1 chunks ... DONE [13:13:17.979] future_lapply() ... DONE [13:13:17.979] future_lapply() ... [13:13:17.980] Number of chunks: 1 [13:13:17.980] getGlobalsAndPackagesXApply() ... [13:13:17.980] - future.globals: TRUE [13:13:17.980] getGlobalsAndPackages() ... [13:13:17.981] Searching for globals... [13:13:17.982] - globals found: [2] 'FUN', 'UseMethod' [13:13:17.982] Searching for globals ... DONE [13:13:17.982] Resolving globals: FALSE [13:13:17.983] The total size of the 1 globals is 1.22 KiB (1248 bytes) [13:13:17.983] The total size of the 1 globals exported for future expression ('FUN()') is 1.22 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (1.22 KiB of class 'function') [13:13:17.983] - globals: [1] 'FUN' [13:13:17.984] - packages: [1] 'stats' [13:13:17.984] getGlobalsAndPackages() ... DONE [13:13:17.984] - globals found/used: [n=1] 'FUN' [13:13:17.984] - needed namespaces: [n=1] 'stats' [13:13:17.984] Finding globals ... DONE [13:13:17.984] - use_args: TRUE [13:13:17.985] - Getting '...' globals ... [13:13:17.985] resolve() on list ... [13:13:17.985] recursive: 0 [13:13:17.985] length: 1 [13:13:17.985] elements: '...' [13:13:17.986] length: 0 (resolved future 1) [13:13:17.986] resolve() on list ... DONE [13:13:17.986] - '...' content: [n=0] [13:13:17.986] List of 1 [13:13:17.986] $ ...: list() [13:13:17.986] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:17.986] - attr(*, "where")=List of 1 [13:13:17.986] ..$ ...: [13:13:17.986] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:17.986] - attr(*, "resolved")= logi TRUE [13:13:17.986] - attr(*, "total_size")= num NA [13:13:17.989] - Getting '...' globals ... DONE [13:13:17.989] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:17.989] List of 2 [13:13:17.989] $ ...future.FUN:function (x, ...) [13:13:17.989] $ ... : list() [13:13:17.989] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:17.989] - attr(*, "where")=List of 2 [13:13:17.989] ..$ ...future.FUN: [13:13:17.989] ..$ ... : [13:13:17.989] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:17.989] - attr(*, "resolved")= logi FALSE [13:13:17.989] - attr(*, "total_size")= num 1248 [13:13:17.993] Packages to be attached in all futures: [n=1] 'stats' [13:13:17.993] getGlobalsAndPackagesXApply() ... DONE [13:13:17.993] Number of futures (= number of chunks): 1 [13:13:17.993] Launching 1 futures (chunks) ... [13:13:17.993] Chunk #1 of 1 ... [13:13:17.994] - Finding globals in 'X' for chunk #1 ... [13:13:17.994] getGlobalsAndPackages() ... [13:13:17.994] Searching for globals... [13:13:17.995] [13:13:17.995] Searching for globals ... DONE [13:13:17.995] - globals: [0] [13:13:17.995] getGlobalsAndPackages() ... DONE [13:13:17.996] + additional globals found: [n=0] [13:13:17.996] + additional namespaces needed: [n=0] [13:13:17.996] - Finding globals in 'X' for chunk #1 ... DONE [13:13:17.996] - seeds: [13:13:17.996] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:17.996] getGlobalsAndPackages() ... [13:13:17.997] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:17.997] Resolving globals: FALSE [13:13:17.997] Tweak future expression to call with '...' arguments ... [13:13:17.997] { [13:13:17.997] do.call(function(...) { [13:13:17.997] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:17.997] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:17.997] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:17.997] on.exit(options(oopts), add = TRUE) [13:13:17.997] } [13:13:17.997] { [13:13:17.997] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:17.997] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:17.997] ...future.FUN(...future.X_jj, ...) [13:13:17.997] }) [13:13:17.997] } [13:13:17.997] }, args = future.call.arguments) [13:13:17.997] } [13:13:17.998] Tweak future expression to call with '...' arguments ... DONE [13:13:17.998] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:17.998] - packages: [1] 'stats' [13:13:17.998] getGlobalsAndPackages() ... DONE [13:13:17.999] run() for 'Future' ... [13:13:17.999] - state: 'created' [13:13:17.999] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [13:13:18.000] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:18.000] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [13:13:18.000] - Field: 'label' [13:13:18.000] - Field: 'local' [13:13:18.000] - Field: 'owner' [13:13:18.000] - Field: 'envir' [13:13:18.001] - Field: 'packages' [13:13:18.001] - Field: 'gc' [13:13:18.001] - Field: 'conditions' [13:13:18.001] - Field: 'expr' [13:13:18.001] - Field: 'uuid' [13:13:18.001] - Field: 'seed' [13:13:18.002] - Field: 'version' [13:13:18.002] - Field: 'result' [13:13:18.002] - Field: 'asynchronous' [13:13:18.002] - Field: 'calls' [13:13:18.002] - Field: 'globals' [13:13:18.002] - Field: 'stdout' [13:13:18.003] - Field: 'earlySignal' [13:13:18.003] - Field: 'lazy' [13:13:18.003] - Field: 'state' [13:13:18.003] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [13:13:18.003] - Launch lazy future ... [13:13:18.004] Packages needed by the future expression (n = 1): 'stats' [13:13:18.004] Packages needed by future strategies (n = 0): [13:13:18.004] { [13:13:18.004] { [13:13:18.004] { [13:13:18.004] ...future.startTime <- base::Sys.time() [13:13:18.004] { [13:13:18.004] { [13:13:18.004] { [13:13:18.004] { [13:13:18.004] base::local({ [13:13:18.004] has_future <- base::requireNamespace("future", [13:13:18.004] quietly = TRUE) [13:13:18.004] if (has_future) { [13:13:18.004] ns <- base::getNamespace("future") [13:13:18.004] version <- ns[[".package"]][["version"]] [13:13:18.004] if (is.null(version)) [13:13:18.004] version <- utils::packageVersion("future") [13:13:18.004] } [13:13:18.004] else { [13:13:18.004] version <- NULL [13:13:18.004] } [13:13:18.004] if (!has_future || version < "1.8.0") { [13:13:18.004] info <- base::c(r_version = base::gsub("R version ", [13:13:18.004] "", base::R.version$version.string), [13:13:18.004] platform = base::sprintf("%s (%s-bit)", [13:13:18.004] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:18.004] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:18.004] "release", "version")], collapse = " "), [13:13:18.004] hostname = base::Sys.info()[["nodename"]]) [13:13:18.004] info <- base::sprintf("%s: %s", base::names(info), [13:13:18.004] info) [13:13:18.004] info <- base::paste(info, collapse = "; ") [13:13:18.004] if (!has_future) { [13:13:18.004] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:18.004] info) [13:13:18.004] } [13:13:18.004] else { [13:13:18.004] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:18.004] info, version) [13:13:18.004] } [13:13:18.004] base::stop(msg) [13:13:18.004] } [13:13:18.004] }) [13:13:18.004] } [13:13:18.004] base::local({ [13:13:18.004] for (pkg in "stats") { [13:13:18.004] base::loadNamespace(pkg) [13:13:18.004] base::library(pkg, character.only = TRUE) [13:13:18.004] } [13:13:18.004] }) [13:13:18.004] } [13:13:18.004] options(future.plan = NULL) [13:13:18.004] Sys.unsetenv("R_FUTURE_PLAN") [13:13:18.004] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:18.004] } [13:13:18.004] ...future.workdir <- getwd() [13:13:18.004] } [13:13:18.004] ...future.oldOptions <- base::as.list(base::.Options) [13:13:18.004] ...future.oldEnvVars <- base::Sys.getenv() [13:13:18.004] } [13:13:18.004] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:18.004] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:18.004] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:18.004] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:18.004] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:18.004] future.stdout.windows.reencode = NULL, width = 80L) [13:13:18.004] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:18.004] base::names(...future.oldOptions)) [13:13:18.004] } [13:13:18.004] if (FALSE) { [13:13:18.004] } [13:13:18.004] else { [13:13:18.004] if (TRUE) { [13:13:18.004] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:18.004] open = "w") [13:13:18.004] } [13:13:18.004] else { [13:13:18.004] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:18.004] windows = "NUL", "/dev/null"), open = "w") [13:13:18.004] } [13:13:18.004] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:18.004] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:18.004] base::sink(type = "output", split = FALSE) [13:13:18.004] base::close(...future.stdout) [13:13:18.004] }, add = TRUE) [13:13:18.004] } [13:13:18.004] ...future.frame <- base::sys.nframe() [13:13:18.004] ...future.conditions <- base::list() [13:13:18.004] ...future.rng <- base::globalenv()$.Random.seed [13:13:18.004] if (FALSE) { [13:13:18.004] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:18.004] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:18.004] } [13:13:18.004] ...future.result <- base::tryCatch({ [13:13:18.004] base::withCallingHandlers({ [13:13:18.004] ...future.value <- base::withVisible(base::local({ [13:13:18.004] do.call(function(...) { [13:13:18.004] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:18.004] if (!identical(...future.globals.maxSize.org, [13:13:18.004] ...future.globals.maxSize)) { [13:13:18.004] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:18.004] on.exit(options(oopts), add = TRUE) [13:13:18.004] } [13:13:18.004] { [13:13:18.004] lapply(seq_along(...future.elements_ii), [13:13:18.004] FUN = function(jj) { [13:13:18.004] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:18.004] ...future.FUN(...future.X_jj, ...) [13:13:18.004] }) [13:13:18.004] } [13:13:18.004] }, args = future.call.arguments) [13:13:18.004] })) [13:13:18.004] future::FutureResult(value = ...future.value$value, [13:13:18.004] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:18.004] ...future.rng), globalenv = if (FALSE) [13:13:18.004] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:18.004] ...future.globalenv.names)) [13:13:18.004] else NULL, started = ...future.startTime, version = "1.8") [13:13:18.004] }, condition = base::local({ [13:13:18.004] c <- base::c [13:13:18.004] inherits <- base::inherits [13:13:18.004] invokeRestart <- base::invokeRestart [13:13:18.004] length <- base::length [13:13:18.004] list <- base::list [13:13:18.004] seq.int <- base::seq.int [13:13:18.004] signalCondition <- base::signalCondition [13:13:18.004] sys.calls <- base::sys.calls [13:13:18.004] `[[` <- base::`[[` [13:13:18.004] `+` <- base::`+` [13:13:18.004] `<<-` <- base::`<<-` [13:13:18.004] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:18.004] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:18.004] 3L)] [13:13:18.004] } [13:13:18.004] function(cond) { [13:13:18.004] is_error <- inherits(cond, "error") [13:13:18.004] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:18.004] NULL) [13:13:18.004] if (is_error) { [13:13:18.004] sessionInformation <- function() { [13:13:18.004] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:18.004] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:18.004] search = base::search(), system = base::Sys.info()) [13:13:18.004] } [13:13:18.004] ...future.conditions[[length(...future.conditions) + [13:13:18.004] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:18.004] cond$call), session = sessionInformation(), [13:13:18.004] timestamp = base::Sys.time(), signaled = 0L) [13:13:18.004] signalCondition(cond) [13:13:18.004] } [13:13:18.004] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:18.004] "immediateCondition"))) { [13:13:18.004] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:18.004] ...future.conditions[[length(...future.conditions) + [13:13:18.004] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:18.004] if (TRUE && !signal) { [13:13:18.004] muffleCondition <- function (cond, pattern = "^muffle") [13:13:18.004] { [13:13:18.004] inherits <- base::inherits [13:13:18.004] invokeRestart <- base::invokeRestart [13:13:18.004] is.null <- base::is.null [13:13:18.004] muffled <- FALSE [13:13:18.004] if (inherits(cond, "message")) { [13:13:18.004] muffled <- grepl(pattern, "muffleMessage") [13:13:18.004] if (muffled) [13:13:18.004] invokeRestart("muffleMessage") [13:13:18.004] } [13:13:18.004] else if (inherits(cond, "warning")) { [13:13:18.004] muffled <- grepl(pattern, "muffleWarning") [13:13:18.004] if (muffled) [13:13:18.004] invokeRestart("muffleWarning") [13:13:18.004] } [13:13:18.004] else if (inherits(cond, "condition")) { [13:13:18.004] if (!is.null(pattern)) { [13:13:18.004] computeRestarts <- base::computeRestarts [13:13:18.004] grepl <- base::grepl [13:13:18.004] restarts <- computeRestarts(cond) [13:13:18.004] for (restart in restarts) { [13:13:18.004] name <- restart$name [13:13:18.004] if (is.null(name)) [13:13:18.004] next [13:13:18.004] if (!grepl(pattern, name)) [13:13:18.004] next [13:13:18.004] invokeRestart(restart) [13:13:18.004] muffled <- TRUE [13:13:18.004] break [13:13:18.004] } [13:13:18.004] } [13:13:18.004] } [13:13:18.004] invisible(muffled) [13:13:18.004] } [13:13:18.004] muffleCondition(cond, pattern = "^muffle") [13:13:18.004] } [13:13:18.004] } [13:13:18.004] else { [13:13:18.004] if (TRUE) { [13:13:18.004] muffleCondition <- function (cond, pattern = "^muffle") [13:13:18.004] { [13:13:18.004] inherits <- base::inherits [13:13:18.004] invokeRestart <- base::invokeRestart [13:13:18.004] is.null <- base::is.null [13:13:18.004] muffled <- FALSE [13:13:18.004] if (inherits(cond, "message")) { [13:13:18.004] muffled <- grepl(pattern, "muffleMessage") [13:13:18.004] if (muffled) [13:13:18.004] invokeRestart("muffleMessage") [13:13:18.004] } [13:13:18.004] else if (inherits(cond, "warning")) { [13:13:18.004] muffled <- grepl(pattern, "muffleWarning") [13:13:18.004] if (muffled) [13:13:18.004] invokeRestart("muffleWarning") [13:13:18.004] } [13:13:18.004] else if (inherits(cond, "condition")) { [13:13:18.004] if (!is.null(pattern)) { [13:13:18.004] computeRestarts <- base::computeRestarts [13:13:18.004] grepl <- base::grepl [13:13:18.004] restarts <- computeRestarts(cond) [13:13:18.004] for (restart in restarts) { [13:13:18.004] name <- restart$name [13:13:18.004] if (is.null(name)) [13:13:18.004] next [13:13:18.004] if (!grepl(pattern, name)) [13:13:18.004] next [13:13:18.004] invokeRestart(restart) [13:13:18.004] muffled <- TRUE [13:13:18.004] break [13:13:18.004] } [13:13:18.004] } [13:13:18.004] } [13:13:18.004] invisible(muffled) [13:13:18.004] } [13:13:18.004] muffleCondition(cond, pattern = "^muffle") [13:13:18.004] } [13:13:18.004] } [13:13:18.004] } [13:13:18.004] })) [13:13:18.004] }, error = function(ex) { [13:13:18.004] base::structure(base::list(value = NULL, visible = NULL, [13:13:18.004] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:18.004] ...future.rng), started = ...future.startTime, [13:13:18.004] finished = Sys.time(), session_uuid = NA_character_, [13:13:18.004] version = "1.8"), class = "FutureResult") [13:13:18.004] }, finally = { [13:13:18.004] if (!identical(...future.workdir, getwd())) [13:13:18.004] setwd(...future.workdir) [13:13:18.004] { [13:13:18.004] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:18.004] ...future.oldOptions$nwarnings <- NULL [13:13:18.004] } [13:13:18.004] base::options(...future.oldOptions) [13:13:18.004] if (.Platform$OS.type == "windows") { [13:13:18.004] old_names <- names(...future.oldEnvVars) [13:13:18.004] envs <- base::Sys.getenv() [13:13:18.004] names <- names(envs) [13:13:18.004] common <- intersect(names, old_names) [13:13:18.004] added <- setdiff(names, old_names) [13:13:18.004] removed <- setdiff(old_names, names) [13:13:18.004] changed <- common[...future.oldEnvVars[common] != [13:13:18.004] envs[common]] [13:13:18.004] NAMES <- toupper(changed) [13:13:18.004] args <- list() [13:13:18.004] for (kk in seq_along(NAMES)) { [13:13:18.004] name <- changed[[kk]] [13:13:18.004] NAME <- NAMES[[kk]] [13:13:18.004] if (name != NAME && is.element(NAME, old_names)) [13:13:18.004] next [13:13:18.004] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:18.004] } [13:13:18.004] NAMES <- toupper(added) [13:13:18.004] for (kk in seq_along(NAMES)) { [13:13:18.004] name <- added[[kk]] [13:13:18.004] NAME <- NAMES[[kk]] [13:13:18.004] if (name != NAME && is.element(NAME, old_names)) [13:13:18.004] next [13:13:18.004] args[[name]] <- "" [13:13:18.004] } [13:13:18.004] NAMES <- toupper(removed) [13:13:18.004] for (kk in seq_along(NAMES)) { [13:13:18.004] name <- removed[[kk]] [13:13:18.004] NAME <- NAMES[[kk]] [13:13:18.004] if (name != NAME && is.element(NAME, old_names)) [13:13:18.004] next [13:13:18.004] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:18.004] } [13:13:18.004] if (length(args) > 0) [13:13:18.004] base::do.call(base::Sys.setenv, args = args) [13:13:18.004] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:18.004] } [13:13:18.004] else { [13:13:18.004] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:18.004] } [13:13:18.004] { [13:13:18.004] if (base::length(...future.futureOptionsAdded) > [13:13:18.004] 0L) { [13:13:18.004] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:18.004] base::names(opts) <- ...future.futureOptionsAdded [13:13:18.004] base::options(opts) [13:13:18.004] } [13:13:18.004] { [13:13:18.004] { [13:13:18.004] NULL [13:13:18.004] RNGkind("Mersenne-Twister") [13:13:18.004] base::rm(list = ".Random.seed", envir = base::globalenv(), [13:13:18.004] inherits = FALSE) [13:13:18.004] } [13:13:18.004] options(future.plan = NULL) [13:13:18.004] if (is.na(NA_character_)) [13:13:18.004] Sys.unsetenv("R_FUTURE_PLAN") [13:13:18.004] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:18.004] future::plan(list(function (..., envir = parent.frame()) [13:13:18.004] { [13:13:18.004] future <- SequentialFuture(..., envir = envir) [13:13:18.004] if (!future$lazy) [13:13:18.004] future <- run(future) [13:13:18.004] invisible(future) [13:13:18.004] }), .cleanup = FALSE, .init = FALSE) [13:13:18.004] } [13:13:18.004] } [13:13:18.004] } [13:13:18.004] }) [13:13:18.004] if (TRUE) { [13:13:18.004] base::sink(type = "output", split = FALSE) [13:13:18.004] if (TRUE) { [13:13:18.004] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:18.004] } [13:13:18.004] else { [13:13:18.004] ...future.result["stdout"] <- base::list(NULL) [13:13:18.004] } [13:13:18.004] base::close(...future.stdout) [13:13:18.004] ...future.stdout <- NULL [13:13:18.004] } [13:13:18.004] ...future.result$conditions <- ...future.conditions [13:13:18.004] ...future.result$finished <- base::Sys.time() [13:13:18.004] ...future.result [13:13:18.004] } [13:13:18.008] assign_globals() ... [13:13:18.008] List of 5 [13:13:18.008] $ ...future.FUN :function (x, ...) [13:13:18.008] $ future.call.arguments : list() [13:13:18.008] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:18.008] $ ...future.elements_ii :List of 3 [13:13:18.008] ..$ logic: logi [1:4] TRUE FALSE FALSE TRUE [13:13:18.008] ..$ beta : num [1:7] 0.0498 0.1353 0.3679 1 2.7183 ... [13:13:18.008] ..$ a : int [1:10] 1 2 3 4 5 6 7 8 9 10 [13:13:18.008] $ ...future.seeds_ii : NULL [13:13:18.008] $ ...future.globals.maxSize: NULL [13:13:18.008] - attr(*, "where")=List of 5 [13:13:18.008] ..$ ...future.FUN : [13:13:18.008] ..$ future.call.arguments : [13:13:18.008] ..$ ...future.elements_ii : [13:13:18.008] ..$ ...future.seeds_ii : [13:13:18.008] ..$ ...future.globals.maxSize: [13:13:18.008] - attr(*, "resolved")= logi FALSE [13:13:18.008] - attr(*, "total_size")= num 1248 [13:13:18.008] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:18.008] - attr(*, "already-done")= logi TRUE [13:13:18.015] - copied '...future.FUN' to environment [13:13:18.015] - copied 'future.call.arguments' to environment [13:13:18.015] - copied '...future.elements_ii' to environment [13:13:18.015] - copied '...future.seeds_ii' to environment [13:13:18.015] - copied '...future.globals.maxSize' to environment [13:13:18.016] assign_globals() ... done [13:13:18.016] plan(): Setting new future strategy stack: [13:13:18.016] List of future strategies: [13:13:18.016] 1. sequential: [13:13:18.016] - args: function (..., envir = parent.frame(), workers = "") [13:13:18.016] - tweaked: FALSE [13:13:18.016] - call: NULL [13:13:18.017] plan(): nbrOfWorkers() = 1 [13:13:18.019] plan(): Setting new future strategy stack: [13:13:18.019] List of future strategies: [13:13:18.019] 1. sequential: [13:13:18.019] - args: function (..., envir = parent.frame(), workers = "") [13:13:18.019] - tweaked: FALSE [13:13:18.019] - call: plan(strategy) [13:13:18.019] plan(): nbrOfWorkers() = 1 [13:13:18.020] SequentialFuture started (and completed) [13:13:18.020] - Launch lazy future ... done [13:13:18.020] run() for 'SequentialFuture' ... done [13:13:18.020] Created future: [13:13:18.020] SequentialFuture: [13:13:18.020] Label: 'future_eapply-1' [13:13:18.020] Expression: [13:13:18.020] { [13:13:18.020] do.call(function(...) { [13:13:18.020] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:18.020] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:18.020] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:18.020] on.exit(options(oopts), add = TRUE) [13:13:18.020] } [13:13:18.020] { [13:13:18.020] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:18.020] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:18.020] ...future.FUN(...future.X_jj, ...) [13:13:18.020] }) [13:13:18.020] } [13:13:18.020] }, args = future.call.arguments) [13:13:18.020] } [13:13:18.020] Lazy evaluation: FALSE [13:13:18.020] Asynchronous evaluation: FALSE [13:13:18.020] Local evaluation: TRUE [13:13:18.020] Environment: R_GlobalEnv [13:13:18.020] Capture standard output: TRUE [13:13:18.020] Capture condition classes: 'condition' (excluding 'nothing') [13:13:18.020] Globals: 5 objects totaling 1.48 KiB (function '...future.FUN' of 1.22 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 272 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:13:18.020] Packages: 1 packages ('stats') [13:13:18.020] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:18.020] Resolved: TRUE [13:13:18.020] Value: 1.71 KiB of class 'list' [13:13:18.020] Early signaling: FALSE [13:13:18.020] Owner process: 9511365f-3977-b8d2-248f-88bd32fc0252 [13:13:18.020] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [13:13:18.022] Chunk #1 of 1 ... DONE [13:13:18.022] Launching 1 futures (chunks) ... DONE [13:13:18.022] Resolving 1 futures (chunks) ... [13:13:18.022] resolve() on list ... [13:13:18.022] recursive: 0 [13:13:18.023] length: 1 [13:13:18.023] [13:13:18.023] resolved() for 'SequentialFuture' ... [13:13:18.023] - state: 'finished' [13:13:18.023] - run: TRUE [13:13:18.023] - result: 'FutureResult' [13:13:18.024] resolved() for 'SequentialFuture' ... done [13:13:18.025] Future #1 [13:13:18.025] signalConditionsASAP(SequentialFuture, pos=1) ... [13:13:18.025] - nx: 1 [13:13:18.025] - relay: TRUE [13:13:18.025] - stdout: TRUE [13:13:18.025] - signal: TRUE [13:13:18.026] - resignal: FALSE [13:13:18.026] - force: TRUE [13:13:18.026] - relayed: [n=1] FALSE [13:13:18.026] - queued futures: [n=1] FALSE [13:13:18.026] - until=1 [13:13:18.026] - relaying element #1 [13:13:18.027] - relayed: [n=1] TRUE [13:13:18.027] - queued futures: [n=1] TRUE [13:13:18.027] signalConditionsASAP(SequentialFuture, pos=1) ... done [13:13:18.027] length: 0 (resolved future 1) [13:13:18.027] Relaying remaining futures [13:13:18.027] signalConditionsASAP(NULL, pos=0) ... [13:13:18.028] - nx: 1 [13:13:18.028] - relay: TRUE [13:13:18.028] - stdout: TRUE [13:13:18.028] - signal: TRUE [13:13:18.028] - resignal: FALSE [13:13:18.028] - force: TRUE [13:13:18.028] - relayed: [n=1] TRUE [13:13:18.029] - queued futures: [n=1] TRUE - flush all [13:13:18.029] - relayed: [n=1] TRUE [13:13:18.029] - queued futures: [n=1] TRUE [13:13:18.029] signalConditionsASAP(NULL, pos=0) ... done [13:13:18.029] resolve() on list ... DONE [13:13:18.030] - Number of value chunks collected: 1 [13:13:18.030] Resolving 1 futures (chunks) ... DONE [13:13:18.030] Reducing values from 1 chunks ... [13:13:18.030] - Number of values collected after concatenation: 3 [13:13:18.030] - Number of values expected: 3 [13:13:18.030] Reducing values from 1 chunks ... DONE [13:13:18.031] future_lapply() ... DONE [13:13:18.031] plan(): Setting new future strategy stack: [13:13:18.031] List of future strategies: [13:13:18.031] 1. sequential: [13:13:18.031] - args: function (..., envir = parent.frame(), workers = "") [13:13:18.031] - tweaked: FALSE [13:13:18.031] - call: plan(sequential) [13:13:18.032] plan(): nbrOfWorkers() = 1 *** strategy = 'sequential' ... done *** strategy = 'multisession' ... [13:13:18.032] plan(): Setting new future strategy stack: [13:13:18.033] List of future strategies: [13:13:18.033] 1. multisession: [13:13:18.033] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:18.033] - tweaked: FALSE [13:13:18.033] - call: plan(strategy) [13:13:18.033] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... [13:13:18.033] multisession: [13:13:18.033] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [13:13:18.033] - tweaked: FALSE [13:13:18.033] - call: plan(strategy) [13:13:18.038] getGlobalsAndPackages() ... [13:13:18.038] Not searching for globals [13:13:18.038] - globals: [0] [13:13:18.038] getGlobalsAndPackages() ... DONE [13:13:18.039] [local output] makeClusterPSOCK() ... [13:13:18.069] [local output] Workers: [n = 2] 'localhost', 'localhost' [13:13:18.077] [local output] Base port: 29265 [13:13:18.077] [local output] Getting setup options for 2 cluster nodes ... [13:13:18.077] [local output] - Node 1 of 2 ... [13:13:18.078] [local output] localMachine=TRUE => revtunnel=FALSE [13:13:18.079] Testing if worker's PID can be inferred: '"D:/RCompile/recent/R/bin/x64/Rscript" -e "try(suppressWarnings(cat(Sys.getpid(),file=\"D:/temp/Rtmp0w3SwV/worker.rank=1.parallelly.parent=12356.30441f6999c.pid\")), silent = TRUE)" -e "file.exists(\"D:/temp/Rtmp0w3SwV/worker.rank=1.parallelly.parent=12356.30441f6999c.pid\")"' [13:13:18.515] - Possible to infer worker's PID: TRUE [13:13:18.516] [local output] Rscript port: 29265 [13:13:18.517] [local output] - Node 2 of 2 ... [13:13:18.517] [local output] localMachine=TRUE => revtunnel=FALSE [13:13:18.518] [local output] Rscript port: 29265 [13:13:18.519] [local output] Getting setup options for 2 cluster nodes ... done [13:13:18.519] [local output] - Parallel setup requested for some PSOCK nodes [13:13:18.520] [local output] Setting up PSOCK nodes in parallel [13:13:18.520] List of 36 [13:13:18.520] $ worker : chr "localhost" [13:13:18.520] ..- attr(*, "localhost")= logi TRUE [13:13:18.520] $ master : chr "localhost" [13:13:18.520] $ port : int 29265 [13:13:18.520] $ connectTimeout : num 120 [13:13:18.520] $ timeout : num 120 [13:13:18.520] $ rscript : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\"" [13:13:18.520] $ homogeneous : logi TRUE [13:13:18.520] $ rscript_args : chr "--default-packages=datasets,utils,grDevices,graphics,stats,methods -e \"#label=future_eapply.R:12356:CRANWIN3:C"| __truncated__ [13:13:18.520] $ rscript_envs : NULL [13:13:18.520] $ rscript_libs : chr [1:2] "D:/temp/RtmpKkFYYg/RLIBS_20dc214b714b" "D:/RCompile/recent/R/library" [13:13:18.520] $ rscript_startup : NULL [13:13:18.520] $ rscript_sh : chr "cmd" [13:13:18.520] $ default_packages: chr [1:6] "datasets" "utils" "grDevices" "graphics" ... [13:13:18.520] $ methods : logi TRUE [13:13:18.520] $ socketOptions : chr "no-delay" [13:13:18.520] $ useXDR : logi FALSE [13:13:18.520] $ outfile : chr "/dev/null" [13:13:18.520] $ renice : int NA [13:13:18.520] $ rshcmd : NULL [13:13:18.520] $ user : chr(0) [13:13:18.520] $ revtunnel : logi FALSE [13:13:18.520] $ rshlogfile : NULL [13:13:18.520] $ rshopts : chr(0) [13:13:18.520] $ rank : int 1 [13:13:18.520] $ manual : logi FALSE [13:13:18.520] $ dryrun : logi FALSE [13:13:18.520] $ quiet : logi FALSE [13:13:18.520] $ setup_strategy : chr "parallel" [13:13:18.520] $ local_cmd : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "| __truncated__ [13:13:18.520] $ pidfile : chr "D:/temp/Rtmp0w3SwV/worker.rank=1.parallelly.parent=12356.30441f6999c.pid" [13:13:18.520] $ rshcmd_label : NULL [13:13:18.520] $ rsh_call : NULL [13:13:18.520] $ cmd : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "| __truncated__ [13:13:18.520] $ localMachine : logi TRUE [13:13:18.520] $ make_fcn :function (worker = getOption2("parallelly.localhost.hostname", "localhost"), [13:13:18.520] master = NULL, port, connectTimeout = getOption2("parallelly.makeNodePSOCK.connectTimeout", [13:13:18.520] 2 * 60), timeout = getOption2("parallelly.makeNodePSOCK.timeout", [13:13:18.520] 30 * 24 * 60 * 60), rscript = NULL, homogeneous = NULL, rscript_args = NULL, [13:13:18.520] rscript_envs = NULL, rscript_libs = NULL, rscript_startup = NULL, rscript_sh = c("auto", [13:13:18.520] "cmd", "sh"), default_packages = c("datasets", "utils", "grDevices", [13:13:18.520] "graphics", "stats", if (methods) "methods"), methods = TRUE, socketOptions = getOption2("parallelly.makeNodePSOCK.socketOptions", [13:13:18.520] "no-delay"), useXDR = getOption2("parallelly.makeNodePSOCK.useXDR", [13:13:18.520] FALSE), outfile = "/dev/null", renice = NA_integer_, rshcmd = getOption2("parallelly.makeNodePSOCK.rshcmd", [13:13:18.520] NULL), user = NULL, revtunnel = NA, rshlogfile = NULL, rshopts = getOption2("parallelly.makeNodePSOCK.rshopts", [13:13:18.520] NULL), rank = 1L, manual = FALSE, dryrun = FALSE, quiet = FALSE, [13:13:18.520] setup_strategy = getOption2("parallelly.makeNodePSOCK.setup_strategy", [13:13:18.520] "parallel"), action = c("launch", "options"), verbose = FALSE) [13:13:18.520] $ arguments :List of 28 [13:13:18.520] ..$ worker : chr "localhost" [13:13:18.520] ..$ master : NULL [13:13:18.520] ..$ port : int 29265 [13:13:18.520] ..$ connectTimeout : num 120 [13:13:18.520] ..$ timeout : num 120 [13:13:18.520] ..$ rscript : NULL [13:13:18.520] ..$ homogeneous : NULL [13:13:18.520] ..$ rscript_args : NULL [13:13:18.520] ..$ rscript_envs : NULL [13:13:18.520] ..$ rscript_libs : chr [1:2] "D:/temp/RtmpKkFYYg/RLIBS_20dc214b714b" "D:/RCompile/recent/R/library" [13:13:18.520] ..$ rscript_startup : NULL [13:13:18.520] ..$ rscript_sh : chr [1:3] "auto" "cmd" "sh" [13:13:18.520] ..$ default_packages: chr [1:6] "datasets" "utils" "grDevices" "graphics" ... [13:13:18.520] ..$ methods : logi TRUE [13:13:18.520] ..$ socketOptions : chr "no-delay" [13:13:18.520] ..$ useXDR : logi FALSE [13:13:18.520] ..$ outfile : chr "/dev/null" [13:13:18.520] ..$ renice : int NA [13:13:18.520] ..$ rshcmd : NULL [13:13:18.520] ..$ user : NULL [13:13:18.520] ..$ revtunnel : logi NA [13:13:18.520] ..$ rshlogfile : NULL [13:13:18.520] ..$ rshopts : NULL [13:13:18.520] ..$ rank : int 1 [13:13:18.520] ..$ manual : logi FALSE [13:13:18.520] ..$ dryrun : logi FALSE [13:13:18.520] ..$ quiet : logi FALSE [13:13:18.520] ..$ setup_strategy : chr "parallel" [13:13:18.520] - attr(*, "class")= chr [1:2] "makeNodePSOCKOptions" "makeNodeOptions" [13:13:18.542] [local output] System call to launch all workers: [13:13:18.542] [local output] "D:/RCompile/recent/R/bin/x64/Rscript" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "#label=future_eapply.R:12356:CRANWIN3:CRAN" -e "try(suppressWarnings(cat(Sys.getpid(),file=\"D:/temp/Rtmp0w3SwV/worker.rank=1.parallelly.parent=12356.30441f6999c.pid\")), silent = TRUE)" -e "options(socketOptions = \"no-delay\")" -e ".libPaths(c(\"D:/temp/RtmpKkFYYg/RLIBS_20dc214b714b\",\"D:/RCompile/recent/R/library\"))" -e "workRSOCK <- tryCatch(parallel:::.workRSOCK, error=function(e) parallel:::.slaveRSOCK); workRSOCK()" MASTER=localhost PORT=29265 OUT=/dev/null TIMEOUT=120 XDR=FALSE SETUPTIMEOUT=120 SETUPSTRATEGY=parallel [13:13:18.542] [local output] Starting PSOCK main server [13:13:18.548] [local output] Workers launched [13:13:18.548] [local output] Waiting for workers to connect back [13:13:18.548] - [local output] 0 workers out of 2 ready [13:13:18.718] - [local output] 0 workers out of 2 ready [13:13:18.719] - [local output] 1 workers out of 2 ready [13:13:18.719] - [local output] 2 workers out of 2 ready [13:13:18.719] [local output] Launching of workers completed [13:13:18.719] [local output] Collecting session information from workers [13:13:18.720] [local output] - Worker #1 of 2 [13:13:18.721] [local output] - Worker #2 of 2 [13:13:18.721] [local output] makeClusterPSOCK() ... done [13:13:18.734] Packages needed by the future expression (n = 0): [13:13:18.735] Packages needed by future strategies (n = 0): [13:13:18.735] { [13:13:18.735] { [13:13:18.735] { [13:13:18.735] ...future.startTime <- base::Sys.time() [13:13:18.735] { [13:13:18.735] { [13:13:18.735] { [13:13:18.735] { [13:13:18.735] base::local({ [13:13:18.735] has_future <- base::requireNamespace("future", [13:13:18.735] quietly = TRUE) [13:13:18.735] if (has_future) { [13:13:18.735] ns <- base::getNamespace("future") [13:13:18.735] version <- ns[[".package"]][["version"]] [13:13:18.735] if (is.null(version)) [13:13:18.735] version <- utils::packageVersion("future") [13:13:18.735] } [13:13:18.735] else { [13:13:18.735] version <- NULL [13:13:18.735] } [13:13:18.735] if (!has_future || version < "1.8.0") { [13:13:18.735] info <- base::c(r_version = base::gsub("R version ", [13:13:18.735] "", base::R.version$version.string), [13:13:18.735] platform = base::sprintf("%s (%s-bit)", [13:13:18.735] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:18.735] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:18.735] "release", "version")], collapse = " "), [13:13:18.735] hostname = base::Sys.info()[["nodename"]]) [13:13:18.735] info <- base::sprintf("%s: %s", base::names(info), [13:13:18.735] info) [13:13:18.735] info <- base::paste(info, collapse = "; ") [13:13:18.735] if (!has_future) { [13:13:18.735] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:18.735] info) [13:13:18.735] } [13:13:18.735] else { [13:13:18.735] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:18.735] info, version) [13:13:18.735] } [13:13:18.735] base::stop(msg) [13:13:18.735] } [13:13:18.735] }) [13:13:18.735] } [13:13:18.735] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:18.735] base::options(mc.cores = 1L) [13:13:18.735] } [13:13:18.735] options(future.plan = NULL) [13:13:18.735] Sys.unsetenv("R_FUTURE_PLAN") [13:13:18.735] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:18.735] } [13:13:18.735] ...future.workdir <- getwd() [13:13:18.735] } [13:13:18.735] ...future.oldOptions <- base::as.list(base::.Options) [13:13:18.735] ...future.oldEnvVars <- base::Sys.getenv() [13:13:18.735] } [13:13:18.735] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:18.735] future.globals.maxSize = NULL, future.globals.method = NULL, [13:13:18.735] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:18.735] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:18.735] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:18.735] future.stdout.windows.reencode = NULL, width = 80L) [13:13:18.735] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:18.735] base::names(...future.oldOptions)) [13:13:18.735] } [13:13:18.735] if (FALSE) { [13:13:18.735] } [13:13:18.735] else { [13:13:18.735] if (TRUE) { [13:13:18.735] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:18.735] open = "w") [13:13:18.735] } [13:13:18.735] else { [13:13:18.735] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:18.735] windows = "NUL", "/dev/null"), open = "w") [13:13:18.735] } [13:13:18.735] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:18.735] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:18.735] base::sink(type = "output", split = FALSE) [13:13:18.735] base::close(...future.stdout) [13:13:18.735] }, add = TRUE) [13:13:18.735] } [13:13:18.735] ...future.frame <- base::sys.nframe() [13:13:18.735] ...future.conditions <- base::list() [13:13:18.735] ...future.rng <- base::globalenv()$.Random.seed [13:13:18.735] if (FALSE) { [13:13:18.735] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:18.735] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:18.735] } [13:13:18.735] ...future.result <- base::tryCatch({ [13:13:18.735] base::withCallingHandlers({ [13:13:18.735] ...future.value <- base::withVisible(base::local({ [13:13:18.735] ...future.makeSendCondition <- local({ [13:13:18.735] sendCondition <- NULL [13:13:18.735] function(frame = 1L) { [13:13:18.735] if (is.function(sendCondition)) [13:13:18.735] return(sendCondition) [13:13:18.735] ns <- getNamespace("parallel") [13:13:18.735] if (exists("sendData", mode = "function", [13:13:18.735] envir = ns)) { [13:13:18.735] parallel_sendData <- get("sendData", mode = "function", [13:13:18.735] envir = ns) [13:13:18.735] envir <- sys.frame(frame) [13:13:18.735] master <- NULL [13:13:18.735] while (!identical(envir, .GlobalEnv) && [13:13:18.735] !identical(envir, emptyenv())) { [13:13:18.735] if (exists("master", mode = "list", envir = envir, [13:13:18.735] inherits = FALSE)) { [13:13:18.735] master <- get("master", mode = "list", [13:13:18.735] envir = envir, inherits = FALSE) [13:13:18.735] if (inherits(master, c("SOCKnode", [13:13:18.735] "SOCK0node"))) { [13:13:18.735] sendCondition <<- function(cond) { [13:13:18.735] data <- list(type = "VALUE", value = cond, [13:13:18.735] success = TRUE) [13:13:18.735] parallel_sendData(master, data) [13:13:18.735] } [13:13:18.735] return(sendCondition) [13:13:18.735] } [13:13:18.735] } [13:13:18.735] frame <- frame + 1L [13:13:18.735] envir <- sys.frame(frame) [13:13:18.735] } [13:13:18.735] } [13:13:18.735] sendCondition <<- function(cond) NULL [13:13:18.735] } [13:13:18.735] }) [13:13:18.735] withCallingHandlers({ [13:13:18.735] NA [13:13:18.735] }, immediateCondition = function(cond) { [13:13:18.735] sendCondition <- ...future.makeSendCondition() [13:13:18.735] sendCondition(cond) [13:13:18.735] muffleCondition <- function (cond, pattern = "^muffle") [13:13:18.735] { [13:13:18.735] inherits <- base::inherits [13:13:18.735] invokeRestart <- base::invokeRestart [13:13:18.735] is.null <- base::is.null [13:13:18.735] muffled <- FALSE [13:13:18.735] if (inherits(cond, "message")) { [13:13:18.735] muffled <- grepl(pattern, "muffleMessage") [13:13:18.735] if (muffled) [13:13:18.735] invokeRestart("muffleMessage") [13:13:18.735] } [13:13:18.735] else if (inherits(cond, "warning")) { [13:13:18.735] muffled <- grepl(pattern, "muffleWarning") [13:13:18.735] if (muffled) [13:13:18.735] invokeRestart("muffleWarning") [13:13:18.735] } [13:13:18.735] else if (inherits(cond, "condition")) { [13:13:18.735] if (!is.null(pattern)) { [13:13:18.735] computeRestarts <- base::computeRestarts [13:13:18.735] grepl <- base::grepl [13:13:18.735] restarts <- computeRestarts(cond) [13:13:18.735] for (restart in restarts) { [13:13:18.735] name <- restart$name [13:13:18.735] if (is.null(name)) [13:13:18.735] next [13:13:18.735] if (!grepl(pattern, name)) [13:13:18.735] next [13:13:18.735] invokeRestart(restart) [13:13:18.735] muffled <- TRUE [13:13:18.735] break [13:13:18.735] } [13:13:18.735] } [13:13:18.735] } [13:13:18.735] invisible(muffled) [13:13:18.735] } [13:13:18.735] muffleCondition(cond) [13:13:18.735] }) [13:13:18.735] })) [13:13:18.735] future::FutureResult(value = ...future.value$value, [13:13:18.735] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:18.735] ...future.rng), globalenv = if (FALSE) [13:13:18.735] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:18.735] ...future.globalenv.names)) [13:13:18.735] else NULL, started = ...future.startTime, version = "1.8") [13:13:18.735] }, condition = base::local({ [13:13:18.735] c <- base::c [13:13:18.735] inherits <- base::inherits [13:13:18.735] invokeRestart <- base::invokeRestart [13:13:18.735] length <- base::length [13:13:18.735] list <- base::list [13:13:18.735] seq.int <- base::seq.int [13:13:18.735] signalCondition <- base::signalCondition [13:13:18.735] sys.calls <- base::sys.calls [13:13:18.735] `[[` <- base::`[[` [13:13:18.735] `+` <- base::`+` [13:13:18.735] `<<-` <- base::`<<-` [13:13:18.735] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:18.735] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:18.735] 3L)] [13:13:18.735] } [13:13:18.735] function(cond) { [13:13:18.735] is_error <- inherits(cond, "error") [13:13:18.735] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:18.735] NULL) [13:13:18.735] if (is_error) { [13:13:18.735] sessionInformation <- function() { [13:13:18.735] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:18.735] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:18.735] search = base::search(), system = base::Sys.info()) [13:13:18.735] } [13:13:18.735] ...future.conditions[[length(...future.conditions) + [13:13:18.735] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:18.735] cond$call), session = sessionInformation(), [13:13:18.735] timestamp = base::Sys.time(), signaled = 0L) [13:13:18.735] signalCondition(cond) [13:13:18.735] } [13:13:18.735] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:18.735] "immediateCondition"))) { [13:13:18.735] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:18.735] ...future.conditions[[length(...future.conditions) + [13:13:18.735] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:18.735] if (TRUE && !signal) { [13:13:18.735] muffleCondition <- function (cond, pattern = "^muffle") [13:13:18.735] { [13:13:18.735] inherits <- base::inherits [13:13:18.735] invokeRestart <- base::invokeRestart [13:13:18.735] is.null <- base::is.null [13:13:18.735] muffled <- FALSE [13:13:18.735] if (inherits(cond, "message")) { [13:13:18.735] muffled <- grepl(pattern, "muffleMessage") [13:13:18.735] if (muffled) [13:13:18.735] invokeRestart("muffleMessage") [13:13:18.735] } [13:13:18.735] else if (inherits(cond, "warning")) { [13:13:18.735] muffled <- grepl(pattern, "muffleWarning") [13:13:18.735] if (muffled) [13:13:18.735] invokeRestart("muffleWarning") [13:13:18.735] } [13:13:18.735] else if (inherits(cond, "condition")) { [13:13:18.735] if (!is.null(pattern)) { [13:13:18.735] computeRestarts <- base::computeRestarts [13:13:18.735] grepl <- base::grepl [13:13:18.735] restarts <- computeRestarts(cond) [13:13:18.735] for (restart in restarts) { [13:13:18.735] name <- restart$name [13:13:18.735] if (is.null(name)) [13:13:18.735] next [13:13:18.735] if (!grepl(pattern, name)) [13:13:18.735] next [13:13:18.735] invokeRestart(restart) [13:13:18.735] muffled <- TRUE [13:13:18.735] break [13:13:18.735] } [13:13:18.735] } [13:13:18.735] } [13:13:18.735] invisible(muffled) [13:13:18.735] } [13:13:18.735] muffleCondition(cond, pattern = "^muffle") [13:13:18.735] } [13:13:18.735] } [13:13:18.735] else { [13:13:18.735] if (TRUE) { [13:13:18.735] muffleCondition <- function (cond, pattern = "^muffle") [13:13:18.735] { [13:13:18.735] inherits <- base::inherits [13:13:18.735] invokeRestart <- base::invokeRestart [13:13:18.735] is.null <- base::is.null [13:13:18.735] muffled <- FALSE [13:13:18.735] if (inherits(cond, "message")) { [13:13:18.735] muffled <- grepl(pattern, "muffleMessage") [13:13:18.735] if (muffled) [13:13:18.735] invokeRestart("muffleMessage") [13:13:18.735] } [13:13:18.735] else if (inherits(cond, "warning")) { [13:13:18.735] muffled <- grepl(pattern, "muffleWarning") [13:13:18.735] if (muffled) [13:13:18.735] invokeRestart("muffleWarning") [13:13:18.735] } [13:13:18.735] else if (inherits(cond, "condition")) { [13:13:18.735] if (!is.null(pattern)) { [13:13:18.735] computeRestarts <- base::computeRestarts [13:13:18.735] grepl <- base::grepl [13:13:18.735] restarts <- computeRestarts(cond) [13:13:18.735] for (restart in restarts) { [13:13:18.735] name <- restart$name [13:13:18.735] if (is.null(name)) [13:13:18.735] next [13:13:18.735] if (!grepl(pattern, name)) [13:13:18.735] next [13:13:18.735] invokeRestart(restart) [13:13:18.735] muffled <- TRUE [13:13:18.735] break [13:13:18.735] } [13:13:18.735] } [13:13:18.735] } [13:13:18.735] invisible(muffled) [13:13:18.735] } [13:13:18.735] muffleCondition(cond, pattern = "^muffle") [13:13:18.735] } [13:13:18.735] } [13:13:18.735] } [13:13:18.735] })) [13:13:18.735] }, error = function(ex) { [13:13:18.735] base::structure(base::list(value = NULL, visible = NULL, [13:13:18.735] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:18.735] ...future.rng), started = ...future.startTime, [13:13:18.735] finished = Sys.time(), session_uuid = NA_character_, [13:13:18.735] version = "1.8"), class = "FutureResult") [13:13:18.735] }, finally = { [13:13:18.735] if (!identical(...future.workdir, getwd())) [13:13:18.735] setwd(...future.workdir) [13:13:18.735] { [13:13:18.735] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:18.735] ...future.oldOptions$nwarnings <- NULL [13:13:18.735] } [13:13:18.735] base::options(...future.oldOptions) [13:13:18.735] if (.Platform$OS.type == "windows") { [13:13:18.735] old_names <- names(...future.oldEnvVars) [13:13:18.735] envs <- base::Sys.getenv() [13:13:18.735] names <- names(envs) [13:13:18.735] common <- intersect(names, old_names) [13:13:18.735] added <- setdiff(names, old_names) [13:13:18.735] removed <- setdiff(old_names, names) [13:13:18.735] changed <- common[...future.oldEnvVars[common] != [13:13:18.735] envs[common]] [13:13:18.735] NAMES <- toupper(changed) [13:13:18.735] args <- list() [13:13:18.735] for (kk in seq_along(NAMES)) { [13:13:18.735] name <- changed[[kk]] [13:13:18.735] NAME <- NAMES[[kk]] [13:13:18.735] if (name != NAME && is.element(NAME, old_names)) [13:13:18.735] next [13:13:18.735] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:18.735] } [13:13:18.735] NAMES <- toupper(added) [13:13:18.735] for (kk in seq_along(NAMES)) { [13:13:18.735] name <- added[[kk]] [13:13:18.735] NAME <- NAMES[[kk]] [13:13:18.735] if (name != NAME && is.element(NAME, old_names)) [13:13:18.735] next [13:13:18.735] args[[name]] <- "" [13:13:18.735] } [13:13:18.735] NAMES <- toupper(removed) [13:13:18.735] for (kk in seq_along(NAMES)) { [13:13:18.735] name <- removed[[kk]] [13:13:18.735] NAME <- NAMES[[kk]] [13:13:18.735] if (name != NAME && is.element(NAME, old_names)) [13:13:18.735] next [13:13:18.735] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:18.735] } [13:13:18.735] if (length(args) > 0) [13:13:18.735] base::do.call(base::Sys.setenv, args = args) [13:13:18.735] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:18.735] } [13:13:18.735] else { [13:13:18.735] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:18.735] } [13:13:18.735] { [13:13:18.735] if (base::length(...future.futureOptionsAdded) > [13:13:18.735] 0L) { [13:13:18.735] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:18.735] base::names(opts) <- ...future.futureOptionsAdded [13:13:18.735] base::options(opts) [13:13:18.735] } [13:13:18.735] { [13:13:18.735] { [13:13:18.735] base::options(mc.cores = ...future.mc.cores.old) [13:13:18.735] NULL [13:13:18.735] } [13:13:18.735] options(future.plan = NULL) [13:13:18.735] if (is.na(NA_character_)) [13:13:18.735] Sys.unsetenv("R_FUTURE_PLAN") [13:13:18.735] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:18.735] future::plan(list(function (..., workers = availableCores(), [13:13:18.735] lazy = FALSE, rscript_libs = .libPaths(), [13:13:18.735] envir = parent.frame()) [13:13:18.735] { [13:13:18.735] if (is.function(workers)) [13:13:18.735] workers <- workers() [13:13:18.735] workers <- structure(as.integer(workers), [13:13:18.735] class = class(workers)) [13:13:18.735] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:18.735] workers >= 1) [13:13:18.735] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:18.735] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:18.735] } [13:13:18.735] future <- MultisessionFuture(..., workers = workers, [13:13:18.735] lazy = lazy, rscript_libs = rscript_libs, [13:13:18.735] envir = envir) [13:13:18.735] if (!future$lazy) [13:13:18.735] future <- run(future) [13:13:18.735] invisible(future) [13:13:18.735] }), .cleanup = FALSE, .init = FALSE) [13:13:18.735] } [13:13:18.735] } [13:13:18.735] } [13:13:18.735] }) [13:13:18.735] if (TRUE) { [13:13:18.735] base::sink(type = "output", split = FALSE) [13:13:18.735] if (TRUE) { [13:13:18.735] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:18.735] } [13:13:18.735] else { [13:13:18.735] ...future.result["stdout"] <- base::list(NULL) [13:13:18.735] } [13:13:18.735] base::close(...future.stdout) [13:13:18.735] ...future.stdout <- NULL [13:13:18.735] } [13:13:18.735] ...future.result$conditions <- ...future.conditions [13:13:18.735] ...future.result$finished <- base::Sys.time() [13:13:18.735] ...future.result [13:13:18.735] } [13:13:18.811] MultisessionFuture started [13:13:18.812] result() for ClusterFuture ... [13:13:18.812] receiveMessageFromWorker() for ClusterFuture ... [13:13:18.812] - Validating connection of MultisessionFuture [13:13:18.869] - received message: FutureResult [13:13:18.869] - Received FutureResult [13:13:18.872] - Erased future from FutureRegistry [13:13:18.873] result() for ClusterFuture ... [13:13:18.873] - result already collected: FutureResult [13:13:18.873] result() for ClusterFuture ... done [13:13:18.873] receiveMessageFromWorker() for ClusterFuture ... done [13:13:18.873] result() for ClusterFuture ... done [13:13:18.874] result() for ClusterFuture ... [13:13:18.874] - result already collected: FutureResult [13:13:18.874] result() for ClusterFuture ... done [13:13:18.874] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... DONE [13:13:18.877] plan(): nbrOfWorkers() = 2 [13:13:18.877] future_lapply() ... [13:13:18.881] Number of chunks: 2 [13:13:18.881] getGlobalsAndPackagesXApply() ... [13:13:18.881] - future.globals: TRUE [13:13:18.882] getGlobalsAndPackages() ... [13:13:18.882] Searching for globals... [13:13:18.883] - globals found: [2] 'FUN', 'UseMethod' [13:13:18.883] Searching for globals ... DONE [13:13:18.884] Resolving globals: FALSE [13:13:18.884] The total size of the 1 globals is 1.21 KiB (1240 bytes) [13:13:18.885] The total size of the 1 globals exported for future expression ('FUN()') is 1.21 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (1.21 KiB of class 'function') [13:13:18.885] - globals: [1] 'FUN' [13:13:18.885] [13:13:18.885] getGlobalsAndPackages() ... DONE [13:13:18.886] - globals found/used: [n=1] 'FUN' [13:13:18.886] - needed namespaces: [n=0] [13:13:18.886] Finding globals ... DONE [13:13:18.886] - use_args: TRUE [13:13:18.886] - Getting '...' globals ... [13:13:18.887] resolve() on list ... [13:13:18.887] recursive: 0 [13:13:18.887] length: 1 [13:13:18.887] elements: '...' [13:13:18.888] length: 0 (resolved future 1) [13:13:18.888] resolve() on list ... DONE [13:13:18.888] - '...' content: [n=0] [13:13:18.888] List of 1 [13:13:18.888] $ ...: list() [13:13:18.888] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:18.888] - attr(*, "where")=List of 1 [13:13:18.888] ..$ ...: [13:13:18.888] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:18.888] - attr(*, "resolved")= logi TRUE [13:13:18.888] - attr(*, "total_size")= num NA [13:13:18.892] - Getting '...' globals ... DONE [13:13:18.892] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:18.892] List of 2 [13:13:18.892] $ ...future.FUN:function (x, ...) [13:13:18.892] $ ... : list() [13:13:18.892] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:18.892] - attr(*, "where")=List of 2 [13:13:18.892] ..$ ...future.FUN: [13:13:18.892] ..$ ... : [13:13:18.892] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:18.892] - attr(*, "resolved")= logi FALSE [13:13:18.892] - attr(*, "total_size")= num 1240 [13:13:18.896] Packages to be attached in all futures: [n=0] [13:13:18.897] getGlobalsAndPackagesXApply() ... DONE [13:13:18.897] Number of futures (= number of chunks): 2 [13:13:18.897] Launching 2 futures (chunks) ... [13:13:18.897] Chunk #1 of 2 ... [13:13:18.898] - Finding globals in 'X' for chunk #1 ... [13:13:18.898] getGlobalsAndPackages() ... [13:13:18.898] Searching for globals... [13:13:18.898] [13:13:18.899] Searching for globals ... DONE [13:13:18.899] - globals: [0] [13:13:18.899] getGlobalsAndPackages() ... DONE [13:13:18.899] + additional globals found: [n=0] [13:13:18.899] + additional namespaces needed: [n=0] [13:13:18.900] - Finding globals in 'X' for chunk #1 ... DONE [13:13:18.900] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:18.900] - seeds: [13:13:18.900] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:18.900] getGlobalsAndPackages() ... [13:13:18.901] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:18.901] Resolving globals: FALSE [13:13:18.901] Tweak future expression to call with '...' arguments ... [13:13:18.901] { [13:13:18.901] do.call(function(...) { [13:13:18.901] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:18.901] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:18.901] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:18.901] on.exit(options(oopts), add = TRUE) [13:13:18.901] } [13:13:18.901] { [13:13:18.901] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:18.901] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:18.901] ...future.FUN(...future.X_jj, ...) [13:13:18.901] }) [13:13:18.901] } [13:13:18.901] }, args = future.call.arguments) [13:13:18.901] } [13:13:18.902] Tweak future expression to call with '...' arguments ... DONE [13:13:18.902] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:18.902] [13:13:18.903] getGlobalsAndPackages() ... DONE [13:13:18.903] run() for 'Future' ... [13:13:18.903] - state: 'created' [13:13:18.903] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:18.918] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:18.918] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:18.919] - Field: 'node' [13:13:18.919] - Field: 'label' [13:13:18.919] - Field: 'local' [13:13:18.919] - Field: 'owner' [13:13:18.919] - Field: 'envir' [13:13:18.920] - Field: 'workers' [13:13:18.920] - Field: 'packages' [13:13:18.920] - Field: 'gc' [13:13:18.920] - Field: 'conditions' [13:13:18.920] - Field: 'persistent' [13:13:18.921] - Field: 'expr' [13:13:18.921] - Field: 'uuid' [13:13:18.921] - Field: 'seed' [13:13:18.921] - Field: 'version' [13:13:18.922] - Field: 'result' [13:13:18.922] - Field: 'asynchronous' [13:13:18.922] - Field: 'calls' [13:13:18.922] - Field: 'globals' [13:13:18.922] - Field: 'stdout' [13:13:18.922] - Field: 'earlySignal' [13:13:18.923] - Field: 'lazy' [13:13:18.923] - Field: 'state' [13:13:18.923] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:18.923] - Launch lazy future ... [13:13:18.924] Packages needed by the future expression (n = 0): [13:13:18.924] Packages needed by future strategies (n = 0): [13:13:18.924] { [13:13:18.924] { [13:13:18.924] { [13:13:18.924] ...future.startTime <- base::Sys.time() [13:13:18.924] { [13:13:18.924] { [13:13:18.924] { [13:13:18.924] { [13:13:18.924] base::local({ [13:13:18.924] has_future <- base::requireNamespace("future", [13:13:18.924] quietly = TRUE) [13:13:18.924] if (has_future) { [13:13:18.924] ns <- base::getNamespace("future") [13:13:18.924] version <- ns[[".package"]][["version"]] [13:13:18.924] if (is.null(version)) [13:13:18.924] version <- utils::packageVersion("future") [13:13:18.924] } [13:13:18.924] else { [13:13:18.924] version <- NULL [13:13:18.924] } [13:13:18.924] if (!has_future || version < "1.8.0") { [13:13:18.924] info <- base::c(r_version = base::gsub("R version ", [13:13:18.924] "", base::R.version$version.string), [13:13:18.924] platform = base::sprintf("%s (%s-bit)", [13:13:18.924] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:18.924] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:18.924] "release", "version")], collapse = " "), [13:13:18.924] hostname = base::Sys.info()[["nodename"]]) [13:13:18.924] info <- base::sprintf("%s: %s", base::names(info), [13:13:18.924] info) [13:13:18.924] info <- base::paste(info, collapse = "; ") [13:13:18.924] if (!has_future) { [13:13:18.924] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:18.924] info) [13:13:18.924] } [13:13:18.924] else { [13:13:18.924] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:18.924] info, version) [13:13:18.924] } [13:13:18.924] base::stop(msg) [13:13:18.924] } [13:13:18.924] }) [13:13:18.924] } [13:13:18.924] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:18.924] base::options(mc.cores = 1L) [13:13:18.924] } [13:13:18.924] options(future.plan = NULL) [13:13:18.924] Sys.unsetenv("R_FUTURE_PLAN") [13:13:18.924] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:18.924] } [13:13:18.924] ...future.workdir <- getwd() [13:13:18.924] } [13:13:18.924] ...future.oldOptions <- base::as.list(base::.Options) [13:13:18.924] ...future.oldEnvVars <- base::Sys.getenv() [13:13:18.924] } [13:13:18.924] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:18.924] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:18.924] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:18.924] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:18.924] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:18.924] future.stdout.windows.reencode = NULL, width = 80L) [13:13:18.924] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:18.924] base::names(...future.oldOptions)) [13:13:18.924] } [13:13:18.924] if (FALSE) { [13:13:18.924] } [13:13:18.924] else { [13:13:18.924] if (TRUE) { [13:13:18.924] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:18.924] open = "w") [13:13:18.924] } [13:13:18.924] else { [13:13:18.924] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:18.924] windows = "NUL", "/dev/null"), open = "w") [13:13:18.924] } [13:13:18.924] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:18.924] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:18.924] base::sink(type = "output", split = FALSE) [13:13:18.924] base::close(...future.stdout) [13:13:18.924] }, add = TRUE) [13:13:18.924] } [13:13:18.924] ...future.frame <- base::sys.nframe() [13:13:18.924] ...future.conditions <- base::list() [13:13:18.924] ...future.rng <- base::globalenv()$.Random.seed [13:13:18.924] if (FALSE) { [13:13:18.924] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:18.924] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:18.924] } [13:13:18.924] ...future.result <- base::tryCatch({ [13:13:18.924] base::withCallingHandlers({ [13:13:18.924] ...future.value <- base::withVisible(base::local({ [13:13:18.924] ...future.makeSendCondition <- local({ [13:13:18.924] sendCondition <- NULL [13:13:18.924] function(frame = 1L) { [13:13:18.924] if (is.function(sendCondition)) [13:13:18.924] return(sendCondition) [13:13:18.924] ns <- getNamespace("parallel") [13:13:18.924] if (exists("sendData", mode = "function", [13:13:18.924] envir = ns)) { [13:13:18.924] parallel_sendData <- get("sendData", mode = "function", [13:13:18.924] envir = ns) [13:13:18.924] envir <- sys.frame(frame) [13:13:18.924] master <- NULL [13:13:18.924] while (!identical(envir, .GlobalEnv) && [13:13:18.924] !identical(envir, emptyenv())) { [13:13:18.924] if (exists("master", mode = "list", envir = envir, [13:13:18.924] inherits = FALSE)) { [13:13:18.924] master <- get("master", mode = "list", [13:13:18.924] envir = envir, inherits = FALSE) [13:13:18.924] if (inherits(master, c("SOCKnode", [13:13:18.924] "SOCK0node"))) { [13:13:18.924] sendCondition <<- function(cond) { [13:13:18.924] data <- list(type = "VALUE", value = cond, [13:13:18.924] success = TRUE) [13:13:18.924] parallel_sendData(master, data) [13:13:18.924] } [13:13:18.924] return(sendCondition) [13:13:18.924] } [13:13:18.924] } [13:13:18.924] frame <- frame + 1L [13:13:18.924] envir <- sys.frame(frame) [13:13:18.924] } [13:13:18.924] } [13:13:18.924] sendCondition <<- function(cond) NULL [13:13:18.924] } [13:13:18.924] }) [13:13:18.924] withCallingHandlers({ [13:13:18.924] { [13:13:18.924] do.call(function(...) { [13:13:18.924] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:18.924] if (!identical(...future.globals.maxSize.org, [13:13:18.924] ...future.globals.maxSize)) { [13:13:18.924] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:18.924] on.exit(options(oopts), add = TRUE) [13:13:18.924] } [13:13:18.924] { [13:13:18.924] lapply(seq_along(...future.elements_ii), [13:13:18.924] FUN = function(jj) { [13:13:18.924] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:18.924] ...future.FUN(...future.X_jj, ...) [13:13:18.924] }) [13:13:18.924] } [13:13:18.924] }, args = future.call.arguments) [13:13:18.924] } [13:13:18.924] }, immediateCondition = function(cond) { [13:13:18.924] sendCondition <- ...future.makeSendCondition() [13:13:18.924] sendCondition(cond) [13:13:18.924] muffleCondition <- function (cond, pattern = "^muffle") [13:13:18.924] { [13:13:18.924] inherits <- base::inherits [13:13:18.924] invokeRestart <- base::invokeRestart [13:13:18.924] is.null <- base::is.null [13:13:18.924] muffled <- FALSE [13:13:18.924] if (inherits(cond, "message")) { [13:13:18.924] muffled <- grepl(pattern, "muffleMessage") [13:13:18.924] if (muffled) [13:13:18.924] invokeRestart("muffleMessage") [13:13:18.924] } [13:13:18.924] else if (inherits(cond, "warning")) { [13:13:18.924] muffled <- grepl(pattern, "muffleWarning") [13:13:18.924] if (muffled) [13:13:18.924] invokeRestart("muffleWarning") [13:13:18.924] } [13:13:18.924] else if (inherits(cond, "condition")) { [13:13:18.924] if (!is.null(pattern)) { [13:13:18.924] computeRestarts <- base::computeRestarts [13:13:18.924] grepl <- base::grepl [13:13:18.924] restarts <- computeRestarts(cond) [13:13:18.924] for (restart in restarts) { [13:13:18.924] name <- restart$name [13:13:18.924] if (is.null(name)) [13:13:18.924] next [13:13:18.924] if (!grepl(pattern, name)) [13:13:18.924] next [13:13:18.924] invokeRestart(restart) [13:13:18.924] muffled <- TRUE [13:13:18.924] break [13:13:18.924] } [13:13:18.924] } [13:13:18.924] } [13:13:18.924] invisible(muffled) [13:13:18.924] } [13:13:18.924] muffleCondition(cond) [13:13:18.924] }) [13:13:18.924] })) [13:13:18.924] future::FutureResult(value = ...future.value$value, [13:13:18.924] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:18.924] ...future.rng), globalenv = if (FALSE) [13:13:18.924] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:18.924] ...future.globalenv.names)) [13:13:18.924] else NULL, started = ...future.startTime, version = "1.8") [13:13:18.924] }, condition = base::local({ [13:13:18.924] c <- base::c [13:13:18.924] inherits <- base::inherits [13:13:18.924] invokeRestart <- base::invokeRestart [13:13:18.924] length <- base::length [13:13:18.924] list <- base::list [13:13:18.924] seq.int <- base::seq.int [13:13:18.924] signalCondition <- base::signalCondition [13:13:18.924] sys.calls <- base::sys.calls [13:13:18.924] `[[` <- base::`[[` [13:13:18.924] `+` <- base::`+` [13:13:18.924] `<<-` <- base::`<<-` [13:13:18.924] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:18.924] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:18.924] 3L)] [13:13:18.924] } [13:13:18.924] function(cond) { [13:13:18.924] is_error <- inherits(cond, "error") [13:13:18.924] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:18.924] NULL) [13:13:18.924] if (is_error) { [13:13:18.924] sessionInformation <- function() { [13:13:18.924] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:18.924] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:18.924] search = base::search(), system = base::Sys.info()) [13:13:18.924] } [13:13:18.924] ...future.conditions[[length(...future.conditions) + [13:13:18.924] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:18.924] cond$call), session = sessionInformation(), [13:13:18.924] timestamp = base::Sys.time(), signaled = 0L) [13:13:18.924] signalCondition(cond) [13:13:18.924] } [13:13:18.924] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:18.924] "immediateCondition"))) { [13:13:18.924] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:18.924] ...future.conditions[[length(...future.conditions) + [13:13:18.924] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:18.924] if (TRUE && !signal) { [13:13:18.924] muffleCondition <- function (cond, pattern = "^muffle") [13:13:18.924] { [13:13:18.924] inherits <- base::inherits [13:13:18.924] invokeRestart <- base::invokeRestart [13:13:18.924] is.null <- base::is.null [13:13:18.924] muffled <- FALSE [13:13:18.924] if (inherits(cond, "message")) { [13:13:18.924] muffled <- grepl(pattern, "muffleMessage") [13:13:18.924] if (muffled) [13:13:18.924] invokeRestart("muffleMessage") [13:13:18.924] } [13:13:18.924] else if (inherits(cond, "warning")) { [13:13:18.924] muffled <- grepl(pattern, "muffleWarning") [13:13:18.924] if (muffled) [13:13:18.924] invokeRestart("muffleWarning") [13:13:18.924] } [13:13:18.924] else if (inherits(cond, "condition")) { [13:13:18.924] if (!is.null(pattern)) { [13:13:18.924] computeRestarts <- base::computeRestarts [13:13:18.924] grepl <- base::grepl [13:13:18.924] restarts <- computeRestarts(cond) [13:13:18.924] for (restart in restarts) { [13:13:18.924] name <- restart$name [13:13:18.924] if (is.null(name)) [13:13:18.924] next [13:13:18.924] if (!grepl(pattern, name)) [13:13:18.924] next [13:13:18.924] invokeRestart(restart) [13:13:18.924] muffled <- TRUE [13:13:18.924] break [13:13:18.924] } [13:13:18.924] } [13:13:18.924] } [13:13:18.924] invisible(muffled) [13:13:18.924] } [13:13:18.924] muffleCondition(cond, pattern = "^muffle") [13:13:18.924] } [13:13:18.924] } [13:13:18.924] else { [13:13:18.924] if (TRUE) { [13:13:18.924] muffleCondition <- function (cond, pattern = "^muffle") [13:13:18.924] { [13:13:18.924] inherits <- base::inherits [13:13:18.924] invokeRestart <- base::invokeRestart [13:13:18.924] is.null <- base::is.null [13:13:18.924] muffled <- FALSE [13:13:18.924] if (inherits(cond, "message")) { [13:13:18.924] muffled <- grepl(pattern, "muffleMessage") [13:13:18.924] if (muffled) [13:13:18.924] invokeRestart("muffleMessage") [13:13:18.924] } [13:13:18.924] else if (inherits(cond, "warning")) { [13:13:18.924] muffled <- grepl(pattern, "muffleWarning") [13:13:18.924] if (muffled) [13:13:18.924] invokeRestart("muffleWarning") [13:13:18.924] } [13:13:18.924] else if (inherits(cond, "condition")) { [13:13:18.924] if (!is.null(pattern)) { [13:13:18.924] computeRestarts <- base::computeRestarts [13:13:18.924] grepl <- base::grepl [13:13:18.924] restarts <- computeRestarts(cond) [13:13:18.924] for (restart in restarts) { [13:13:18.924] name <- restart$name [13:13:18.924] if (is.null(name)) [13:13:18.924] next [13:13:18.924] if (!grepl(pattern, name)) [13:13:18.924] next [13:13:18.924] invokeRestart(restart) [13:13:18.924] muffled <- TRUE [13:13:18.924] break [13:13:18.924] } [13:13:18.924] } [13:13:18.924] } [13:13:18.924] invisible(muffled) [13:13:18.924] } [13:13:18.924] muffleCondition(cond, pattern = "^muffle") [13:13:18.924] } [13:13:18.924] } [13:13:18.924] } [13:13:18.924] })) [13:13:18.924] }, error = function(ex) { [13:13:18.924] base::structure(base::list(value = NULL, visible = NULL, [13:13:18.924] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:18.924] ...future.rng), started = ...future.startTime, [13:13:18.924] finished = Sys.time(), session_uuid = NA_character_, [13:13:18.924] version = "1.8"), class = "FutureResult") [13:13:18.924] }, finally = { [13:13:18.924] if (!identical(...future.workdir, getwd())) [13:13:18.924] setwd(...future.workdir) [13:13:18.924] { [13:13:18.924] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:18.924] ...future.oldOptions$nwarnings <- NULL [13:13:18.924] } [13:13:18.924] base::options(...future.oldOptions) [13:13:18.924] if (.Platform$OS.type == "windows") { [13:13:18.924] old_names <- names(...future.oldEnvVars) [13:13:18.924] envs <- base::Sys.getenv() [13:13:18.924] names <- names(envs) [13:13:18.924] common <- intersect(names, old_names) [13:13:18.924] added <- setdiff(names, old_names) [13:13:18.924] removed <- setdiff(old_names, names) [13:13:18.924] changed <- common[...future.oldEnvVars[common] != [13:13:18.924] envs[common]] [13:13:18.924] NAMES <- toupper(changed) [13:13:18.924] args <- list() [13:13:18.924] for (kk in seq_along(NAMES)) { [13:13:18.924] name <- changed[[kk]] [13:13:18.924] NAME <- NAMES[[kk]] [13:13:18.924] if (name != NAME && is.element(NAME, old_names)) [13:13:18.924] next [13:13:18.924] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:18.924] } [13:13:18.924] NAMES <- toupper(added) [13:13:18.924] for (kk in seq_along(NAMES)) { [13:13:18.924] name <- added[[kk]] [13:13:18.924] NAME <- NAMES[[kk]] [13:13:18.924] if (name != NAME && is.element(NAME, old_names)) [13:13:18.924] next [13:13:18.924] args[[name]] <- "" [13:13:18.924] } [13:13:18.924] NAMES <- toupper(removed) [13:13:18.924] for (kk in seq_along(NAMES)) { [13:13:18.924] name <- removed[[kk]] [13:13:18.924] NAME <- NAMES[[kk]] [13:13:18.924] if (name != NAME && is.element(NAME, old_names)) [13:13:18.924] next [13:13:18.924] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:18.924] } [13:13:18.924] if (length(args) > 0) [13:13:18.924] base::do.call(base::Sys.setenv, args = args) [13:13:18.924] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:18.924] } [13:13:18.924] else { [13:13:18.924] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:18.924] } [13:13:18.924] { [13:13:18.924] if (base::length(...future.futureOptionsAdded) > [13:13:18.924] 0L) { [13:13:18.924] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:18.924] base::names(opts) <- ...future.futureOptionsAdded [13:13:18.924] base::options(opts) [13:13:18.924] } [13:13:18.924] { [13:13:18.924] { [13:13:18.924] base::options(mc.cores = ...future.mc.cores.old) [13:13:18.924] NULL [13:13:18.924] } [13:13:18.924] options(future.plan = NULL) [13:13:18.924] if (is.na(NA_character_)) [13:13:18.924] Sys.unsetenv("R_FUTURE_PLAN") [13:13:18.924] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:18.924] future::plan(list(function (..., workers = availableCores(), [13:13:18.924] lazy = FALSE, rscript_libs = .libPaths(), [13:13:18.924] envir = parent.frame()) [13:13:18.924] { [13:13:18.924] if (is.function(workers)) [13:13:18.924] workers <- workers() [13:13:18.924] workers <- structure(as.integer(workers), [13:13:18.924] class = class(workers)) [13:13:18.924] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:18.924] workers >= 1) [13:13:18.924] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:18.924] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:18.924] } [13:13:18.924] future <- MultisessionFuture(..., workers = workers, [13:13:18.924] lazy = lazy, rscript_libs = rscript_libs, [13:13:18.924] envir = envir) [13:13:18.924] if (!future$lazy) [13:13:18.924] future <- run(future) [13:13:18.924] invisible(future) [13:13:18.924] }), .cleanup = FALSE, .init = FALSE) [13:13:18.924] } [13:13:18.924] } [13:13:18.924] } [13:13:18.924] }) [13:13:18.924] if (TRUE) { [13:13:18.924] base::sink(type = "output", split = FALSE) [13:13:18.924] if (TRUE) { [13:13:18.924] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:18.924] } [13:13:18.924] else { [13:13:18.924] ...future.result["stdout"] <- base::list(NULL) [13:13:18.924] } [13:13:18.924] base::close(...future.stdout) [13:13:18.924] ...future.stdout <- NULL [13:13:18.924] } [13:13:18.924] ...future.result$conditions <- ...future.conditions [13:13:18.924] ...future.result$finished <- base::Sys.time() [13:13:18.924] ...future.result [13:13:18.924] } [13:13:18.930] Exporting 5 global objects (1.21 KiB) to cluster node #1 ... [13:13:18.930] Exporting '...future.FUN' (1.21 KiB) to cluster node #1 ... [13:13:18.931] Exporting '...future.FUN' (1.21 KiB) to cluster node #1 ... DONE [13:13:18.931] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:13:18.932] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:13:18.932] Exporting '...future.elements_ii' (64 bytes) to cluster node #1 ... [13:13:18.932] Exporting '...future.elements_ii' (64 bytes) to cluster node #1 ... DONE [13:13:18.933] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:18.933] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:18.933] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:18.934] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:18.934] Exporting 5 global objects (1.21 KiB) to cluster node #1 ... DONE [13:13:18.935] MultisessionFuture started [13:13:18.935] - Launch lazy future ... done [13:13:18.935] run() for 'MultisessionFuture' ... done [13:13:18.935] Created future: [13:13:18.952] receiveMessageFromWorker() for ClusterFuture ... [13:13:18.952] - Validating connection of MultisessionFuture [13:13:18.953] - received message: FutureResult [13:13:18.953] - Received FutureResult [13:13:18.953] - Erased future from FutureRegistry [13:13:18.953] result() for ClusterFuture ... [13:13:18.953] - result already collected: FutureResult [13:13:18.954] result() for ClusterFuture ... done [13:13:18.954] receiveMessageFromWorker() for ClusterFuture ... done [13:13:18.936] MultisessionFuture: [13:13:18.936] Label: 'future_eapply-1' [13:13:18.936] Expression: [13:13:18.936] { [13:13:18.936] do.call(function(...) { [13:13:18.936] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:18.936] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:18.936] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:18.936] on.exit(options(oopts), add = TRUE) [13:13:18.936] } [13:13:18.936] { [13:13:18.936] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:18.936] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:18.936] ...future.FUN(...future.X_jj, ...) [13:13:18.936] }) [13:13:18.936] } [13:13:18.936] }, args = future.call.arguments) [13:13:18.936] } [13:13:18.936] Lazy evaluation: FALSE [13:13:18.936] Asynchronous evaluation: TRUE [13:13:18.936] Local evaluation: TRUE [13:13:18.936] Environment: R_GlobalEnv [13:13:18.936] Capture standard output: TRUE [13:13:18.936] Capture condition classes: 'condition' (excluding 'nothing') [13:13:18.936] Globals: 5 objects totaling 1.27 KiB (function '...future.FUN' of 1.21 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 64 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:13:18.936] Packages: [13:13:18.936] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:18.936] Resolved: TRUE [13:13:18.936] Value: [13:13:18.936] Conditions captured: [13:13:18.936] Early signaling: FALSE [13:13:18.936] Owner process: 9511365f-3977-b8d2-248f-88bd32fc0252 [13:13:18.936] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:18.954] Chunk #1 of 2 ... DONE [13:13:18.954] Chunk #2 of 2 ... [13:13:18.955] - Finding globals in 'X' for chunk #2 ... [13:13:18.955] getGlobalsAndPackages() ... [13:13:18.955] Searching for globals... [13:13:18.955] [13:13:18.956] Searching for globals ... DONE [13:13:18.956] - globals: [0] [13:13:18.956] getGlobalsAndPackages() ... DONE [13:13:18.956] + additional globals found: [n=0] [13:13:18.956] + additional namespaces needed: [n=0] [13:13:18.956] - Finding globals in 'X' for chunk #2 ... DONE [13:13:18.957] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:18.957] - seeds: [13:13:18.957] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:18.957] getGlobalsAndPackages() ... [13:13:18.957] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:18.958] Resolving globals: FALSE [13:13:18.958] Tweak future expression to call with '...' arguments ... [13:13:18.958] { [13:13:18.958] do.call(function(...) { [13:13:18.958] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:18.958] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:18.958] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:18.958] on.exit(options(oopts), add = TRUE) [13:13:18.958] } [13:13:18.958] { [13:13:18.958] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:18.958] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:18.958] ...future.FUN(...future.X_jj, ...) [13:13:18.958] }) [13:13:18.958] } [13:13:18.958] }, args = future.call.arguments) [13:13:18.958] } [13:13:18.958] Tweak future expression to call with '...' arguments ... DONE [13:13:18.959] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:18.959] [13:13:18.959] getGlobalsAndPackages() ... DONE [13:13:18.960] run() for 'Future' ... [13:13:18.960] - state: 'created' [13:13:18.960] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:18.975] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:18.975] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:18.975] - Field: 'node' [13:13:18.975] - Field: 'label' [13:13:18.976] - Field: 'local' [13:13:18.976] - Field: 'owner' [13:13:18.976] - Field: 'envir' [13:13:18.976] - Field: 'workers' [13:13:18.976] - Field: 'packages' [13:13:18.977] - Field: 'gc' [13:13:18.977] - Field: 'conditions' [13:13:18.977] - Field: 'persistent' [13:13:18.977] - Field: 'expr' [13:13:18.977] - Field: 'uuid' [13:13:18.978] - Field: 'seed' [13:13:18.978] - Field: 'version' [13:13:18.978] - Field: 'result' [13:13:18.978] - Field: 'asynchronous' [13:13:18.978] - Field: 'calls' [13:13:18.979] - Field: 'globals' [13:13:18.979] - Field: 'stdout' [13:13:18.979] - Field: 'earlySignal' [13:13:18.979] - Field: 'lazy' [13:13:18.979] - Field: 'state' [13:13:18.980] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:18.980] - Launch lazy future ... [13:13:18.980] Packages needed by the future expression (n = 0): [13:13:18.980] Packages needed by future strategies (n = 0): [13:13:18.981] { [13:13:18.981] { [13:13:18.981] { [13:13:18.981] ...future.startTime <- base::Sys.time() [13:13:18.981] { [13:13:18.981] { [13:13:18.981] { [13:13:18.981] { [13:13:18.981] base::local({ [13:13:18.981] has_future <- base::requireNamespace("future", [13:13:18.981] quietly = TRUE) [13:13:18.981] if (has_future) { [13:13:18.981] ns <- base::getNamespace("future") [13:13:18.981] version <- ns[[".package"]][["version"]] [13:13:18.981] if (is.null(version)) [13:13:18.981] version <- utils::packageVersion("future") [13:13:18.981] } [13:13:18.981] else { [13:13:18.981] version <- NULL [13:13:18.981] } [13:13:18.981] if (!has_future || version < "1.8.0") { [13:13:18.981] info <- base::c(r_version = base::gsub("R version ", [13:13:18.981] "", base::R.version$version.string), [13:13:18.981] platform = base::sprintf("%s (%s-bit)", [13:13:18.981] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [13:13:18.981] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:18.981] "release", "version")], collapse = " "), [13:13:18.981] hostname = base::Sys.info()[["nodename"]]) [13:13:18.981] info <- base::sprintf("%s: %s", base::names(info), [13:13:18.981] info) [13:13:18.981] info <- base::paste(info, collapse = "; ") [13:13:18.981] if (!has_future) { [13:13:18.981] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:18.981] info) [13:13:18.981] } [13:13:18.981] else { [13:13:18.981] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:18.981] info, version) [13:13:18.981] } [13:13:18.981] base::stop(msg) [13:13:18.981] } [13:13:18.981] }) [13:13:18.981] } [13:13:18.981] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:18.981] base::options(mc.cores = 1L) [13:13:18.981] } [13:13:18.981] options(future.plan = NULL) [13:13:18.981] Sys.unsetenv("R_FUTURE_PLAN") [13:13:18.981] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:18.981] } [13:13:18.981] ...future.workdir <- getwd() [13:13:18.981] } [13:13:18.981] ...future.oldOptions <- base::as.list(base::.Options) [13:13:18.981] ...future.oldEnvVars <- base::Sys.getenv() [13:13:18.981] } [13:13:18.981] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:18.981] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:18.981] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:18.981] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:18.981] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:18.981] future.stdout.windows.reencode = NULL, width = 80L) [13:13:18.981] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:18.981] base::names(...future.oldOptions)) [13:13:18.981] } [13:13:18.981] if (FALSE) { [13:13:18.981] } [13:13:18.981] else { [13:13:18.981] if (TRUE) { [13:13:18.981] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:18.981] open = "w") [13:13:18.981] } [13:13:18.981] else { [13:13:18.981] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:18.981] windows = "NUL", "/dev/null"), open = "w") [13:13:18.981] } [13:13:18.981] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:18.981] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:18.981] base::sink(type = "output", split = FALSE) [13:13:18.981] base::close(...future.stdout) [13:13:18.981] }, add = TRUE) [13:13:18.981] } [13:13:18.981] ...future.frame <- base::sys.nframe() [13:13:18.981] ...future.conditions <- base::list() [13:13:18.981] ...future.rng <- base::globalenv()$.Random.seed [13:13:18.981] if (FALSE) { [13:13:18.981] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:18.981] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:18.981] } [13:13:18.981] ...future.result <- base::tryCatch({ [13:13:18.981] base::withCallingHandlers({ [13:13:18.981] ...future.value <- base::withVisible(base::local({ [13:13:18.981] ...future.makeSendCondition <- local({ [13:13:18.981] sendCondition <- NULL [13:13:18.981] function(frame = 1L) { [13:13:18.981] if (is.function(sendCondition)) [13:13:18.981] return(sendCondition) [13:13:18.981] ns <- getNamespace("parallel") [13:13:18.981] if (exists("sendData", mode = "function", [13:13:18.981] envir = ns)) { [13:13:18.981] parallel_sendData <- get("sendData", mode = "function", [13:13:18.981] envir = ns) [13:13:18.981] envir <- sys.frame(frame) [13:13:18.981] master <- NULL [13:13:18.981] while (!identical(envir, .GlobalEnv) && [13:13:18.981] !identical(envir, emptyenv())) { [13:13:18.981] if (exists("master", mode = "list", envir = envir, [13:13:18.981] inherits = FALSE)) { [13:13:18.981] master <- get("master", mode = "list", [13:13:18.981] envir = envir, inherits = FALSE) [13:13:18.981] if (inherits(master, c("SOCKnode", [13:13:18.981] "SOCK0node"))) { [13:13:18.981] sendCondition <<- function(cond) { [13:13:18.981] data <- list(type = "VALUE", value = cond, [13:13:18.981] success = TRUE) [13:13:18.981] parallel_sendData(master, data) [13:13:18.981] } [13:13:18.981] return(sendCondition) [13:13:18.981] } [13:13:18.981] } [13:13:18.981] frame <- frame + 1L [13:13:18.981] envir <- sys.frame(frame) [13:13:18.981] } [13:13:18.981] } [13:13:18.981] sendCondition <<- function(cond) NULL [13:13:18.981] } [13:13:18.981] }) [13:13:18.981] withCallingHandlers({ [13:13:18.981] { [13:13:18.981] do.call(function(...) { [13:13:18.981] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:18.981] if (!identical(...future.globals.maxSize.org, [13:13:18.981] ...future.globals.maxSize)) { [13:13:18.981] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:18.981] on.exit(options(oopts), add = TRUE) [13:13:18.981] } [13:13:18.981] { [13:13:18.981] lapply(seq_along(...future.elements_ii), [13:13:18.981] FUN = function(jj) { [13:13:18.981] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:18.981] ...future.FUN(...future.X_jj, ...) [13:13:18.981] }) [13:13:18.981] } [13:13:18.981] }, args = future.call.arguments) [13:13:18.981] } [13:13:18.981] }, immediateCondition = function(cond) { [13:13:18.981] sendCondition <- ...future.makeSendCondition() [13:13:18.981] sendCondition(cond) [13:13:18.981] muffleCondition <- function (cond, pattern = "^muffle") [13:13:18.981] { [13:13:18.981] inherits <- base::inherits [13:13:18.981] invokeRestart <- base::invokeRestart [13:13:18.981] is.null <- base::is.null [13:13:18.981] muffled <- FALSE [13:13:18.981] if (inherits(cond, "message")) { [13:13:18.981] muffled <- grepl(pattern, "muffleMessage") [13:13:18.981] if (muffled) [13:13:18.981] invokeRestart("muffleMessage") [13:13:18.981] } [13:13:18.981] else if (inherits(cond, "warning")) { [13:13:18.981] muffled <- grepl(pattern, "muffleWarning") [13:13:18.981] if (muffled) [13:13:18.981] invokeRestart("muffleWarning") [13:13:18.981] } [13:13:18.981] else if (inherits(cond, "condition")) { [13:13:18.981] if (!is.null(pattern)) { [13:13:18.981] computeRestarts <- base::computeRestarts [13:13:18.981] grepl <- base::grepl [13:13:18.981] restarts <- computeRestarts(cond) [13:13:18.981] for (restart in restarts) { [13:13:18.981] name <- restart$name [13:13:18.981] if (is.null(name)) [13:13:18.981] next [13:13:18.981] if (!grepl(pattern, name)) [13:13:18.981] next [13:13:18.981] invokeRestart(restart) [13:13:18.981] muffled <- TRUE [13:13:18.981] break [13:13:18.981] } [13:13:18.981] } [13:13:18.981] } [13:13:18.981] invisible(muffled) [13:13:18.981] } [13:13:18.981] muffleCondition(cond) [13:13:18.981] }) [13:13:18.981] })) [13:13:18.981] future::FutureResult(value = ...future.value$value, [13:13:18.981] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:18.981] ...future.rng), globalenv = if (FALSE) [13:13:18.981] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:18.981] ...future.globalenv.names)) [13:13:18.981] else NULL, started = ...future.startTime, version = "1.8") [13:13:18.981] }, condition = base::local({ [13:13:18.981] c <- base::c [13:13:18.981] inherits <- base::inherits [13:13:18.981] invokeRestart <- base::invokeRestart [13:13:18.981] length <- base::length [13:13:18.981] list <- base::list [13:13:18.981] seq.int <- base::seq.int [13:13:18.981] signalCondition <- base::signalCondition [13:13:18.981] sys.calls <- base::sys.calls [13:13:18.981] `[[` <- base::`[[` [13:13:18.981] `+` <- base::`+` [13:13:18.981] `<<-` <- base::`<<-` [13:13:18.981] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:18.981] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:18.981] 3L)] [13:13:18.981] } [13:13:18.981] function(cond) { [13:13:18.981] is_error <- inherits(cond, "error") [13:13:18.981] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:18.981] NULL) [13:13:18.981] if (is_error) { [13:13:18.981] sessionInformation <- function() { [13:13:18.981] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:18.981] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:18.981] search = base::search(), system = base::Sys.info()) [13:13:18.981] } [13:13:18.981] ...future.conditions[[length(...future.conditions) + [13:13:18.981] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:18.981] cond$call), session = sessionInformation(), [13:13:18.981] timestamp = base::Sys.time(), signaled = 0L) [13:13:18.981] signalCondition(cond) [13:13:18.981] } [13:13:18.981] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:18.981] "immediateCondition"))) { [13:13:18.981] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:18.981] ...future.conditions[[length(...future.conditions) + [13:13:18.981] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:18.981] if (TRUE && !signal) { [13:13:18.981] muffleCondition <- function (cond, pattern = "^muffle") [13:13:18.981] { [13:13:18.981] inherits <- base::inherits [13:13:18.981] invokeRestart <- base::invokeRestart [13:13:18.981] is.null <- base::is.null [13:13:18.981] muffled <- FALSE [13:13:18.981] if (inherits(cond, "message")) { [13:13:18.981] muffled <- grepl(pattern, "muffleMessage") [13:13:18.981] if (muffled) [13:13:18.981] invokeRestart("muffleMessage") [13:13:18.981] } [13:13:18.981] else if (inherits(cond, "warning")) { [13:13:18.981] muffled <- grepl(pattern, "muffleWarning") [13:13:18.981] if (muffled) [13:13:18.981] invokeRestart("muffleWarning") [13:13:18.981] } [13:13:18.981] else if (inherits(cond, "condition")) { [13:13:18.981] if (!is.null(pattern)) { [13:13:18.981] computeRestarts <- base::computeRestarts [13:13:18.981] grepl <- base::grepl [13:13:18.981] restarts <- computeRestarts(cond) [13:13:18.981] for (restart in restarts) { [13:13:18.981] name <- restart$name [13:13:18.981] if (is.null(name)) [13:13:18.981] next [13:13:18.981] if (!grepl(pattern, name)) [13:13:18.981] next [13:13:18.981] invokeRestart(restart) [13:13:18.981] muffled <- TRUE [13:13:18.981] break [13:13:18.981] } [13:13:18.981] } [13:13:18.981] } [13:13:18.981] invisible(muffled) [13:13:18.981] } [13:13:18.981] muffleCondition(cond, pattern = "^muffle") [13:13:18.981] } [13:13:18.981] } [13:13:18.981] else { [13:13:18.981] if (TRUE) { [13:13:18.981] muffleCondition <- function (cond, pattern = "^muffle") [13:13:18.981] { [13:13:18.981] inherits <- base::inherits [13:13:18.981] invokeRestart <- base::invokeRestart [13:13:18.981] is.null <- base::is.null [13:13:18.981] muffled <- FALSE [13:13:18.981] if (inherits(cond, "message")) { [13:13:18.981] muffled <- grepl(pattern, "muffleMessage") [13:13:18.981] if (muffled) [13:13:18.981] invokeRestart("muffleMessage") [13:13:18.981] } [13:13:18.981] else if (inherits(cond, "warning")) { [13:13:18.981] muffled <- grepl(pattern, "muffleWarning") [13:13:18.981] if (muffled) [13:13:18.981] invokeRestart("muffleWarning") [13:13:18.981] } [13:13:18.981] else if (inherits(cond, "condition")) { [13:13:18.981] if (!is.null(pattern)) { [13:13:18.981] computeRestarts <- base::computeRestarts [13:13:18.981] grepl <- base::grepl [13:13:18.981] restarts <- computeRestarts(cond) [13:13:18.981] for (restart in restarts) { [13:13:18.981] name <- restart$name [13:13:18.981] if (is.null(name)) [13:13:18.981] next [13:13:18.981] if (!grepl(pattern, name)) [13:13:18.981] next [13:13:18.981] invokeRestart(restart) [13:13:18.981] muffled <- TRUE [13:13:18.981] break [13:13:18.981] } [13:13:18.981] } [13:13:18.981] } [13:13:18.981] invisible(muffled) [13:13:18.981] } [13:13:18.981] muffleCondition(cond, pattern = "^muffle") [13:13:18.981] } [13:13:18.981] } [13:13:18.981] } [13:13:18.981] })) [13:13:18.981] }, error = function(ex) { [13:13:18.981] base::structure(base::list(value = NULL, visible = NULL, [13:13:18.981] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:18.981] ...future.rng), started = ...future.startTime, [13:13:18.981] finished = Sys.time(), session_uuid = NA_character_, [13:13:18.981] version = "1.8"), class = "FutureResult") [13:13:18.981] }, finally = { [13:13:18.981] if (!identical(...future.workdir, getwd())) [13:13:18.981] setwd(...future.workdir) [13:13:18.981] { [13:13:18.981] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:18.981] ...future.oldOptions$nwarnings <- NULL [13:13:18.981] } [13:13:18.981] base::options(...future.oldOptions) [13:13:18.981] if (.Platform$OS.type == "windows") { [13:13:18.981] old_names <- names(...future.oldEnvVars) [13:13:18.981] envs <- base::Sys.getenv() [13:13:18.981] names <- names(envs) [13:13:18.981] common <- intersect(names, old_names) [13:13:18.981] added <- setdiff(names, old_names) [13:13:18.981] removed <- setdiff(old_names, names) [13:13:18.981] changed <- common[...future.oldEnvVars[common] != [13:13:18.981] envs[common]] [13:13:18.981] NAMES <- toupper(changed) [13:13:18.981] args <- list() [13:13:18.981] for (kk in seq_along(NAMES)) { [13:13:18.981] name <- changed[[kk]] [13:13:18.981] NAME <- NAMES[[kk]] [13:13:18.981] if (name != NAME && is.element(NAME, old_names)) [13:13:18.981] next [13:13:18.981] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:18.981] } [13:13:18.981] NAMES <- toupper(added) [13:13:18.981] for (kk in seq_along(NAMES)) { [13:13:18.981] name <- added[[kk]] [13:13:18.981] NAME <- NAMES[[kk]] [13:13:18.981] if (name != NAME && is.element(NAME, old_names)) [13:13:18.981] next [13:13:18.981] args[[name]] <- "" [13:13:18.981] } [13:13:18.981] NAMES <- toupper(removed) [13:13:18.981] for (kk in seq_along(NAMES)) { [13:13:18.981] name <- removed[[kk]] [13:13:18.981] NAME <- NAMES[[kk]] [13:13:18.981] if (name != NAME && is.element(NAME, old_names)) [13:13:18.981] next [13:13:18.981] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:18.981] } [13:13:18.981] if (length(args) > 0) [13:13:18.981] base::do.call(base::Sys.setenv, args = args) [13:13:18.981] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:18.981] } [13:13:18.981] else { [13:13:18.981] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:18.981] } [13:13:18.981] { [13:13:18.981] if (base::length(...future.futureOptionsAdded) > [13:13:18.981] 0L) { [13:13:18.981] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:18.981] base::names(opts) <- ...future.futureOptionsAdded [13:13:18.981] base::options(opts) [13:13:18.981] } [13:13:18.981] { [13:13:18.981] { [13:13:18.981] base::options(mc.cores = ...future.mc.cores.old) [13:13:18.981] NULL [13:13:18.981] } [13:13:18.981] options(future.plan = NULL) [13:13:18.981] if (is.na(NA_character_)) [13:13:18.981] Sys.unsetenv("R_FUTURE_PLAN") [13:13:18.981] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:18.981] future::plan(list(function (..., workers = availableCores(), [13:13:18.981] lazy = FALSE, rscript_libs = .libPaths(), [13:13:18.981] envir = parent.frame()) [13:13:18.981] { [13:13:18.981] if (is.function(workers)) [13:13:18.981] workers <- workers() [13:13:18.981] workers <- structure(as.integer(workers), [13:13:18.981] class = class(workers)) [13:13:18.981] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:18.981] workers >= 1) [13:13:18.981] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:18.981] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:18.981] } [13:13:18.981] future <- MultisessionFuture(..., workers = workers, [13:13:18.981] lazy = lazy, rscript_libs = rscript_libs, [13:13:18.981] envir = envir) [13:13:18.981] if (!future$lazy) [13:13:18.981] future <- run(future) [13:13:18.981] invisible(future) [13:13:18.981] }), .cleanup = FALSE, .init = FALSE) [13:13:18.981] } [13:13:18.981] } [13:13:18.981] } [13:13:18.981] }) [13:13:18.981] if (TRUE) { [13:13:18.981] base::sink(type = "output", split = FALSE) [13:13:18.981] if (TRUE) { [13:13:18.981] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:18.981] } [13:13:18.981] else { [13:13:18.981] ...future.result["stdout"] <- base::list(NULL) [13:13:18.981] } [13:13:18.981] base::close(...future.stdout) [13:13:18.981] ...future.stdout <- NULL [13:13:18.981] } [13:13:18.981] ...future.result$conditions <- ...future.conditions [13:13:18.981] ...future.result$finished <- base::Sys.time() [13:13:18.981] ...future.result [13:13:18.981] } [13:13:18.987] Exporting 5 global objects (1.21 KiB) to cluster node #1 ... [13:13:18.987] Exporting '...future.FUN' (1.21 KiB) to cluster node #1 ... [13:13:18.988] Exporting '...future.FUN' (1.21 KiB) to cluster node #1 ... DONE [13:13:18.988] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:13:18.988] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:13:18.989] Exporting '...future.elements_ii' (208 bytes) to cluster node #1 ... [13:13:18.989] Exporting '...future.elements_ii' (208 bytes) to cluster node #1 ... DONE [13:13:18.989] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:18.990] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:18.990] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:18.990] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:18.991] Exporting 5 global objects (1.21 KiB) to cluster node #1 ... DONE [13:13:18.991] MultisessionFuture started [13:13:18.992] - Launch lazy future ... done [13:13:18.992] run() for 'MultisessionFuture' ... done [13:13:18.992] Created future: [13:13:19.008] receiveMessageFromWorker() for ClusterFuture ... [13:13:19.008] - Validating connection of MultisessionFuture [13:13:19.008] - received message: FutureResult [13:13:19.008] - Received FutureResult [13:13:19.009] - Erased future from FutureRegistry [13:13:19.009] result() for ClusterFuture ... [13:13:19.009] - result already collected: FutureResult [13:13:19.009] result() for ClusterFuture ... done [13:13:19.009] receiveMessageFromWorker() for ClusterFuture ... done [13:13:18.992] MultisessionFuture: [13:13:18.992] Label: 'future_eapply-2' [13:13:18.992] Expression: [13:13:18.992] { [13:13:18.992] do.call(function(...) { [13:13:18.992] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:18.992] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:18.992] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:18.992] on.exit(options(oopts), add = TRUE) [13:13:18.992] } [13:13:18.992] { [13:13:18.992] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:18.992] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:18.992] ...future.FUN(...future.X_jj, ...) [13:13:18.992] }) [13:13:18.992] } [13:13:18.992] }, args = future.call.arguments) [13:13:18.992] } [13:13:18.992] Lazy evaluation: FALSE [13:13:18.992] Asynchronous evaluation: TRUE [13:13:18.992] Local evaluation: TRUE [13:13:18.992] Environment: R_GlobalEnv [13:13:18.992] Capture standard output: TRUE [13:13:18.992] Capture condition classes: 'condition' (excluding 'nothing') [13:13:18.992] Globals: 5 objects totaling 1.41 KiB (function '...future.FUN' of 1.21 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 208 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:13:18.992] Packages: [13:13:18.992] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:18.992] Resolved: TRUE [13:13:18.992] Value: [13:13:18.992] Conditions captured: [13:13:18.992] Early signaling: FALSE [13:13:18.992] Owner process: 9511365f-3977-b8d2-248f-88bd32fc0252 [13:13:18.992] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:19.010] Chunk #2 of 2 ... DONE [13:13:19.010] Launching 2 futures (chunks) ... DONE [13:13:19.010] Resolving 2 futures (chunks) ... [13:13:19.010] resolve() on list ... [13:13:19.010] recursive: 0 [13:13:19.010] length: 2 [13:13:19.011] [13:13:19.011] Future #1 [13:13:19.011] result() for ClusterFuture ... [13:13:19.011] - result already collected: FutureResult [13:13:19.011] result() for ClusterFuture ... done [13:13:19.011] result() for ClusterFuture ... [13:13:19.012] - result already collected: FutureResult [13:13:19.012] result() for ClusterFuture ... done [13:13:19.012] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:13:19.012] - nx: 2 [13:13:19.012] - relay: TRUE [13:13:19.012] - stdout: TRUE [13:13:19.012] - signal: TRUE [13:13:19.013] - resignal: FALSE [13:13:19.013] - force: TRUE [13:13:19.013] - relayed: [n=2] FALSE, FALSE [13:13:19.013] - queued futures: [n=2] FALSE, FALSE [13:13:19.013] - until=1 [13:13:19.013] - relaying element #1 [13:13:19.014] result() for ClusterFuture ... [13:13:19.014] - result already collected: FutureResult [13:13:19.014] result() for ClusterFuture ... done [13:13:19.014] result() for ClusterFuture ... [13:13:19.014] - result already collected: FutureResult [13:13:19.014] result() for ClusterFuture ... done [13:13:19.015] result() for ClusterFuture ... [13:13:19.015] - result already collected: FutureResult [13:13:19.015] result() for ClusterFuture ... done [13:13:19.015] result() for ClusterFuture ... [13:13:19.015] - result already collected: FutureResult [13:13:19.015] result() for ClusterFuture ... done [13:13:19.015] - relayed: [n=2] TRUE, FALSE [13:13:19.016] - queued futures: [n=2] TRUE, FALSE [13:13:19.016] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:13:19.016] length: 1 (resolved future 1) [13:13:19.016] Future #2 [13:13:19.016] result() for ClusterFuture ... [13:13:19.017] - result already collected: FutureResult [13:13:19.017] result() for ClusterFuture ... done [13:13:19.017] result() for ClusterFuture ... [13:13:19.017] - result already collected: FutureResult [13:13:19.017] result() for ClusterFuture ... done [13:13:19.017] signalConditionsASAP(MultisessionFuture, pos=2) ... [13:13:19.017] - nx: 2 [13:13:19.018] - relay: TRUE [13:13:19.018] - stdout: TRUE [13:13:19.018] - signal: TRUE [13:13:19.018] - resignal: FALSE [13:13:19.018] - force: TRUE [13:13:19.018] - relayed: [n=2] TRUE, FALSE [13:13:19.019] - queued futures: [n=2] TRUE, FALSE [13:13:19.019] - until=2 [13:13:19.019] - relaying element #2 [13:13:19.019] result() for ClusterFuture ... [13:13:19.019] - result already collected: FutureResult [13:13:19.019] result() for ClusterFuture ... done [13:13:19.019] result() for ClusterFuture ... [13:13:19.020] - result already collected: FutureResult [13:13:19.020] result() for ClusterFuture ... done [13:13:19.020] result() for ClusterFuture ... [13:13:19.020] - result already collected: FutureResult [13:13:19.020] result() for ClusterFuture ... done [13:13:19.020] result() for ClusterFuture ... [13:13:19.021] - result already collected: FutureResult [13:13:19.021] result() for ClusterFuture ... done [13:13:19.021] - relayed: [n=2] TRUE, TRUE [13:13:19.021] - queued futures: [n=2] TRUE, TRUE [13:13:19.021] signalConditionsASAP(MultisessionFuture, pos=2) ... done [13:13:19.021] length: 0 (resolved future 2) [13:13:19.022] Relaying remaining futures [13:13:19.022] signalConditionsASAP(NULL, pos=0) ... [13:13:19.022] - nx: 2 [13:13:19.022] - relay: TRUE [13:13:19.022] - stdout: TRUE [13:13:19.022] - signal: TRUE [13:13:19.022] - resignal: FALSE [13:13:19.023] - force: TRUE [13:13:19.023] - relayed: [n=2] TRUE, TRUE [13:13:19.023] - queued futures: [n=2] TRUE, TRUE - flush all [13:13:19.023] - relayed: [n=2] TRUE, TRUE [13:13:19.023] - queued futures: [n=2] TRUE, TRUE [13:13:19.023] signalConditionsASAP(NULL, pos=0) ... done [13:13:19.024] resolve() on list ... DONE [13:13:19.024] result() for ClusterFuture ... [13:13:19.024] - result already collected: FutureResult [13:13:19.024] result() for ClusterFuture ... done [13:13:19.024] result() for ClusterFuture ... [13:13:19.024] - result already collected: FutureResult [13:13:19.025] result() for ClusterFuture ... done [13:13:19.025] result() for ClusterFuture ... [13:13:19.025] - result already collected: FutureResult [13:13:19.025] result() for ClusterFuture ... done [13:13:19.025] result() for ClusterFuture ... [13:13:19.025] - result already collected: FutureResult [13:13:19.026] result() for ClusterFuture ... done [13:13:19.026] - Number of value chunks collected: 2 [13:13:19.026] Resolving 2 futures (chunks) ... DONE [13:13:19.026] Reducing values from 2 chunks ... [13:13:19.026] - Number of values collected after concatenation: 3 [13:13:19.026] - Number of values expected: 3 [13:13:19.026] Reducing values from 2 chunks ... DONE [13:13:19.027] future_lapply() ... DONE [13:13:19.027] future_lapply() ... [13:13:19.030] Number of chunks: 2 [13:13:19.030] getGlobalsAndPackagesXApply() ... [13:13:19.031] - future.globals: TRUE [13:13:19.031] getGlobalsAndPackages() ... [13:13:19.031] Searching for globals... [13:13:19.032] - globals found: [2] 'FUN', 'UseMethod' [13:13:19.033] Searching for globals ... DONE [13:13:19.033] Resolving globals: FALSE [13:13:19.033] The total size of the 1 globals is 1.22 KiB (1248 bytes) [13:13:19.034] The total size of the 1 globals exported for future expression ('FUN(probs = c(0.25, 0.5, 0.75))') is 1.22 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (1.22 KiB of class 'function') [13:13:19.034] - globals: [1] 'FUN' [13:13:19.034] - packages: [1] 'stats' [13:13:19.034] getGlobalsAndPackages() ... DONE [13:13:19.034] - globals found/used: [n=1] 'FUN' [13:13:19.035] - needed namespaces: [n=1] 'stats' [13:13:19.035] Finding globals ... DONE [13:13:19.035] - use_args: TRUE [13:13:19.035] - Getting '...' globals ... [13:13:19.035] resolve() on list ... [13:13:19.036] recursive: 0 [13:13:19.036] length: 1 [13:13:19.036] elements: '...' [13:13:19.036] length: 0 (resolved future 1) [13:13:19.036] resolve() on list ... DONE [13:13:19.037] - '...' content: [n=1] 'probs' [13:13:19.037] List of 1 [13:13:19.037] $ ...:List of 1 [13:13:19.037] ..$ probs: num [1:3] 0.25 0.5 0.75 [13:13:19.037] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:19.037] - attr(*, "where")=List of 1 [13:13:19.037] ..$ ...: [13:13:19.037] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:19.037] - attr(*, "resolved")= logi TRUE [13:13:19.037] - attr(*, "total_size")= num NA [13:13:19.040] - Getting '...' globals ... DONE [13:13:19.041] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:19.041] List of 2 [13:13:19.041] $ ...future.FUN:function (x, ...) [13:13:19.041] $ ... :List of 1 [13:13:19.041] ..$ probs: num [1:3] 0.25 0.5 0.75 [13:13:19.041] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:19.041] - attr(*, "where")=List of 2 [13:13:19.041] ..$ ...future.FUN: [13:13:19.041] ..$ ... : [13:13:19.041] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:19.041] - attr(*, "resolved")= logi FALSE [13:13:19.041] - attr(*, "total_size")= num 1328 [13:13:19.045] Packages to be attached in all futures: [n=1] 'stats' [13:13:19.045] getGlobalsAndPackagesXApply() ... DONE [13:13:19.045] Number of futures (= number of chunks): 2 [13:13:19.045] Launching 2 futures (chunks) ... [13:13:19.045] Chunk #1 of 2 ... [13:13:19.046] - Finding globals in 'X' for chunk #1 ... [13:13:19.046] getGlobalsAndPackages() ... [13:13:19.046] Searching for globals... [13:13:19.046] [13:13:19.047] Searching for globals ... DONE [13:13:19.047] - globals: [0] [13:13:19.047] getGlobalsAndPackages() ... DONE [13:13:19.047] + additional globals found: [n=0] [13:13:19.047] + additional namespaces needed: [n=0] [13:13:19.047] - Finding globals in 'X' for chunk #1 ... DONE [13:13:19.047] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:19.048] - seeds: [13:13:19.048] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:19.048] getGlobalsAndPackages() ... [13:13:19.048] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:19.048] Resolving globals: FALSE [13:13:19.049] Tweak future expression to call with '...' arguments ... [13:13:19.049] { [13:13:19.049] do.call(function(...) { [13:13:19.049] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:19.049] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:19.049] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:19.049] on.exit(options(oopts), add = TRUE) [13:13:19.049] } [13:13:19.049] { [13:13:19.049] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:19.049] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:19.049] ...future.FUN(...future.X_jj, ...) [13:13:19.049] }) [13:13:19.049] } [13:13:19.049] }, args = future.call.arguments) [13:13:19.049] } [13:13:19.049] Tweak future expression to call with '...' arguments ... DONE [13:13:19.050] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:19.050] - packages: [1] 'stats' [13:13:19.050] getGlobalsAndPackages() ... DONE [13:13:19.050] run() for 'Future' ... [13:13:19.051] - state: 'created' [13:13:19.051] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:19.065] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:19.065] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:19.065] - Field: 'node' [13:13:19.065] - Field: 'label' [13:13:19.066] - Field: 'local' [13:13:19.066] - Field: 'owner' [13:13:19.066] - Field: 'envir' [13:13:19.066] - Field: 'workers' [13:13:19.066] - Field: 'packages' [13:13:19.067] - Field: 'gc' [13:13:19.067] - Field: 'conditions' [13:13:19.067] - Field: 'persistent' [13:13:19.067] - Field: 'expr' [13:13:19.067] - Field: 'uuid' [13:13:19.067] - Field: 'seed' [13:13:19.068] - Field: 'version' [13:13:19.068] - Field: 'result' [13:13:19.068] - Field: 'asynchronous' [13:13:19.068] - Field: 'calls' [13:13:19.068] - Field: 'globals' [13:13:19.069] - Field: 'stdout' [13:13:19.069] - Field: 'earlySignal' [13:13:19.069] - Field: 'lazy' [13:13:19.069] - Field: 'state' [13:13:19.069] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:19.069] - Launch lazy future ... [13:13:19.070] Packages needed by the future expression (n = 1): 'stats' [13:13:19.070] Packages needed by future strategies (n = 0): [13:13:19.071] { [13:13:19.071] { [13:13:19.071] { [13:13:19.071] ...future.startTime <- base::Sys.time() [13:13:19.071] { [13:13:19.071] { [13:13:19.071] { [13:13:19.071] { [13:13:19.071] { [13:13:19.071] base::local({ [13:13:19.071] has_future <- base::requireNamespace("future", [13:13:19.071] quietly = TRUE) [13:13:19.071] if (has_future) { [13:13:19.071] ns <- base::getNamespace("future") [13:13:19.071] version <- ns[[".package"]][["version"]] [13:13:19.071] if (is.null(version)) [13:13:19.071] version <- utils::packageVersion("future") [13:13:19.071] } [13:13:19.071] else { [13:13:19.071] version <- NULL [13:13:19.071] } [13:13:19.071] if (!has_future || version < "1.8.0") { [13:13:19.071] info <- base::c(r_version = base::gsub("R version ", [13:13:19.071] "", base::R.version$version.string), [13:13:19.071] platform = base::sprintf("%s (%s-bit)", [13:13:19.071] base::R.version$platform, 8 * [13:13:19.071] base::.Machine$sizeof.pointer), [13:13:19.071] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:19.071] "release", "version")], collapse = " "), [13:13:19.071] hostname = base::Sys.info()[["nodename"]]) [13:13:19.071] info <- base::sprintf("%s: %s", base::names(info), [13:13:19.071] info) [13:13:19.071] info <- base::paste(info, collapse = "; ") [13:13:19.071] if (!has_future) { [13:13:19.071] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:19.071] info) [13:13:19.071] } [13:13:19.071] else { [13:13:19.071] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:19.071] info, version) [13:13:19.071] } [13:13:19.071] base::stop(msg) [13:13:19.071] } [13:13:19.071] }) [13:13:19.071] } [13:13:19.071] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:19.071] base::options(mc.cores = 1L) [13:13:19.071] } [13:13:19.071] base::local({ [13:13:19.071] for (pkg in "stats") { [13:13:19.071] base::loadNamespace(pkg) [13:13:19.071] base::library(pkg, character.only = TRUE) [13:13:19.071] } [13:13:19.071] }) [13:13:19.071] } [13:13:19.071] options(future.plan = NULL) [13:13:19.071] Sys.unsetenv("R_FUTURE_PLAN") [13:13:19.071] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:19.071] } [13:13:19.071] ...future.workdir <- getwd() [13:13:19.071] } [13:13:19.071] ...future.oldOptions <- base::as.list(base::.Options) [13:13:19.071] ...future.oldEnvVars <- base::Sys.getenv() [13:13:19.071] } [13:13:19.071] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:19.071] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:19.071] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:19.071] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:19.071] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:19.071] future.stdout.windows.reencode = NULL, width = 80L) [13:13:19.071] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:19.071] base::names(...future.oldOptions)) [13:13:19.071] } [13:13:19.071] if (FALSE) { [13:13:19.071] } [13:13:19.071] else { [13:13:19.071] if (TRUE) { [13:13:19.071] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:19.071] open = "w") [13:13:19.071] } [13:13:19.071] else { [13:13:19.071] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:19.071] windows = "NUL", "/dev/null"), open = "w") [13:13:19.071] } [13:13:19.071] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:19.071] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:19.071] base::sink(type = "output", split = FALSE) [13:13:19.071] base::close(...future.stdout) [13:13:19.071] }, add = TRUE) [13:13:19.071] } [13:13:19.071] ...future.frame <- base::sys.nframe() [13:13:19.071] ...future.conditions <- base::list() [13:13:19.071] ...future.rng <- base::globalenv()$.Random.seed [13:13:19.071] if (FALSE) { [13:13:19.071] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:19.071] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:19.071] } [13:13:19.071] ...future.result <- base::tryCatch({ [13:13:19.071] base::withCallingHandlers({ [13:13:19.071] ...future.value <- base::withVisible(base::local({ [13:13:19.071] ...future.makeSendCondition <- local({ [13:13:19.071] sendCondition <- NULL [13:13:19.071] function(frame = 1L) { [13:13:19.071] if (is.function(sendCondition)) [13:13:19.071] return(sendCondition) [13:13:19.071] ns <- getNamespace("parallel") [13:13:19.071] if (exists("sendData", mode = "function", [13:13:19.071] envir = ns)) { [13:13:19.071] parallel_sendData <- get("sendData", mode = "function", [13:13:19.071] envir = ns) [13:13:19.071] envir <- sys.frame(frame) [13:13:19.071] master <- NULL [13:13:19.071] while (!identical(envir, .GlobalEnv) && [13:13:19.071] !identical(envir, emptyenv())) { [13:13:19.071] if (exists("master", mode = "list", envir = envir, [13:13:19.071] inherits = FALSE)) { [13:13:19.071] master <- get("master", mode = "list", [13:13:19.071] envir = envir, inherits = FALSE) [13:13:19.071] if (inherits(master, c("SOCKnode", [13:13:19.071] "SOCK0node"))) { [13:13:19.071] sendCondition <<- function(cond) { [13:13:19.071] data <- list(type = "VALUE", value = cond, [13:13:19.071] success = TRUE) [13:13:19.071] parallel_sendData(master, data) [13:13:19.071] } [13:13:19.071] return(sendCondition) [13:13:19.071] } [13:13:19.071] } [13:13:19.071] frame <- frame + 1L [13:13:19.071] envir <- sys.frame(frame) [13:13:19.071] } [13:13:19.071] } [13:13:19.071] sendCondition <<- function(cond) NULL [13:13:19.071] } [13:13:19.071] }) [13:13:19.071] withCallingHandlers({ [13:13:19.071] { [13:13:19.071] do.call(function(...) { [13:13:19.071] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:19.071] if (!identical(...future.globals.maxSize.org, [13:13:19.071] ...future.globals.maxSize)) { [13:13:19.071] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:19.071] on.exit(options(oopts), add = TRUE) [13:13:19.071] } [13:13:19.071] { [13:13:19.071] lapply(seq_along(...future.elements_ii), [13:13:19.071] FUN = function(jj) { [13:13:19.071] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:19.071] ...future.FUN(...future.X_jj, ...) [13:13:19.071] }) [13:13:19.071] } [13:13:19.071] }, args = future.call.arguments) [13:13:19.071] } [13:13:19.071] }, immediateCondition = function(cond) { [13:13:19.071] sendCondition <- ...future.makeSendCondition() [13:13:19.071] sendCondition(cond) [13:13:19.071] muffleCondition <- function (cond, pattern = "^muffle") [13:13:19.071] { [13:13:19.071] inherits <- base::inherits [13:13:19.071] invokeRestart <- base::invokeRestart [13:13:19.071] is.null <- base::is.null [13:13:19.071] muffled <- FALSE [13:13:19.071] if (inherits(cond, "message")) { [13:13:19.071] muffled <- grepl(pattern, "muffleMessage") [13:13:19.071] if (muffled) [13:13:19.071] invokeRestart("muffleMessage") [13:13:19.071] } [13:13:19.071] else if (inherits(cond, "warning")) { [13:13:19.071] muffled <- grepl(pattern, "muffleWarning") [13:13:19.071] if (muffled) [13:13:19.071] invokeRestart("muffleWarning") [13:13:19.071] } [13:13:19.071] else if (inherits(cond, "condition")) { [13:13:19.071] if (!is.null(pattern)) { [13:13:19.071] computeRestarts <- base::computeRestarts [13:13:19.071] grepl <- base::grepl [13:13:19.071] restarts <- computeRestarts(cond) [13:13:19.071] for (restart in restarts) { [13:13:19.071] name <- restart$name [13:13:19.071] if (is.null(name)) [13:13:19.071] next [13:13:19.071] if (!grepl(pattern, name)) [13:13:19.071] next [13:13:19.071] invokeRestart(restart) [13:13:19.071] muffled <- TRUE [13:13:19.071] break [13:13:19.071] } [13:13:19.071] } [13:13:19.071] } [13:13:19.071] invisible(muffled) [13:13:19.071] } [13:13:19.071] muffleCondition(cond) [13:13:19.071] }) [13:13:19.071] })) [13:13:19.071] future::FutureResult(value = ...future.value$value, [13:13:19.071] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:19.071] ...future.rng), globalenv = if (FALSE) [13:13:19.071] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:19.071] ...future.globalenv.names)) [13:13:19.071] else NULL, started = ...future.startTime, version = "1.8") [13:13:19.071] }, condition = base::local({ [13:13:19.071] c <- base::c [13:13:19.071] inherits <- base::inherits [13:13:19.071] invokeRestart <- base::invokeRestart [13:13:19.071] length <- base::length [13:13:19.071] list <- base::list [13:13:19.071] seq.int <- base::seq.int [13:13:19.071] signalCondition <- base::signalCondition [13:13:19.071] sys.calls <- base::sys.calls [13:13:19.071] `[[` <- base::`[[` [13:13:19.071] `+` <- base::`+` [13:13:19.071] `<<-` <- base::`<<-` [13:13:19.071] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:19.071] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:19.071] 3L)] [13:13:19.071] } [13:13:19.071] function(cond) { [13:13:19.071] is_error <- inherits(cond, "error") [13:13:19.071] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:19.071] NULL) [13:13:19.071] if (is_error) { [13:13:19.071] sessionInformation <- function() { [13:13:19.071] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:19.071] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:19.071] search = base::search(), system = base::Sys.info()) [13:13:19.071] } [13:13:19.071] ...future.conditions[[length(...future.conditions) + [13:13:19.071] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:19.071] cond$call), session = sessionInformation(), [13:13:19.071] timestamp = base::Sys.time(), signaled = 0L) [13:13:19.071] signalCondition(cond) [13:13:19.071] } [13:13:19.071] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:19.071] "immediateCondition"))) { [13:13:19.071] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:19.071] ...future.conditions[[length(...future.conditions) + [13:13:19.071] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:19.071] if (TRUE && !signal) { [13:13:19.071] muffleCondition <- function (cond, pattern = "^muffle") [13:13:19.071] { [13:13:19.071] inherits <- base::inherits [13:13:19.071] invokeRestart <- base::invokeRestart [13:13:19.071] is.null <- base::is.null [13:13:19.071] muffled <- FALSE [13:13:19.071] if (inherits(cond, "message")) { [13:13:19.071] muffled <- grepl(pattern, "muffleMessage") [13:13:19.071] if (muffled) [13:13:19.071] invokeRestart("muffleMessage") [13:13:19.071] } [13:13:19.071] else if (inherits(cond, "warning")) { [13:13:19.071] muffled <- grepl(pattern, "muffleWarning") [13:13:19.071] if (muffled) [13:13:19.071] invokeRestart("muffleWarning") [13:13:19.071] } [13:13:19.071] else if (inherits(cond, "condition")) { [13:13:19.071] if (!is.null(pattern)) { [13:13:19.071] computeRestarts <- base::computeRestarts [13:13:19.071] grepl <- base::grepl [13:13:19.071] restarts <- computeRestarts(cond) [13:13:19.071] for (restart in restarts) { [13:13:19.071] name <- restart$name [13:13:19.071] if (is.null(name)) [13:13:19.071] next [13:13:19.071] if (!grepl(pattern, name)) [13:13:19.071] next [13:13:19.071] invokeRestart(restart) [13:13:19.071] muffled <- TRUE [13:13:19.071] break [13:13:19.071] } [13:13:19.071] } [13:13:19.071] } [13:13:19.071] invisible(muffled) [13:13:19.071] } [13:13:19.071] muffleCondition(cond, pattern = "^muffle") [13:13:19.071] } [13:13:19.071] } [13:13:19.071] else { [13:13:19.071] if (TRUE) { [13:13:19.071] muffleCondition <- function (cond, pattern = "^muffle") [13:13:19.071] { [13:13:19.071] inherits <- base::inherits [13:13:19.071] invokeRestart <- base::invokeRestart [13:13:19.071] is.null <- base::is.null [13:13:19.071] muffled <- FALSE [13:13:19.071] if (inherits(cond, "message")) { [13:13:19.071] muffled <- grepl(pattern, "muffleMessage") [13:13:19.071] if (muffled) [13:13:19.071] invokeRestart("muffleMessage") [13:13:19.071] } [13:13:19.071] else if (inherits(cond, "warning")) { [13:13:19.071] muffled <- grepl(pattern, "muffleWarning") [13:13:19.071] if (muffled) [13:13:19.071] invokeRestart("muffleWarning") [13:13:19.071] } [13:13:19.071] else if (inherits(cond, "condition")) { [13:13:19.071] if (!is.null(pattern)) { [13:13:19.071] computeRestarts <- base::computeRestarts [13:13:19.071] grepl <- base::grepl [13:13:19.071] restarts <- computeRestarts(cond) [13:13:19.071] for (restart in restarts) { [13:13:19.071] name <- restart$name [13:13:19.071] if (is.null(name)) [13:13:19.071] next [13:13:19.071] if (!grepl(pattern, name)) [13:13:19.071] next [13:13:19.071] invokeRestart(restart) [13:13:19.071] muffled <- TRUE [13:13:19.071] break [13:13:19.071] } [13:13:19.071] } [13:13:19.071] } [13:13:19.071] invisible(muffled) [13:13:19.071] } [13:13:19.071] muffleCondition(cond, pattern = "^muffle") [13:13:19.071] } [13:13:19.071] } [13:13:19.071] } [13:13:19.071] })) [13:13:19.071] }, error = function(ex) { [13:13:19.071] base::structure(base::list(value = NULL, visible = NULL, [13:13:19.071] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:19.071] ...future.rng), started = ...future.startTime, [13:13:19.071] finished = Sys.time(), session_uuid = NA_character_, [13:13:19.071] version = "1.8"), class = "FutureResult") [13:13:19.071] }, finally = { [13:13:19.071] if (!identical(...future.workdir, getwd())) [13:13:19.071] setwd(...future.workdir) [13:13:19.071] { [13:13:19.071] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:19.071] ...future.oldOptions$nwarnings <- NULL [13:13:19.071] } [13:13:19.071] base::options(...future.oldOptions) [13:13:19.071] if (.Platform$OS.type == "windows") { [13:13:19.071] old_names <- names(...future.oldEnvVars) [13:13:19.071] envs <- base::Sys.getenv() [13:13:19.071] names <- names(envs) [13:13:19.071] common <- intersect(names, old_names) [13:13:19.071] added <- setdiff(names, old_names) [13:13:19.071] removed <- setdiff(old_names, names) [13:13:19.071] changed <- common[...future.oldEnvVars[common] != [13:13:19.071] envs[common]] [13:13:19.071] NAMES <- toupper(changed) [13:13:19.071] args <- list() [13:13:19.071] for (kk in seq_along(NAMES)) { [13:13:19.071] name <- changed[[kk]] [13:13:19.071] NAME <- NAMES[[kk]] [13:13:19.071] if (name != NAME && is.element(NAME, old_names)) [13:13:19.071] next [13:13:19.071] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:19.071] } [13:13:19.071] NAMES <- toupper(added) [13:13:19.071] for (kk in seq_along(NAMES)) { [13:13:19.071] name <- added[[kk]] [13:13:19.071] NAME <- NAMES[[kk]] [13:13:19.071] if (name != NAME && is.element(NAME, old_names)) [13:13:19.071] next [13:13:19.071] args[[name]] <- "" [13:13:19.071] } [13:13:19.071] NAMES <- toupper(removed) [13:13:19.071] for (kk in seq_along(NAMES)) { [13:13:19.071] name <- removed[[kk]] [13:13:19.071] NAME <- NAMES[[kk]] [13:13:19.071] if (name != NAME && is.element(NAME, old_names)) [13:13:19.071] next [13:13:19.071] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:19.071] } [13:13:19.071] if (length(args) > 0) [13:13:19.071] base::do.call(base::Sys.setenv, args = args) [13:13:19.071] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:19.071] } [13:13:19.071] else { [13:13:19.071] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:19.071] } [13:13:19.071] { [13:13:19.071] if (base::length(...future.futureOptionsAdded) > [13:13:19.071] 0L) { [13:13:19.071] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:19.071] base::names(opts) <- ...future.futureOptionsAdded [13:13:19.071] base::options(opts) [13:13:19.071] } [13:13:19.071] { [13:13:19.071] { [13:13:19.071] base::options(mc.cores = ...future.mc.cores.old) [13:13:19.071] NULL [13:13:19.071] } [13:13:19.071] options(future.plan = NULL) [13:13:19.071] if (is.na(NA_character_)) [13:13:19.071] Sys.unsetenv("R_FUTURE_PLAN") [13:13:19.071] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:19.071] future::plan(list(function (..., workers = availableCores(), [13:13:19.071] lazy = FALSE, rscript_libs = .libPaths(), [13:13:19.071] envir = parent.frame()) [13:13:19.071] { [13:13:19.071] if (is.function(workers)) [13:13:19.071] workers <- workers() [13:13:19.071] workers <- structure(as.integer(workers), [13:13:19.071] class = class(workers)) [13:13:19.071] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:19.071] workers >= 1) [13:13:19.071] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:19.071] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:19.071] } [13:13:19.071] future <- MultisessionFuture(..., workers = workers, [13:13:19.071] lazy = lazy, rscript_libs = rscript_libs, [13:13:19.071] envir = envir) [13:13:19.071] if (!future$lazy) [13:13:19.071] future <- run(future) [13:13:19.071] invisible(future) [13:13:19.071] }), .cleanup = FALSE, .init = FALSE) [13:13:19.071] } [13:13:19.071] } [13:13:19.071] } [13:13:19.071] }) [13:13:19.071] if (TRUE) { [13:13:19.071] base::sink(type = "output", split = FALSE) [13:13:19.071] if (TRUE) { [13:13:19.071] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:19.071] } [13:13:19.071] else { [13:13:19.071] ...future.result["stdout"] <- base::list(NULL) [13:13:19.071] } [13:13:19.071] base::close(...future.stdout) [13:13:19.071] ...future.stdout <- NULL [13:13:19.071] } [13:13:19.071] ...future.result$conditions <- ...future.conditions [13:13:19.071] ...future.result$finished <- base::Sys.time() [13:13:19.071] ...future.result [13:13:19.071] } [13:13:19.076] Exporting 5 global objects (1.30 KiB) to cluster node #1 ... [13:13:19.076] Exporting '...future.FUN' (1.22 KiB) to cluster node #1 ... [13:13:19.077] Exporting '...future.FUN' (1.22 KiB) to cluster node #1 ... DONE [13:13:19.077] Exporting 'future.call.arguments' (80 bytes) to cluster node #1 ... [13:13:19.078] Exporting 'future.call.arguments' (80 bytes) to cluster node #1 ... DONE [13:13:19.078] Exporting '...future.elements_ii' (64 bytes) to cluster node #1 ... [13:13:19.078] Exporting '...future.elements_ii' (64 bytes) to cluster node #1 ... DONE [13:13:19.079] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:19.079] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:19.079] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:19.080] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:19.080] Exporting 5 global objects (1.30 KiB) to cluster node #1 ... DONE [13:13:19.081] MultisessionFuture started [13:13:19.081] - Launch lazy future ... done [13:13:19.081] run() for 'MultisessionFuture' ... done [13:13:19.081] Created future: [13:13:19.098] receiveMessageFromWorker() for ClusterFuture ... [13:13:19.098] - Validating connection of MultisessionFuture [13:13:19.098] - received message: FutureResult [13:13:19.098] - Received FutureResult [13:13:19.099] - Erased future from FutureRegistry [13:13:19.099] result() for ClusterFuture ... [13:13:19.099] - result already collected: FutureResult [13:13:19.099] result() for ClusterFuture ... done [13:13:19.099] receiveMessageFromWorker() for ClusterFuture ... done [13:13:19.081] MultisessionFuture: [13:13:19.081] Label: 'future_eapply-1' [13:13:19.081] Expression: [13:13:19.081] { [13:13:19.081] do.call(function(...) { [13:13:19.081] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:19.081] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:19.081] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:19.081] on.exit(options(oopts), add = TRUE) [13:13:19.081] } [13:13:19.081] { [13:13:19.081] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:19.081] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:19.081] ...future.FUN(...future.X_jj, ...) [13:13:19.081] }) [13:13:19.081] } [13:13:19.081] }, args = future.call.arguments) [13:13:19.081] } [13:13:19.081] Lazy evaluation: FALSE [13:13:19.081] Asynchronous evaluation: TRUE [13:13:19.081] Local evaluation: TRUE [13:13:19.081] Environment: R_GlobalEnv [13:13:19.081] Capture standard output: TRUE [13:13:19.081] Capture condition classes: 'condition' (excluding 'nothing') [13:13:19.081] Globals: 5 objects totaling 1.36 KiB (function '...future.FUN' of 1.22 KiB, DotDotDotList 'future.call.arguments' of 80 bytes, list '...future.elements_ii' of 64 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:13:19.081] Packages: 1 packages ('stats') [13:13:19.081] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:19.081] Resolved: TRUE [13:13:19.081] Value: [13:13:19.081] Conditions captured: [13:13:19.081] Early signaling: FALSE [13:13:19.081] Owner process: 9511365f-3977-b8d2-248f-88bd32fc0252 [13:13:19.081] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:19.100] Chunk #1 of 2 ... DONE [13:13:19.100] Chunk #2 of 2 ... [13:13:19.100] - Finding globals in 'X' for chunk #2 ... [13:13:19.100] getGlobalsAndPackages() ... [13:13:19.100] Searching for globals... [13:13:19.101] [13:13:19.101] Searching for globals ... DONE [13:13:19.101] - globals: [0] [13:13:19.101] getGlobalsAndPackages() ... DONE [13:13:19.101] + additional globals found: [n=0] [13:13:19.101] + additional namespaces needed: [n=0] [13:13:19.102] - Finding globals in 'X' for chunk #2 ... DONE [13:13:19.102] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:19.102] - seeds: [13:13:19.102] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:19.102] getGlobalsAndPackages() ... [13:13:19.102] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:19.103] Resolving globals: FALSE [13:13:19.103] Tweak future expression to call with '...' arguments ... [13:13:19.103] { [13:13:19.103] do.call(function(...) { [13:13:19.103] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:19.103] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:19.103] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:19.103] on.exit(options(oopts), add = TRUE) [13:13:19.103] } [13:13:19.103] { [13:13:19.103] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:19.103] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:19.103] ...future.FUN(...future.X_jj, ...) [13:13:19.103] }) [13:13:19.103] } [13:13:19.103] }, args = future.call.arguments) [13:13:19.103] } [13:13:19.103] Tweak future expression to call with '...' arguments ... DONE [13:13:19.104] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:19.104] - packages: [1] 'stats' [13:13:19.104] getGlobalsAndPackages() ... DONE [13:13:19.105] run() for 'Future' ... [13:13:19.105] - state: 'created' [13:13:19.105] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:19.119] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:19.119] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:19.119] - Field: 'node' [13:13:19.120] - Field: 'label' [13:13:19.120] - Field: 'local' [13:13:19.120] - Field: 'owner' [13:13:19.120] - Field: 'envir' [13:13:19.120] - Field: 'workers' [13:13:19.120] - Field: 'packages' [13:13:19.121] - Field: 'gc' [13:13:19.121] - Field: 'conditions' [13:13:19.121] - Field: 'persistent' [13:13:19.121] - Field: 'expr' [13:13:19.121] - Field: 'uuid' [13:13:19.122] - Field: 'seed' [13:13:19.122] - Field: 'version' [13:13:19.122] - Field: 'result' [13:13:19.122] - Field: 'asynchronous' [13:13:19.122] - Field: 'calls' [13:13:19.122] - Field: 'globals' [13:13:19.123] - Field: 'stdout' [13:13:19.123] - Field: 'earlySignal' [13:13:19.123] - Field: 'lazy' [13:13:19.123] - Field: 'state' [13:13:19.123] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:19.123] - Launch lazy future ... [13:13:19.124] Packages needed by the future expression (n = 1): 'stats' [13:13:19.124] Packages needed by future strategies (n = 0): [13:13:19.125] { [13:13:19.125] { [13:13:19.125] { [13:13:19.125] ...future.startTime <- base::Sys.time() [13:13:19.125] { [13:13:19.125] { [13:13:19.125] { [13:13:19.125] { [13:13:19.125] { [13:13:19.125] base::local({ [13:13:19.125] has_future <- base::requireNamespace("future", [13:13:19.125] quietly = TRUE) [13:13:19.125] if (has_future) { [13:13:19.125] ns <- base::getNamespace("future") [13:13:19.125] version <- ns[[".package"]][["version"]] [13:13:19.125] if (is.null(version)) [13:13:19.125] version <- utils::packageVersion("future") [13:13:19.125] } [13:13:19.125] else { [13:13:19.125] version <- NULL [13:13:19.125] } [13:13:19.125] if (!has_future || version < "1.8.0") { [13:13:19.125] info <- base::c(r_version = base::gsub("R version ", [13:13:19.125] "", base::R.version$version.string), [13:13:19.125] platform = base::sprintf("%s (%s-bit)", [13:13:19.125] base::R.version$platform, 8 * [13:13:19.125] base::.Machine$sizeof.pointer), [13:13:19.125] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:19.125] "release", "version")], collapse = " "), [13:13:19.125] hostname = base::Sys.info()[["nodename"]]) [13:13:19.125] info <- base::sprintf("%s: %s", base::names(info), [13:13:19.125] info) [13:13:19.125] info <- base::paste(info, collapse = "; ") [13:13:19.125] if (!has_future) { [13:13:19.125] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:19.125] info) [13:13:19.125] } [13:13:19.125] else { [13:13:19.125] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:19.125] info, version) [13:13:19.125] } [13:13:19.125] base::stop(msg) [13:13:19.125] } [13:13:19.125] }) [13:13:19.125] } [13:13:19.125] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:19.125] base::options(mc.cores = 1L) [13:13:19.125] } [13:13:19.125] base::local({ [13:13:19.125] for (pkg in "stats") { [13:13:19.125] base::loadNamespace(pkg) [13:13:19.125] base::library(pkg, character.only = TRUE) [13:13:19.125] } [13:13:19.125] }) [13:13:19.125] } [13:13:19.125] options(future.plan = NULL) [13:13:19.125] Sys.unsetenv("R_FUTURE_PLAN") [13:13:19.125] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:19.125] } [13:13:19.125] ...future.workdir <- getwd() [13:13:19.125] } [13:13:19.125] ...future.oldOptions <- base::as.list(base::.Options) [13:13:19.125] ...future.oldEnvVars <- base::Sys.getenv() [13:13:19.125] } [13:13:19.125] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:19.125] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:19.125] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:19.125] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:19.125] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:19.125] future.stdout.windows.reencode = NULL, width = 80L) [13:13:19.125] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:19.125] base::names(...future.oldOptions)) [13:13:19.125] } [13:13:19.125] if (FALSE) { [13:13:19.125] } [13:13:19.125] else { [13:13:19.125] if (TRUE) { [13:13:19.125] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:19.125] open = "w") [13:13:19.125] } [13:13:19.125] else { [13:13:19.125] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:19.125] windows = "NUL", "/dev/null"), open = "w") [13:13:19.125] } [13:13:19.125] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:19.125] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:19.125] base::sink(type = "output", split = FALSE) [13:13:19.125] base::close(...future.stdout) [13:13:19.125] }, add = TRUE) [13:13:19.125] } [13:13:19.125] ...future.frame <- base::sys.nframe() [13:13:19.125] ...future.conditions <- base::list() [13:13:19.125] ...future.rng <- base::globalenv()$.Random.seed [13:13:19.125] if (FALSE) { [13:13:19.125] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:19.125] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:19.125] } [13:13:19.125] ...future.result <- base::tryCatch({ [13:13:19.125] base::withCallingHandlers({ [13:13:19.125] ...future.value <- base::withVisible(base::local({ [13:13:19.125] ...future.makeSendCondition <- local({ [13:13:19.125] sendCondition <- NULL [13:13:19.125] function(frame = 1L) { [13:13:19.125] if (is.function(sendCondition)) [13:13:19.125] return(sendCondition) [13:13:19.125] ns <- getNamespace("parallel") [13:13:19.125] if (exists("sendData", mode = "function", [13:13:19.125] envir = ns)) { [13:13:19.125] parallel_sendData <- get("sendData", mode = "function", [13:13:19.125] envir = ns) [13:13:19.125] envir <- sys.frame(frame) [13:13:19.125] master <- NULL [13:13:19.125] while (!identical(envir, .GlobalEnv) && [13:13:19.125] !identical(envir, emptyenv())) { [13:13:19.125] if (exists("master", mode = "list", envir = envir, [13:13:19.125] inherits = FALSE)) { [13:13:19.125] master <- get("master", mode = "list", [13:13:19.125] envir = envir, inherits = FALSE) [13:13:19.125] if (inherits(master, c("SOCKnode", [13:13:19.125] "SOCK0node"))) { [13:13:19.125] sendCondition <<- function(cond) { [13:13:19.125] data <- list(type = "VALUE", value = cond, [13:13:19.125] success = TRUE) [13:13:19.125] parallel_sendData(master, data) [13:13:19.125] } [13:13:19.125] return(sendCondition) [13:13:19.125] } [13:13:19.125] } [13:13:19.125] frame <- frame + 1L [13:13:19.125] envir <- sys.frame(frame) [13:13:19.125] } [13:13:19.125] } [13:13:19.125] sendCondition <<- function(cond) NULL [13:13:19.125] } [13:13:19.125] }) [13:13:19.125] withCallingHandlers({ [13:13:19.125] { [13:13:19.125] do.call(function(...) { [13:13:19.125] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:19.125] if (!identical(...future.globals.maxSize.org, [13:13:19.125] ...future.globals.maxSize)) { [13:13:19.125] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:19.125] on.exit(options(oopts), add = TRUE) [13:13:19.125] } [13:13:19.125] { [13:13:19.125] lapply(seq_along(...future.elements_ii), [13:13:19.125] FUN = function(jj) { [13:13:19.125] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:19.125] ...future.FUN(...future.X_jj, ...) [13:13:19.125] }) [13:13:19.125] } [13:13:19.125] }, args = future.call.arguments) [13:13:19.125] } [13:13:19.125] }, immediateCondition = function(cond) { [13:13:19.125] sendCondition <- ...future.makeSendCondition() [13:13:19.125] sendCondition(cond) [13:13:19.125] muffleCondition <- function (cond, pattern = "^muffle") [13:13:19.125] { [13:13:19.125] inherits <- base::inherits [13:13:19.125] invokeRestart <- base::invokeRestart [13:13:19.125] is.null <- base::is.null [13:13:19.125] muffled <- FALSE [13:13:19.125] if (inherits(cond, "message")) { [13:13:19.125] muffled <- grepl(pattern, "muffleMessage") [13:13:19.125] if (muffled) [13:13:19.125] invokeRestart("muffleMessage") [13:13:19.125] } [13:13:19.125] else if (inherits(cond, "warning")) { [13:13:19.125] muffled <- grepl(pattern, "muffleWarning") [13:13:19.125] if (muffled) [13:13:19.125] invokeRestart("muffleWarning") [13:13:19.125] } [13:13:19.125] else if (inherits(cond, "condition")) { [13:13:19.125] if (!is.null(pattern)) { [13:13:19.125] computeRestarts <- base::computeRestarts [13:13:19.125] grepl <- base::grepl [13:13:19.125] restarts <- computeRestarts(cond) [13:13:19.125] for (restart in restarts) { [13:13:19.125] name <- restart$name [13:13:19.125] if (is.null(name)) [13:13:19.125] next [13:13:19.125] if (!grepl(pattern, name)) [13:13:19.125] next [13:13:19.125] invokeRestart(restart) [13:13:19.125] muffled <- TRUE [13:13:19.125] break [13:13:19.125] } [13:13:19.125] } [13:13:19.125] } [13:13:19.125] invisible(muffled) [13:13:19.125] } [13:13:19.125] muffleCondition(cond) [13:13:19.125] }) [13:13:19.125] })) [13:13:19.125] future::FutureResult(value = ...future.value$value, [13:13:19.125] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:19.125] ...future.rng), globalenv = if (FALSE) [13:13:19.125] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:19.125] ...future.globalenv.names)) [13:13:19.125] else NULL, started = ...future.startTime, version = "1.8") [13:13:19.125] }, condition = base::local({ [13:13:19.125] c <- base::c [13:13:19.125] inherits <- base::inherits [13:13:19.125] invokeRestart <- base::invokeRestart [13:13:19.125] length <- base::length [13:13:19.125] list <- base::list [13:13:19.125] seq.int <- base::seq.int [13:13:19.125] signalCondition <- base::signalCondition [13:13:19.125] sys.calls <- base::sys.calls [13:13:19.125] `[[` <- base::`[[` [13:13:19.125] `+` <- base::`+` [13:13:19.125] `<<-` <- base::`<<-` [13:13:19.125] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:19.125] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:19.125] 3L)] [13:13:19.125] } [13:13:19.125] function(cond) { [13:13:19.125] is_error <- inherits(cond, "error") [13:13:19.125] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:19.125] NULL) [13:13:19.125] if (is_error) { [13:13:19.125] sessionInformation <- function() { [13:13:19.125] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:19.125] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:19.125] search = base::search(), system = base::Sys.info()) [13:13:19.125] } [13:13:19.125] ...future.conditions[[length(...future.conditions) + [13:13:19.125] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:19.125] cond$call), session = sessionInformation(), [13:13:19.125] timestamp = base::Sys.time(), signaled = 0L) [13:13:19.125] signalCondition(cond) [13:13:19.125] } [13:13:19.125] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:19.125] "immediateCondition"))) { [13:13:19.125] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:19.125] ...future.conditions[[length(...future.conditions) + [13:13:19.125] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:19.125] if (TRUE && !signal) { [13:13:19.125] muffleCondition <- function (cond, pattern = "^muffle") [13:13:19.125] { [13:13:19.125] inherits <- base::inherits [13:13:19.125] invokeRestart <- base::invokeRestart [13:13:19.125] is.null <- base::is.null [13:13:19.125] muffled <- FALSE [13:13:19.125] if (inherits(cond, "message")) { [13:13:19.125] muffled <- grepl(pattern, "muffleMessage") [13:13:19.125] if (muffled) [13:13:19.125] invokeRestart("muffleMessage") [13:13:19.125] } [13:13:19.125] else if (inherits(cond, "warning")) { [13:13:19.125] muffled <- grepl(pattern, "muffleWarning") [13:13:19.125] if (muffled) [13:13:19.125] invokeRestart("muffleWarning") [13:13:19.125] } [13:13:19.125] else if (inherits(cond, "condition")) { [13:13:19.125] if (!is.null(pattern)) { [13:13:19.125] computeRestarts <- base::computeRestarts [13:13:19.125] grepl <- base::grepl [13:13:19.125] restarts <- computeRestarts(cond) [13:13:19.125] for (restart in restarts) { [13:13:19.125] name <- restart$name [13:13:19.125] if (is.null(name)) [13:13:19.125] next [13:13:19.125] if (!grepl(pattern, name)) [13:13:19.125] next [13:13:19.125] invokeRestart(restart) [13:13:19.125] muffled <- TRUE [13:13:19.125] break [13:13:19.125] } [13:13:19.125] } [13:13:19.125] } [13:13:19.125] invisible(muffled) [13:13:19.125] } [13:13:19.125] muffleCondition(cond, pattern = "^muffle") [13:13:19.125] } [13:13:19.125] } [13:13:19.125] else { [13:13:19.125] if (TRUE) { [13:13:19.125] muffleCondition <- function (cond, pattern = "^muffle") [13:13:19.125] { [13:13:19.125] inherits <- base::inherits [13:13:19.125] invokeRestart <- base::invokeRestart [13:13:19.125] is.null <- base::is.null [13:13:19.125] muffled <- FALSE [13:13:19.125] if (inherits(cond, "message")) { [13:13:19.125] muffled <- grepl(pattern, "muffleMessage") [13:13:19.125] if (muffled) [13:13:19.125] invokeRestart("muffleMessage") [13:13:19.125] } [13:13:19.125] else if (inherits(cond, "warning")) { [13:13:19.125] muffled <- grepl(pattern, "muffleWarning") [13:13:19.125] if (muffled) [13:13:19.125] invokeRestart("muffleWarning") [13:13:19.125] } [13:13:19.125] else if (inherits(cond, "condition")) { [13:13:19.125] if (!is.null(pattern)) { [13:13:19.125] computeRestarts <- base::computeRestarts [13:13:19.125] grepl <- base::grepl [13:13:19.125] restarts <- computeRestarts(cond) [13:13:19.125] for (restart in restarts) { [13:13:19.125] name <- restart$name [13:13:19.125] if (is.null(name)) [13:13:19.125] next [13:13:19.125] if (!grepl(pattern, name)) [13:13:19.125] next [13:13:19.125] invokeRestart(restart) [13:13:19.125] muffled <- TRUE [13:13:19.125] break [13:13:19.125] } [13:13:19.125] } [13:13:19.125] } [13:13:19.125] invisible(muffled) [13:13:19.125] } [13:13:19.125] muffleCondition(cond, pattern = "^muffle") [13:13:19.125] } [13:13:19.125] } [13:13:19.125] } [13:13:19.125] })) [13:13:19.125] }, error = function(ex) { [13:13:19.125] base::structure(base::list(value = NULL, visible = NULL, [13:13:19.125] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:19.125] ...future.rng), started = ...future.startTime, [13:13:19.125] finished = Sys.time(), session_uuid = NA_character_, [13:13:19.125] version = "1.8"), class = "FutureResult") [13:13:19.125] }, finally = { [13:13:19.125] if (!identical(...future.workdir, getwd())) [13:13:19.125] setwd(...future.workdir) [13:13:19.125] { [13:13:19.125] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:19.125] ...future.oldOptions$nwarnings <- NULL [13:13:19.125] } [13:13:19.125] base::options(...future.oldOptions) [13:13:19.125] if (.Platform$OS.type == "windows") { [13:13:19.125] old_names <- names(...future.oldEnvVars) [13:13:19.125] envs <- base::Sys.getenv() [13:13:19.125] names <- names(envs) [13:13:19.125] common <- intersect(names, old_names) [13:13:19.125] added <- setdiff(names, old_names) [13:13:19.125] removed <- setdiff(old_names, names) [13:13:19.125] changed <- common[...future.oldEnvVars[common] != [13:13:19.125] envs[common]] [13:13:19.125] NAMES <- toupper(changed) [13:13:19.125] args <- list() [13:13:19.125] for (kk in seq_along(NAMES)) { [13:13:19.125] name <- changed[[kk]] [13:13:19.125] NAME <- NAMES[[kk]] [13:13:19.125] if (name != NAME && is.element(NAME, old_names)) [13:13:19.125] next [13:13:19.125] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:19.125] } [13:13:19.125] NAMES <- toupper(added) [13:13:19.125] for (kk in seq_along(NAMES)) { [13:13:19.125] name <- added[[kk]] [13:13:19.125] NAME <- NAMES[[kk]] [13:13:19.125] if (name != NAME && is.element(NAME, old_names)) [13:13:19.125] next [13:13:19.125] args[[name]] <- "" [13:13:19.125] } [13:13:19.125] NAMES <- toupper(removed) [13:13:19.125] for (kk in seq_along(NAMES)) { [13:13:19.125] name <- removed[[kk]] [13:13:19.125] NAME <- NAMES[[kk]] [13:13:19.125] if (name != NAME && is.element(NAME, old_names)) [13:13:19.125] next [13:13:19.125] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:19.125] } [13:13:19.125] if (length(args) > 0) [13:13:19.125] base::do.call(base::Sys.setenv, args = args) [13:13:19.125] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:19.125] } [13:13:19.125] else { [13:13:19.125] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:19.125] } [13:13:19.125] { [13:13:19.125] if (base::length(...future.futureOptionsAdded) > [13:13:19.125] 0L) { [13:13:19.125] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:19.125] base::names(opts) <- ...future.futureOptionsAdded [13:13:19.125] base::options(opts) [13:13:19.125] } [13:13:19.125] { [13:13:19.125] { [13:13:19.125] base::options(mc.cores = ...future.mc.cores.old) [13:13:19.125] NULL [13:13:19.125] } [13:13:19.125] options(future.plan = NULL) [13:13:19.125] if (is.na(NA_character_)) [13:13:19.125] Sys.unsetenv("R_FUTURE_PLAN") [13:13:19.125] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:19.125] future::plan(list(function (..., workers = availableCores(), [13:13:19.125] lazy = FALSE, rscript_libs = .libPaths(), [13:13:19.125] envir = parent.frame()) [13:13:19.125] { [13:13:19.125] if (is.function(workers)) [13:13:19.125] workers <- workers() [13:13:19.125] workers <- structure(as.integer(workers), [13:13:19.125] class = class(workers)) [13:13:19.125] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:19.125] workers >= 1) [13:13:19.125] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:19.125] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:19.125] } [13:13:19.125] future <- MultisessionFuture(..., workers = workers, [13:13:19.125] lazy = lazy, rscript_libs = rscript_libs, [13:13:19.125] envir = envir) [13:13:19.125] if (!future$lazy) [13:13:19.125] future <- run(future) [13:13:19.125] invisible(future) [13:13:19.125] }), .cleanup = FALSE, .init = FALSE) [13:13:19.125] } [13:13:19.125] } [13:13:19.125] } [13:13:19.125] }) [13:13:19.125] if (TRUE) { [13:13:19.125] base::sink(type = "output", split = FALSE) [13:13:19.125] if (TRUE) { [13:13:19.125] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:19.125] } [13:13:19.125] else { [13:13:19.125] ...future.result["stdout"] <- base::list(NULL) [13:13:19.125] } [13:13:19.125] base::close(...future.stdout) [13:13:19.125] ...future.stdout <- NULL [13:13:19.125] } [13:13:19.125] ...future.result$conditions <- ...future.conditions [13:13:19.125] ...future.result$finished <- base::Sys.time() [13:13:19.125] ...future.result [13:13:19.125] } [13:13:19.130] Exporting 5 global objects (1.30 KiB) to cluster node #1 ... [13:13:19.130] Exporting '...future.FUN' (1.22 KiB) to cluster node #1 ... [13:13:19.131] Exporting '...future.FUN' (1.22 KiB) to cluster node #1 ... DONE [13:13:19.131] Exporting 'future.call.arguments' (80 bytes) to cluster node #1 ... [13:13:19.132] Exporting 'future.call.arguments' (80 bytes) to cluster node #1 ... DONE [13:13:19.132] Exporting '...future.elements_ii' (208 bytes) to cluster node #1 ... [13:13:19.132] Exporting '...future.elements_ii' (208 bytes) to cluster node #1 ... DONE [13:13:19.132] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:19.133] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:19.133] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:19.133] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:19.134] Exporting 5 global objects (1.30 KiB) to cluster node #1 ... DONE [13:13:19.134] MultisessionFuture started [13:13:19.134] - Launch lazy future ... done [13:13:19.135] run() for 'MultisessionFuture' ... done [13:13:19.135] Created future: [13:13:19.151] receiveMessageFromWorker() for ClusterFuture ... [13:13:19.151] - Validating connection of MultisessionFuture [13:13:19.152] - received message: FutureResult [13:13:19.152] - Received FutureResult [13:13:19.152] - Erased future from FutureRegistry [13:13:19.152] result() for ClusterFuture ... [13:13:19.152] - result already collected: FutureResult [13:13:19.153] result() for ClusterFuture ... done [13:13:19.153] receiveMessageFromWorker() for ClusterFuture ... done [13:13:19.135] MultisessionFuture: [13:13:19.135] Label: 'future_eapply-2' [13:13:19.135] Expression: [13:13:19.135] { [13:13:19.135] do.call(function(...) { [13:13:19.135] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:19.135] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:19.135] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:19.135] on.exit(options(oopts), add = TRUE) [13:13:19.135] } [13:13:19.135] { [13:13:19.135] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:19.135] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:19.135] ...future.FUN(...future.X_jj, ...) [13:13:19.135] }) [13:13:19.135] } [13:13:19.135] }, args = future.call.arguments) [13:13:19.135] } [13:13:19.135] Lazy evaluation: FALSE [13:13:19.135] Asynchronous evaluation: TRUE [13:13:19.135] Local evaluation: TRUE [13:13:19.135] Environment: R_GlobalEnv [13:13:19.135] Capture standard output: TRUE [13:13:19.135] Capture condition classes: 'condition' (excluding 'nothing') [13:13:19.135] Globals: 5 objects totaling 1.50 KiB (function '...future.FUN' of 1.22 KiB, DotDotDotList 'future.call.arguments' of 80 bytes, list '...future.elements_ii' of 208 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:13:19.135] Packages: 1 packages ('stats') [13:13:19.135] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:19.135] Resolved: TRUE [13:13:19.135] Value: [13:13:19.135] Conditions captured: [13:13:19.135] Early signaling: FALSE [13:13:19.135] Owner process: 9511365f-3977-b8d2-248f-88bd32fc0252 [13:13:19.135] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:19.153] Chunk #2 of 2 ... DONE [13:13:19.153] Launching 2 futures (chunks) ... DONE [13:13:19.154] Resolving 2 futures (chunks) ... [13:13:19.154] resolve() on list ... [13:13:19.154] recursive: 0 [13:13:19.154] length: 2 [13:13:19.154] [13:13:19.154] Future #1 [13:13:19.154] result() for ClusterFuture ... [13:13:19.155] - result already collected: FutureResult [13:13:19.155] result() for ClusterFuture ... done [13:13:19.155] result() for ClusterFuture ... [13:13:19.155] - result already collected: FutureResult [13:13:19.155] result() for ClusterFuture ... done [13:13:19.155] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:13:19.156] - nx: 2 [13:13:19.156] - relay: TRUE [13:13:19.156] - stdout: TRUE [13:13:19.156] - signal: TRUE [13:13:19.156] - resignal: FALSE [13:13:19.156] - force: TRUE [13:13:19.157] - relayed: [n=2] FALSE, FALSE [13:13:19.157] - queued futures: [n=2] FALSE, FALSE [13:13:19.157] - until=1 [13:13:19.157] - relaying element #1 [13:13:19.157] result() for ClusterFuture ... [13:13:19.157] - result already collected: FutureResult [13:13:19.157] result() for ClusterFuture ... done [13:13:19.158] result() for ClusterFuture ... [13:13:19.158] - result already collected: FutureResult [13:13:19.158] result() for ClusterFuture ... done [13:13:19.158] result() for ClusterFuture ... [13:13:19.158] - result already collected: FutureResult [13:13:19.158] result() for ClusterFuture ... done [13:13:19.159] result() for ClusterFuture ... [13:13:19.159] - result already collected: FutureResult [13:13:19.159] result() for ClusterFuture ... done [13:13:19.159] - relayed: [n=2] TRUE, FALSE [13:13:19.159] - queued futures: [n=2] TRUE, FALSE [13:13:19.159] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:13:19.160] length: 1 (resolved future 1) [13:13:19.160] Future #2 [13:13:19.160] result() for ClusterFuture ... [13:13:19.160] - result already collected: FutureResult [13:13:19.160] result() for ClusterFuture ... done [13:13:19.160] result() for ClusterFuture ... [13:13:19.161] - result already collected: FutureResult [13:13:19.161] result() for ClusterFuture ... done [13:13:19.161] signalConditionsASAP(MultisessionFuture, pos=2) ... [13:13:19.161] - nx: 2 [13:13:19.161] - relay: TRUE [13:13:19.161] - stdout: TRUE [13:13:19.162] - signal: TRUE [13:13:19.162] - resignal: FALSE [13:13:19.162] - force: TRUE [13:13:19.162] - relayed: [n=2] TRUE, FALSE [13:13:19.162] - queued futures: [n=2] TRUE, FALSE [13:13:19.162] - until=2 [13:13:19.162] - relaying element #2 [13:13:19.163] result() for ClusterFuture ... [13:13:19.163] - result already collected: FutureResult [13:13:19.163] result() for ClusterFuture ... done [13:13:19.163] result() for ClusterFuture ... [13:13:19.163] - result already collected: FutureResult [13:13:19.163] result() for ClusterFuture ... done [13:13:19.164] result() for ClusterFuture ... [13:13:19.164] - result already collected: FutureResult [13:13:19.164] result() for ClusterFuture ... done [13:13:19.164] result() for ClusterFuture ... [13:13:19.164] - result already collected: FutureResult [13:13:19.164] result() for ClusterFuture ... done [13:13:19.165] - relayed: [n=2] TRUE, TRUE [13:13:19.165] - queued futures: [n=2] TRUE, TRUE [13:13:19.165] signalConditionsASAP(MultisessionFuture, pos=2) ... done [13:13:19.165] length: 0 (resolved future 2) [13:13:19.165] Relaying remaining futures [13:13:19.165] signalConditionsASAP(NULL, pos=0) ... [13:13:19.165] - nx: 2 [13:13:19.166] - relay: TRUE [13:13:19.166] - stdout: TRUE [13:13:19.166] - signal: TRUE [13:13:19.166] - resignal: FALSE [13:13:19.166] - force: TRUE [13:13:19.166] - relayed: [n=2] TRUE, TRUE [13:13:19.167] - queued futures: [n=2] TRUE, TRUE - flush all [13:13:19.167] - relayed: [n=2] TRUE, TRUE [13:13:19.167] - queued futures: [n=2] TRUE, TRUE [13:13:19.167] signalConditionsASAP(NULL, pos=0) ... done [13:13:19.167] resolve() on list ... DONE [13:13:19.167] result() for ClusterFuture ... [13:13:19.168] - result already collected: FutureResult [13:13:19.168] result() for ClusterFuture ... done [13:13:19.168] result() for ClusterFuture ... [13:13:19.168] - result already collected: FutureResult [13:13:19.168] result() for ClusterFuture ... done [13:13:19.168] result() for ClusterFuture ... [13:13:19.169] - result already collected: FutureResult [13:13:19.169] result() for ClusterFuture ... done [13:13:19.169] result() for ClusterFuture ... [13:13:19.169] - result already collected: FutureResult [13:13:19.169] result() for ClusterFuture ... done [13:13:19.169] - Number of value chunks collected: 2 [13:13:19.170] Resolving 2 futures (chunks) ... DONE [13:13:19.170] Reducing values from 2 chunks ... [13:13:19.170] - Number of values collected after concatenation: 3 [13:13:19.170] - Number of values expected: 3 [13:13:19.170] Reducing values from 2 chunks ... DONE [13:13:19.170] future_lapply() ... DONE [13:13:19.171] future_lapply() ... [13:13:19.174] Number of chunks: 2 [13:13:19.174] getGlobalsAndPackagesXApply() ... [13:13:19.174] - future.globals: TRUE [13:13:19.175] getGlobalsAndPackages() ... [13:13:19.175] Searching for globals... [13:13:19.176] - globals found: [2] 'FUN', 'UseMethod' [13:13:19.176] Searching for globals ... DONE [13:13:19.176] Resolving globals: FALSE [13:13:19.177] The total size of the 1 globals is 1.22 KiB (1248 bytes) [13:13:19.177] The total size of the 1 globals exported for future expression ('FUN()') is 1.22 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (1.22 KiB of class 'function') [13:13:19.178] - globals: [1] 'FUN' [13:13:19.178] - packages: [1] 'stats' [13:13:19.178] getGlobalsAndPackages() ... DONE [13:13:19.178] - globals found/used: [n=1] 'FUN' [13:13:19.178] - needed namespaces: [n=1] 'stats' [13:13:19.178] Finding globals ... DONE [13:13:19.179] - use_args: TRUE [13:13:19.179] - Getting '...' globals ... [13:13:19.179] resolve() on list ... [13:13:19.179] recursive: 0 [13:13:19.179] length: 1 [13:13:19.180] elements: '...' [13:13:19.180] length: 0 (resolved future 1) [13:13:19.180] resolve() on list ... DONE [13:13:19.180] - '...' content: [n=0] [13:13:19.180] List of 1 [13:13:19.180] $ ...: list() [13:13:19.180] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:19.180] - attr(*, "where")=List of 1 [13:13:19.180] ..$ ...: [13:13:19.180] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:19.180] - attr(*, "resolved")= logi TRUE [13:13:19.180] - attr(*, "total_size")= num NA [13:13:19.185] - Getting '...' globals ... DONE [13:13:19.185] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:19.186] List of 2 [13:13:19.186] $ ...future.FUN:function (x, ...) [13:13:19.186] $ ... : list() [13:13:19.186] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:19.186] - attr(*, "where")=List of 2 [13:13:19.186] ..$ ...future.FUN: [13:13:19.186] ..$ ... : [13:13:19.186] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:19.186] - attr(*, "resolved")= logi FALSE [13:13:19.186] - attr(*, "total_size")= num 1248 [13:13:19.189] Packages to be attached in all futures: [n=1] 'stats' [13:13:19.189] getGlobalsAndPackagesXApply() ... DONE [13:13:19.189] Number of futures (= number of chunks): 2 [13:13:19.189] Launching 2 futures (chunks) ... [13:13:19.190] Chunk #1 of 2 ... [13:13:19.190] - Finding globals in 'X' for chunk #1 ... [13:13:19.190] getGlobalsAndPackages() ... [13:13:19.190] Searching for globals... [13:13:19.190] [13:13:19.191] Searching for globals ... DONE [13:13:19.191] - globals: [0] [13:13:19.191] getGlobalsAndPackages() ... DONE [13:13:19.191] + additional globals found: [n=0] [13:13:19.191] + additional namespaces needed: [n=0] [13:13:19.191] - Finding globals in 'X' for chunk #1 ... DONE [13:13:19.192] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:19.192] - seeds: [13:13:19.192] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:19.192] getGlobalsAndPackages() ... [13:13:19.192] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:19.192] Resolving globals: FALSE [13:13:19.193] Tweak future expression to call with '...' arguments ... [13:13:19.193] { [13:13:19.193] do.call(function(...) { [13:13:19.193] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:19.193] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:19.193] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:19.193] on.exit(options(oopts), add = TRUE) [13:13:19.193] } [13:13:19.193] { [13:13:19.193] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:19.193] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:19.193] ...future.FUN(...future.X_jj, ...) [13:13:19.193] }) [13:13:19.193] } [13:13:19.193] }, args = future.call.arguments) [13:13:19.193] } [13:13:19.193] Tweak future expression to call with '...' arguments ... DONE [13:13:19.194] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:19.194] - packages: [1] 'stats' [13:13:19.194] getGlobalsAndPackages() ... DONE [13:13:19.194] run() for 'Future' ... [13:13:19.195] - state: 'created' [13:13:19.195] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:19.209] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:19.209] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:19.209] - Field: 'node' [13:13:19.209] - Field: 'label' [13:13:19.210] - Field: 'local' [13:13:19.210] - Field: 'owner' [13:13:19.210] - Field: 'envir' [13:13:19.210] - Field: 'workers' [13:13:19.210] - Field: 'packages' [13:13:19.210] - Field: 'gc' [13:13:19.211] - Field: 'conditions' [13:13:19.211] - Field: 'persistent' [13:13:19.211] - Field: 'expr' [13:13:19.211] - Field: 'uuid' [13:13:19.211] - Field: 'seed' [13:13:19.212] - Field: 'version' [13:13:19.212] - Field: 'result' [13:13:19.212] - Field: 'asynchronous' [13:13:19.212] - Field: 'calls' [13:13:19.212] - Field: 'globals' [13:13:19.212] - Field: 'stdout' [13:13:19.213] - Field: 'earlySignal' [13:13:19.213] - Field: 'lazy' [13:13:19.213] - Field: 'state' [13:13:19.213] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:19.213] - Launch lazy future ... [13:13:19.214] Packages needed by the future expression (n = 1): 'stats' [13:13:19.214] Packages needed by future strategies (n = 0): [13:13:19.214] { [13:13:19.214] { [13:13:19.214] { [13:13:19.214] ...future.startTime <- base::Sys.time() [13:13:19.214] { [13:13:19.214] { [13:13:19.214] { [13:13:19.214] { [13:13:19.214] { [13:13:19.214] base::local({ [13:13:19.214] has_future <- base::requireNamespace("future", [13:13:19.214] quietly = TRUE) [13:13:19.214] if (has_future) { [13:13:19.214] ns <- base::getNamespace("future") [13:13:19.214] version <- ns[[".package"]][["version"]] [13:13:19.214] if (is.null(version)) [13:13:19.214] version <- utils::packageVersion("future") [13:13:19.214] } [13:13:19.214] else { [13:13:19.214] version <- NULL [13:13:19.214] } [13:13:19.214] if (!has_future || version < "1.8.0") { [13:13:19.214] info <- base::c(r_version = base::gsub("R version ", [13:13:19.214] "", base::R.version$version.string), [13:13:19.214] platform = base::sprintf("%s (%s-bit)", [13:13:19.214] base::R.version$platform, 8 * [13:13:19.214] base::.Machine$sizeof.pointer), [13:13:19.214] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:19.214] "release", "version")], collapse = " "), [13:13:19.214] hostname = base::Sys.info()[["nodename"]]) [13:13:19.214] info <- base::sprintf("%s: %s", base::names(info), [13:13:19.214] info) [13:13:19.214] info <- base::paste(info, collapse = "; ") [13:13:19.214] if (!has_future) { [13:13:19.214] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:19.214] info) [13:13:19.214] } [13:13:19.214] else { [13:13:19.214] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:19.214] info, version) [13:13:19.214] } [13:13:19.214] base::stop(msg) [13:13:19.214] } [13:13:19.214] }) [13:13:19.214] } [13:13:19.214] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:19.214] base::options(mc.cores = 1L) [13:13:19.214] } [13:13:19.214] base::local({ [13:13:19.214] for (pkg in "stats") { [13:13:19.214] base::loadNamespace(pkg) [13:13:19.214] base::library(pkg, character.only = TRUE) [13:13:19.214] } [13:13:19.214] }) [13:13:19.214] } [13:13:19.214] options(future.plan = NULL) [13:13:19.214] Sys.unsetenv("R_FUTURE_PLAN") [13:13:19.214] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:19.214] } [13:13:19.214] ...future.workdir <- getwd() [13:13:19.214] } [13:13:19.214] ...future.oldOptions <- base::as.list(base::.Options) [13:13:19.214] ...future.oldEnvVars <- base::Sys.getenv() [13:13:19.214] } [13:13:19.214] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:19.214] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:19.214] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:19.214] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:19.214] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:19.214] future.stdout.windows.reencode = NULL, width = 80L) [13:13:19.214] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:19.214] base::names(...future.oldOptions)) [13:13:19.214] } [13:13:19.214] if (FALSE) { [13:13:19.214] } [13:13:19.214] else { [13:13:19.214] if (TRUE) { [13:13:19.214] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:19.214] open = "w") [13:13:19.214] } [13:13:19.214] else { [13:13:19.214] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:19.214] windows = "NUL", "/dev/null"), open = "w") [13:13:19.214] } [13:13:19.214] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:19.214] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:19.214] base::sink(type = "output", split = FALSE) [13:13:19.214] base::close(...future.stdout) [13:13:19.214] }, add = TRUE) [13:13:19.214] } [13:13:19.214] ...future.frame <- base::sys.nframe() [13:13:19.214] ...future.conditions <- base::list() [13:13:19.214] ...future.rng <- base::globalenv()$.Random.seed [13:13:19.214] if (FALSE) { [13:13:19.214] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:19.214] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:19.214] } [13:13:19.214] ...future.result <- base::tryCatch({ [13:13:19.214] base::withCallingHandlers({ [13:13:19.214] ...future.value <- base::withVisible(base::local({ [13:13:19.214] ...future.makeSendCondition <- local({ [13:13:19.214] sendCondition <- NULL [13:13:19.214] function(frame = 1L) { [13:13:19.214] if (is.function(sendCondition)) [13:13:19.214] return(sendCondition) [13:13:19.214] ns <- getNamespace("parallel") [13:13:19.214] if (exists("sendData", mode = "function", [13:13:19.214] envir = ns)) { [13:13:19.214] parallel_sendData <- get("sendData", mode = "function", [13:13:19.214] envir = ns) [13:13:19.214] envir <- sys.frame(frame) [13:13:19.214] master <- NULL [13:13:19.214] while (!identical(envir, .GlobalEnv) && [13:13:19.214] !identical(envir, emptyenv())) { [13:13:19.214] if (exists("master", mode = "list", envir = envir, [13:13:19.214] inherits = FALSE)) { [13:13:19.214] master <- get("master", mode = "list", [13:13:19.214] envir = envir, inherits = FALSE) [13:13:19.214] if (inherits(master, c("SOCKnode", [13:13:19.214] "SOCK0node"))) { [13:13:19.214] sendCondition <<- function(cond) { [13:13:19.214] data <- list(type = "VALUE", value = cond, [13:13:19.214] success = TRUE) [13:13:19.214] parallel_sendData(master, data) [13:13:19.214] } [13:13:19.214] return(sendCondition) [13:13:19.214] } [13:13:19.214] } [13:13:19.214] frame <- frame + 1L [13:13:19.214] envir <- sys.frame(frame) [13:13:19.214] } [13:13:19.214] } [13:13:19.214] sendCondition <<- function(cond) NULL [13:13:19.214] } [13:13:19.214] }) [13:13:19.214] withCallingHandlers({ [13:13:19.214] { [13:13:19.214] do.call(function(...) { [13:13:19.214] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:19.214] if (!identical(...future.globals.maxSize.org, [13:13:19.214] ...future.globals.maxSize)) { [13:13:19.214] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:19.214] on.exit(options(oopts), add = TRUE) [13:13:19.214] } [13:13:19.214] { [13:13:19.214] lapply(seq_along(...future.elements_ii), [13:13:19.214] FUN = function(jj) { [13:13:19.214] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:19.214] ...future.FUN(...future.X_jj, ...) [13:13:19.214] }) [13:13:19.214] } [13:13:19.214] }, args = future.call.arguments) [13:13:19.214] } [13:13:19.214] }, immediateCondition = function(cond) { [13:13:19.214] sendCondition <- ...future.makeSendCondition() [13:13:19.214] sendCondition(cond) [13:13:19.214] muffleCondition <- function (cond, pattern = "^muffle") [13:13:19.214] { [13:13:19.214] inherits <- base::inherits [13:13:19.214] invokeRestart <- base::invokeRestart [13:13:19.214] is.null <- base::is.null [13:13:19.214] muffled <- FALSE [13:13:19.214] if (inherits(cond, "message")) { [13:13:19.214] muffled <- grepl(pattern, "muffleMessage") [13:13:19.214] if (muffled) [13:13:19.214] invokeRestart("muffleMessage") [13:13:19.214] } [13:13:19.214] else if (inherits(cond, "warning")) { [13:13:19.214] muffled <- grepl(pattern, "muffleWarning") [13:13:19.214] if (muffled) [13:13:19.214] invokeRestart("muffleWarning") [13:13:19.214] } [13:13:19.214] else if (inherits(cond, "condition")) { [13:13:19.214] if (!is.null(pattern)) { [13:13:19.214] computeRestarts <- base::computeRestarts [13:13:19.214] grepl <- base::grepl [13:13:19.214] restarts <- computeRestarts(cond) [13:13:19.214] for (restart in restarts) { [13:13:19.214] name <- restart$name [13:13:19.214] if (is.null(name)) [13:13:19.214] next [13:13:19.214] if (!grepl(pattern, name)) [13:13:19.214] next [13:13:19.214] invokeRestart(restart) [13:13:19.214] muffled <- TRUE [13:13:19.214] break [13:13:19.214] } [13:13:19.214] } [13:13:19.214] } [13:13:19.214] invisible(muffled) [13:13:19.214] } [13:13:19.214] muffleCondition(cond) [13:13:19.214] }) [13:13:19.214] })) [13:13:19.214] future::FutureResult(value = ...future.value$value, [13:13:19.214] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:19.214] ...future.rng), globalenv = if (FALSE) [13:13:19.214] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:19.214] ...future.globalenv.names)) [13:13:19.214] else NULL, started = ...future.startTime, version = "1.8") [13:13:19.214] }, condition = base::local({ [13:13:19.214] c <- base::c [13:13:19.214] inherits <- base::inherits [13:13:19.214] invokeRestart <- base::invokeRestart [13:13:19.214] length <- base::length [13:13:19.214] list <- base::list [13:13:19.214] seq.int <- base::seq.int [13:13:19.214] signalCondition <- base::signalCondition [13:13:19.214] sys.calls <- base::sys.calls [13:13:19.214] `[[` <- base::`[[` [13:13:19.214] `+` <- base::`+` [13:13:19.214] `<<-` <- base::`<<-` [13:13:19.214] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:19.214] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:19.214] 3L)] [13:13:19.214] } [13:13:19.214] function(cond) { [13:13:19.214] is_error <- inherits(cond, "error") [13:13:19.214] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:19.214] NULL) [13:13:19.214] if (is_error) { [13:13:19.214] sessionInformation <- function() { [13:13:19.214] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:19.214] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:19.214] search = base::search(), system = base::Sys.info()) [13:13:19.214] } [13:13:19.214] ...future.conditions[[length(...future.conditions) + [13:13:19.214] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:19.214] cond$call), session = sessionInformation(), [13:13:19.214] timestamp = base::Sys.time(), signaled = 0L) [13:13:19.214] signalCondition(cond) [13:13:19.214] } [13:13:19.214] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:19.214] "immediateCondition"))) { [13:13:19.214] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:19.214] ...future.conditions[[length(...future.conditions) + [13:13:19.214] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:19.214] if (TRUE && !signal) { [13:13:19.214] muffleCondition <- function (cond, pattern = "^muffle") [13:13:19.214] { [13:13:19.214] inherits <- base::inherits [13:13:19.214] invokeRestart <- base::invokeRestart [13:13:19.214] is.null <- base::is.null [13:13:19.214] muffled <- FALSE [13:13:19.214] if (inherits(cond, "message")) { [13:13:19.214] muffled <- grepl(pattern, "muffleMessage") [13:13:19.214] if (muffled) [13:13:19.214] invokeRestart("muffleMessage") [13:13:19.214] } [13:13:19.214] else if (inherits(cond, "warning")) { [13:13:19.214] muffled <- grepl(pattern, "muffleWarning") [13:13:19.214] if (muffled) [13:13:19.214] invokeRestart("muffleWarning") [13:13:19.214] } [13:13:19.214] else if (inherits(cond, "condition")) { [13:13:19.214] if (!is.null(pattern)) { [13:13:19.214] computeRestarts <- base::computeRestarts [13:13:19.214] grepl <- base::grepl [13:13:19.214] restarts <- computeRestarts(cond) [13:13:19.214] for (restart in restarts) { [13:13:19.214] name <- restart$name [13:13:19.214] if (is.null(name)) [13:13:19.214] next [13:13:19.214] if (!grepl(pattern, name)) [13:13:19.214] next [13:13:19.214] invokeRestart(restart) [13:13:19.214] muffled <- TRUE [13:13:19.214] break [13:13:19.214] } [13:13:19.214] } [13:13:19.214] } [13:13:19.214] invisible(muffled) [13:13:19.214] } [13:13:19.214] muffleCondition(cond, pattern = "^muffle") [13:13:19.214] } [13:13:19.214] } [13:13:19.214] else { [13:13:19.214] if (TRUE) { [13:13:19.214] muffleCondition <- function (cond, pattern = "^muffle") [13:13:19.214] { [13:13:19.214] inherits <- base::inherits [13:13:19.214] invokeRestart <- base::invokeRestart [13:13:19.214] is.null <- base::is.null [13:13:19.214] muffled <- FALSE [13:13:19.214] if (inherits(cond, "message")) { [13:13:19.214] muffled <- grepl(pattern, "muffleMessage") [13:13:19.214] if (muffled) [13:13:19.214] invokeRestart("muffleMessage") [13:13:19.214] } [13:13:19.214] else if (inherits(cond, "warning")) { [13:13:19.214] muffled <- grepl(pattern, "muffleWarning") [13:13:19.214] if (muffled) [13:13:19.214] invokeRestart("muffleWarning") [13:13:19.214] } [13:13:19.214] else if (inherits(cond, "condition")) { [13:13:19.214] if (!is.null(pattern)) { [13:13:19.214] computeRestarts <- base::computeRestarts [13:13:19.214] grepl <- base::grepl [13:13:19.214] restarts <- computeRestarts(cond) [13:13:19.214] for (restart in restarts) { [13:13:19.214] name <- restart$name [13:13:19.214] if (is.null(name)) [13:13:19.214] next [13:13:19.214] if (!grepl(pattern, name)) [13:13:19.214] next [13:13:19.214] invokeRestart(restart) [13:13:19.214] muffled <- TRUE [13:13:19.214] break [13:13:19.214] } [13:13:19.214] } [13:13:19.214] } [13:13:19.214] invisible(muffled) [13:13:19.214] } [13:13:19.214] muffleCondition(cond, pattern = "^muffle") [13:13:19.214] } [13:13:19.214] } [13:13:19.214] } [13:13:19.214] })) [13:13:19.214] }, error = function(ex) { [13:13:19.214] base::structure(base::list(value = NULL, visible = NULL, [13:13:19.214] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:19.214] ...future.rng), started = ...future.startTime, [13:13:19.214] finished = Sys.time(), session_uuid = NA_character_, [13:13:19.214] version = "1.8"), class = "FutureResult") [13:13:19.214] }, finally = { [13:13:19.214] if (!identical(...future.workdir, getwd())) [13:13:19.214] setwd(...future.workdir) [13:13:19.214] { [13:13:19.214] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:19.214] ...future.oldOptions$nwarnings <- NULL [13:13:19.214] } [13:13:19.214] base::options(...future.oldOptions) [13:13:19.214] if (.Platform$OS.type == "windows") { [13:13:19.214] old_names <- names(...future.oldEnvVars) [13:13:19.214] envs <- base::Sys.getenv() [13:13:19.214] names <- names(envs) [13:13:19.214] common <- intersect(names, old_names) [13:13:19.214] added <- setdiff(names, old_names) [13:13:19.214] removed <- setdiff(old_names, names) [13:13:19.214] changed <- common[...future.oldEnvVars[common] != [13:13:19.214] envs[common]] [13:13:19.214] NAMES <- toupper(changed) [13:13:19.214] args <- list() [13:13:19.214] for (kk in seq_along(NAMES)) { [13:13:19.214] name <- changed[[kk]] [13:13:19.214] NAME <- NAMES[[kk]] [13:13:19.214] if (name != NAME && is.element(NAME, old_names)) [13:13:19.214] next [13:13:19.214] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:19.214] } [13:13:19.214] NAMES <- toupper(added) [13:13:19.214] for (kk in seq_along(NAMES)) { [13:13:19.214] name <- added[[kk]] [13:13:19.214] NAME <- NAMES[[kk]] [13:13:19.214] if (name != NAME && is.element(NAME, old_names)) [13:13:19.214] next [13:13:19.214] args[[name]] <- "" [13:13:19.214] } [13:13:19.214] NAMES <- toupper(removed) [13:13:19.214] for (kk in seq_along(NAMES)) { [13:13:19.214] name <- removed[[kk]] [13:13:19.214] NAME <- NAMES[[kk]] [13:13:19.214] if (name != NAME && is.element(NAME, old_names)) [13:13:19.214] next [13:13:19.214] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:19.214] } [13:13:19.214] if (length(args) > 0) [13:13:19.214] base::do.call(base::Sys.setenv, args = args) [13:13:19.214] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:19.214] } [13:13:19.214] else { [13:13:19.214] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:19.214] } [13:13:19.214] { [13:13:19.214] if (base::length(...future.futureOptionsAdded) > [13:13:19.214] 0L) { [13:13:19.214] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:19.214] base::names(opts) <- ...future.futureOptionsAdded [13:13:19.214] base::options(opts) [13:13:19.214] } [13:13:19.214] { [13:13:19.214] { [13:13:19.214] base::options(mc.cores = ...future.mc.cores.old) [13:13:19.214] NULL [13:13:19.214] } [13:13:19.214] options(future.plan = NULL) [13:13:19.214] if (is.na(NA_character_)) [13:13:19.214] Sys.unsetenv("R_FUTURE_PLAN") [13:13:19.214] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:19.214] future::plan(list(function (..., workers = availableCores(), [13:13:19.214] lazy = FALSE, rscript_libs = .libPaths(), [13:13:19.214] envir = parent.frame()) [13:13:19.214] { [13:13:19.214] if (is.function(workers)) [13:13:19.214] workers <- workers() [13:13:19.214] workers <- structure(as.integer(workers), [13:13:19.214] class = class(workers)) [13:13:19.214] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:19.214] workers >= 1) [13:13:19.214] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:19.214] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:19.214] } [13:13:19.214] future <- MultisessionFuture(..., workers = workers, [13:13:19.214] lazy = lazy, rscript_libs = rscript_libs, [13:13:19.214] envir = envir) [13:13:19.214] if (!future$lazy) [13:13:19.214] future <- run(future) [13:13:19.214] invisible(future) [13:13:19.214] }), .cleanup = FALSE, .init = FALSE) [13:13:19.214] } [13:13:19.214] } [13:13:19.214] } [13:13:19.214] }) [13:13:19.214] if (TRUE) { [13:13:19.214] base::sink(type = "output", split = FALSE) [13:13:19.214] if (TRUE) { [13:13:19.214] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:19.214] } [13:13:19.214] else { [13:13:19.214] ...future.result["stdout"] <- base::list(NULL) [13:13:19.214] } [13:13:19.214] base::close(...future.stdout) [13:13:19.214] ...future.stdout <- NULL [13:13:19.214] } [13:13:19.214] ...future.result$conditions <- ...future.conditions [13:13:19.214] ...future.result$finished <- base::Sys.time() [13:13:19.214] ...future.result [13:13:19.214] } [13:13:19.220] Exporting 5 global objects (1.22 KiB) to cluster node #1 ... [13:13:19.220] Exporting '...future.FUN' (1.22 KiB) to cluster node #1 ... [13:13:19.221] Exporting '...future.FUN' (1.22 KiB) to cluster node #1 ... DONE [13:13:19.221] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:13:19.221] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:13:19.222] Exporting '...future.elements_ii' (64 bytes) to cluster node #1 ... [13:13:19.222] Exporting '...future.elements_ii' (64 bytes) to cluster node #1 ... DONE [13:13:19.222] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:19.223] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:19.223] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:19.223] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:19.223] Exporting 5 global objects (1.22 KiB) to cluster node #1 ... DONE [13:13:19.224] MultisessionFuture started [13:13:19.224] - Launch lazy future ... done [13:13:19.224] run() for 'MultisessionFuture' ... done [13:13:19.225] Created future: [13:13:19.241] receiveMessageFromWorker() for ClusterFuture ... [13:13:19.241] - Validating connection of MultisessionFuture [13:13:19.242] - received message: FutureResult [13:13:19.242] - Received FutureResult [13:13:19.242] - Erased future from FutureRegistry [13:13:19.242] result() for ClusterFuture ... [13:13:19.242] - result already collected: FutureResult [13:13:19.242] result() for ClusterFuture ... done [13:13:19.243] receiveMessageFromWorker() for ClusterFuture ... done [13:13:19.225] MultisessionFuture: [13:13:19.225] Label: 'future_eapply-1' [13:13:19.225] Expression: [13:13:19.225] { [13:13:19.225] do.call(function(...) { [13:13:19.225] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:19.225] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:19.225] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:19.225] on.exit(options(oopts), add = TRUE) [13:13:19.225] } [13:13:19.225] { [13:13:19.225] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:19.225] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:19.225] ...future.FUN(...future.X_jj, ...) [13:13:19.225] }) [13:13:19.225] } [13:13:19.225] }, args = future.call.arguments) [13:13:19.225] } [13:13:19.225] Lazy evaluation: FALSE [13:13:19.225] Asynchronous evaluation: TRUE [13:13:19.225] Local evaluation: TRUE [13:13:19.225] Environment: R_GlobalEnv [13:13:19.225] Capture standard output: TRUE [13:13:19.225] Capture condition classes: 'condition' (excluding 'nothing') [13:13:19.225] Globals: 5 objects totaling 1.28 KiB (function '...future.FUN' of 1.22 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 64 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:13:19.225] Packages: 1 packages ('stats') [13:13:19.225] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:19.225] Resolved: TRUE [13:13:19.225] Value: [13:13:19.225] Conditions captured: [13:13:19.225] Early signaling: FALSE [13:13:19.225] Owner process: 9511365f-3977-b8d2-248f-88bd32fc0252 [13:13:19.225] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:19.243] Chunk #1 of 2 ... DONE [13:13:19.243] Chunk #2 of 2 ... [13:13:19.243] - Finding globals in 'X' for chunk #2 ... [13:13:19.244] getGlobalsAndPackages() ... [13:13:19.244] Searching for globals... [13:13:19.244] [13:13:19.244] Searching for globals ... DONE [13:13:19.244] - globals: [0] [13:13:19.245] getGlobalsAndPackages() ... DONE [13:13:19.245] + additional globals found: [n=0] [13:13:19.245] + additional namespaces needed: [n=0] [13:13:19.245] - Finding globals in 'X' for chunk #2 ... DONE [13:13:19.245] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:19.245] - seeds: [13:13:19.246] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:19.246] getGlobalsAndPackages() ... [13:13:19.246] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:19.246] Resolving globals: FALSE [13:13:19.246] Tweak future expression to call with '...' arguments ... [13:13:19.246] { [13:13:19.246] do.call(function(...) { [13:13:19.246] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:19.246] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:19.246] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:19.246] on.exit(options(oopts), add = TRUE) [13:13:19.246] } [13:13:19.246] { [13:13:19.246] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:19.246] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:19.246] ...future.FUN(...future.X_jj, ...) [13:13:19.246] }) [13:13:19.246] } [13:13:19.246] }, args = future.call.arguments) [13:13:19.246] } [13:13:19.247] Tweak future expression to call with '...' arguments ... DONE [13:13:19.247] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:19.248] - packages: [1] 'stats' [13:13:19.248] getGlobalsAndPackages() ... DONE [13:13:19.248] run() for 'Future' ... [13:13:19.248] - state: 'created' [13:13:19.249] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:19.262] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:19.263] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:19.263] - Field: 'node' [13:13:19.263] - Field: 'label' [13:13:19.263] - Field: 'local' [13:13:19.263] - Field: 'owner' [13:13:19.264] - Field: 'envir' [13:13:19.264] - Field: 'workers' [13:13:19.264] - Field: 'packages' [13:13:19.264] - Field: 'gc' [13:13:19.264] - Field: 'conditions' [13:13:19.264] - Field: 'persistent' [13:13:19.265] - Field: 'expr' [13:13:19.265] - Field: 'uuid' [13:13:19.265] - Field: 'seed' [13:13:19.265] - Field: 'version' [13:13:19.265] - Field: 'result' [13:13:19.266] - Field: 'asynchronous' [13:13:19.266] - Field: 'calls' [13:13:19.266] - Field: 'globals' [13:13:19.266] - Field: 'stdout' [13:13:19.266] - Field: 'earlySignal' [13:13:19.266] - Field: 'lazy' [13:13:19.267] - Field: 'state' [13:13:19.267] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:19.267] - Launch lazy future ... [13:13:19.267] Packages needed by the future expression (n = 1): 'stats' [13:13:19.268] Packages needed by future strategies (n = 0): [13:13:19.268] { [13:13:19.268] { [13:13:19.268] { [13:13:19.268] ...future.startTime <- base::Sys.time() [13:13:19.268] { [13:13:19.268] { [13:13:19.268] { [13:13:19.268] { [13:13:19.268] { [13:13:19.268] base::local({ [13:13:19.268] has_future <- base::requireNamespace("future", [13:13:19.268] quietly = TRUE) [13:13:19.268] if (has_future) { [13:13:19.268] ns <- base::getNamespace("future") [13:13:19.268] version <- ns[[".package"]][["version"]] [13:13:19.268] if (is.null(version)) [13:13:19.268] version <- utils::packageVersion("future") [13:13:19.268] } [13:13:19.268] else { [13:13:19.268] version <- NULL [13:13:19.268] } [13:13:19.268] if (!has_future || version < "1.8.0") { [13:13:19.268] info <- base::c(r_version = base::gsub("R version ", [13:13:19.268] "", base::R.version$version.string), [13:13:19.268] platform = base::sprintf("%s (%s-bit)", [13:13:19.268] base::R.version$platform, 8 * [13:13:19.268] base::.Machine$sizeof.pointer), [13:13:19.268] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:19.268] "release", "version")], collapse = " "), [13:13:19.268] hostname = base::Sys.info()[["nodename"]]) [13:13:19.268] info <- base::sprintf("%s: %s", base::names(info), [13:13:19.268] info) [13:13:19.268] info <- base::paste(info, collapse = "; ") [13:13:19.268] if (!has_future) { [13:13:19.268] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:19.268] info) [13:13:19.268] } [13:13:19.268] else { [13:13:19.268] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:19.268] info, version) [13:13:19.268] } [13:13:19.268] base::stop(msg) [13:13:19.268] } [13:13:19.268] }) [13:13:19.268] } [13:13:19.268] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:19.268] base::options(mc.cores = 1L) [13:13:19.268] } [13:13:19.268] base::local({ [13:13:19.268] for (pkg in "stats") { [13:13:19.268] base::loadNamespace(pkg) [13:13:19.268] base::library(pkg, character.only = TRUE) [13:13:19.268] } [13:13:19.268] }) [13:13:19.268] } [13:13:19.268] options(future.plan = NULL) [13:13:19.268] Sys.unsetenv("R_FUTURE_PLAN") [13:13:19.268] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:19.268] } [13:13:19.268] ...future.workdir <- getwd() [13:13:19.268] } [13:13:19.268] ...future.oldOptions <- base::as.list(base::.Options) [13:13:19.268] ...future.oldEnvVars <- base::Sys.getenv() [13:13:19.268] } [13:13:19.268] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:19.268] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:19.268] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:19.268] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:19.268] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:19.268] future.stdout.windows.reencode = NULL, width = 80L) [13:13:19.268] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:19.268] base::names(...future.oldOptions)) [13:13:19.268] } [13:13:19.268] if (FALSE) { [13:13:19.268] } [13:13:19.268] else { [13:13:19.268] if (TRUE) { [13:13:19.268] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:19.268] open = "w") [13:13:19.268] } [13:13:19.268] else { [13:13:19.268] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:19.268] windows = "NUL", "/dev/null"), open = "w") [13:13:19.268] } [13:13:19.268] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:19.268] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:19.268] base::sink(type = "output", split = FALSE) [13:13:19.268] base::close(...future.stdout) [13:13:19.268] }, add = TRUE) [13:13:19.268] } [13:13:19.268] ...future.frame <- base::sys.nframe() [13:13:19.268] ...future.conditions <- base::list() [13:13:19.268] ...future.rng <- base::globalenv()$.Random.seed [13:13:19.268] if (FALSE) { [13:13:19.268] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:19.268] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:19.268] } [13:13:19.268] ...future.result <- base::tryCatch({ [13:13:19.268] base::withCallingHandlers({ [13:13:19.268] ...future.value <- base::withVisible(base::local({ [13:13:19.268] ...future.makeSendCondition <- local({ [13:13:19.268] sendCondition <- NULL [13:13:19.268] function(frame = 1L) { [13:13:19.268] if (is.function(sendCondition)) [13:13:19.268] return(sendCondition) [13:13:19.268] ns <- getNamespace("parallel") [13:13:19.268] if (exists("sendData", mode = "function", [13:13:19.268] envir = ns)) { [13:13:19.268] parallel_sendData <- get("sendData", mode = "function", [13:13:19.268] envir = ns) [13:13:19.268] envir <- sys.frame(frame) [13:13:19.268] master <- NULL [13:13:19.268] while (!identical(envir, .GlobalEnv) && [13:13:19.268] !identical(envir, emptyenv())) { [13:13:19.268] if (exists("master", mode = "list", envir = envir, [13:13:19.268] inherits = FALSE)) { [13:13:19.268] master <- get("master", mode = "list", [13:13:19.268] envir = envir, inherits = FALSE) [13:13:19.268] if (inherits(master, c("SOCKnode", [13:13:19.268] "SOCK0node"))) { [13:13:19.268] sendCondition <<- function(cond) { [13:13:19.268] data <- list(type = "VALUE", value = cond, [13:13:19.268] success = TRUE) [13:13:19.268] parallel_sendData(master, data) [13:13:19.268] } [13:13:19.268] return(sendCondition) [13:13:19.268] } [13:13:19.268] } [13:13:19.268] frame <- frame + 1L [13:13:19.268] envir <- sys.frame(frame) [13:13:19.268] } [13:13:19.268] } [13:13:19.268] sendCondition <<- function(cond) NULL [13:13:19.268] } [13:13:19.268] }) [13:13:19.268] withCallingHandlers({ [13:13:19.268] { [13:13:19.268] do.call(function(...) { [13:13:19.268] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:19.268] if (!identical(...future.globals.maxSize.org, [13:13:19.268] ...future.globals.maxSize)) { [13:13:19.268] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:19.268] on.exit(options(oopts), add = TRUE) [13:13:19.268] } [13:13:19.268] { [13:13:19.268] lapply(seq_along(...future.elements_ii), [13:13:19.268] FUN = function(jj) { [13:13:19.268] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:19.268] ...future.FUN(...future.X_jj, ...) [13:13:19.268] }) [13:13:19.268] } [13:13:19.268] }, args = future.call.arguments) [13:13:19.268] } [13:13:19.268] }, immediateCondition = function(cond) { [13:13:19.268] sendCondition <- ...future.makeSendCondition() [13:13:19.268] sendCondition(cond) [13:13:19.268] muffleCondition <- function (cond, pattern = "^muffle") [13:13:19.268] { [13:13:19.268] inherits <- base::inherits [13:13:19.268] invokeRestart <- base::invokeRestart [13:13:19.268] is.null <- base::is.null [13:13:19.268] muffled <- FALSE [13:13:19.268] if (inherits(cond, "message")) { [13:13:19.268] muffled <- grepl(pattern, "muffleMessage") [13:13:19.268] if (muffled) [13:13:19.268] invokeRestart("muffleMessage") [13:13:19.268] } [13:13:19.268] else if (inherits(cond, "warning")) { [13:13:19.268] muffled <- grepl(pattern, "muffleWarning") [13:13:19.268] if (muffled) [13:13:19.268] invokeRestart("muffleWarning") [13:13:19.268] } [13:13:19.268] else if (inherits(cond, "condition")) { [13:13:19.268] if (!is.null(pattern)) { [13:13:19.268] computeRestarts <- base::computeRestarts [13:13:19.268] grepl <- base::grepl [13:13:19.268] restarts <- computeRestarts(cond) [13:13:19.268] for (restart in restarts) { [13:13:19.268] name <- restart$name [13:13:19.268] if (is.null(name)) [13:13:19.268] next [13:13:19.268] if (!grepl(pattern, name)) [13:13:19.268] next [13:13:19.268] invokeRestart(restart) [13:13:19.268] muffled <- TRUE [13:13:19.268] break [13:13:19.268] } [13:13:19.268] } [13:13:19.268] } [13:13:19.268] invisible(muffled) [13:13:19.268] } [13:13:19.268] muffleCondition(cond) [13:13:19.268] }) [13:13:19.268] })) [13:13:19.268] future::FutureResult(value = ...future.value$value, [13:13:19.268] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:19.268] ...future.rng), globalenv = if (FALSE) [13:13:19.268] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:19.268] ...future.globalenv.names)) [13:13:19.268] else NULL, started = ...future.startTime, version = "1.8") [13:13:19.268] }, condition = base::local({ [13:13:19.268] c <- base::c [13:13:19.268] inherits <- base::inherits [13:13:19.268] invokeRestart <- base::invokeRestart [13:13:19.268] length <- base::length [13:13:19.268] list <- base::list [13:13:19.268] seq.int <- base::seq.int [13:13:19.268] signalCondition <- base::signalCondition [13:13:19.268] sys.calls <- base::sys.calls [13:13:19.268] `[[` <- base::`[[` [13:13:19.268] `+` <- base::`+` [13:13:19.268] `<<-` <- base::`<<-` [13:13:19.268] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:19.268] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:19.268] 3L)] [13:13:19.268] } [13:13:19.268] function(cond) { [13:13:19.268] is_error <- inherits(cond, "error") [13:13:19.268] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:19.268] NULL) [13:13:19.268] if (is_error) { [13:13:19.268] sessionInformation <- function() { [13:13:19.268] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:19.268] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:19.268] search = base::search(), system = base::Sys.info()) [13:13:19.268] } [13:13:19.268] ...future.conditions[[length(...future.conditions) + [13:13:19.268] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:19.268] cond$call), session = sessionInformation(), [13:13:19.268] timestamp = base::Sys.time(), signaled = 0L) [13:13:19.268] signalCondition(cond) [13:13:19.268] } [13:13:19.268] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:19.268] "immediateCondition"))) { [13:13:19.268] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:19.268] ...future.conditions[[length(...future.conditions) + [13:13:19.268] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:19.268] if (TRUE && !signal) { [13:13:19.268] muffleCondition <- function (cond, pattern = "^muffle") [13:13:19.268] { [13:13:19.268] inherits <- base::inherits [13:13:19.268] invokeRestart <- base::invokeRestart [13:13:19.268] is.null <- base::is.null [13:13:19.268] muffled <- FALSE [13:13:19.268] if (inherits(cond, "message")) { [13:13:19.268] muffled <- grepl(pattern, "muffleMessage") [13:13:19.268] if (muffled) [13:13:19.268] invokeRestart("muffleMessage") [13:13:19.268] } [13:13:19.268] else if (inherits(cond, "warning")) { [13:13:19.268] muffled <- grepl(pattern, "muffleWarning") [13:13:19.268] if (muffled) [13:13:19.268] invokeRestart("muffleWarning") [13:13:19.268] } [13:13:19.268] else if (inherits(cond, "condition")) { [13:13:19.268] if (!is.null(pattern)) { [13:13:19.268] computeRestarts <- base::computeRestarts [13:13:19.268] grepl <- base::grepl [13:13:19.268] restarts <- computeRestarts(cond) [13:13:19.268] for (restart in restarts) { [13:13:19.268] name <- restart$name [13:13:19.268] if (is.null(name)) [13:13:19.268] next [13:13:19.268] if (!grepl(pattern, name)) [13:13:19.268] next [13:13:19.268] invokeRestart(restart) [13:13:19.268] muffled <- TRUE [13:13:19.268] break [13:13:19.268] } [13:13:19.268] } [13:13:19.268] } [13:13:19.268] invisible(muffled) [13:13:19.268] } [13:13:19.268] muffleCondition(cond, pattern = "^muffle") [13:13:19.268] } [13:13:19.268] } [13:13:19.268] else { [13:13:19.268] if (TRUE) { [13:13:19.268] muffleCondition <- function (cond, pattern = "^muffle") [13:13:19.268] { [13:13:19.268] inherits <- base::inherits [13:13:19.268] invokeRestart <- base::invokeRestart [13:13:19.268] is.null <- base::is.null [13:13:19.268] muffled <- FALSE [13:13:19.268] if (inherits(cond, "message")) { [13:13:19.268] muffled <- grepl(pattern, "muffleMessage") [13:13:19.268] if (muffled) [13:13:19.268] invokeRestart("muffleMessage") [13:13:19.268] } [13:13:19.268] else if (inherits(cond, "warning")) { [13:13:19.268] muffled <- grepl(pattern, "muffleWarning") [13:13:19.268] if (muffled) [13:13:19.268] invokeRestart("muffleWarning") [13:13:19.268] } [13:13:19.268] else if (inherits(cond, "condition")) { [13:13:19.268] if (!is.null(pattern)) { [13:13:19.268] computeRestarts <- base::computeRestarts [13:13:19.268] grepl <- base::grepl [13:13:19.268] restarts <- computeRestarts(cond) [13:13:19.268] for (restart in restarts) { [13:13:19.268] name <- restart$name [13:13:19.268] if (is.null(name)) [13:13:19.268] next [13:13:19.268] if (!grepl(pattern, name)) [13:13:19.268] next [13:13:19.268] invokeRestart(restart) [13:13:19.268] muffled <- TRUE [13:13:19.268] break [13:13:19.268] } [13:13:19.268] } [13:13:19.268] } [13:13:19.268] invisible(muffled) [13:13:19.268] } [13:13:19.268] muffleCondition(cond, pattern = "^muffle") [13:13:19.268] } [13:13:19.268] } [13:13:19.268] } [13:13:19.268] })) [13:13:19.268] }, error = function(ex) { [13:13:19.268] base::structure(base::list(value = NULL, visible = NULL, [13:13:19.268] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:19.268] ...future.rng), started = ...future.startTime, [13:13:19.268] finished = Sys.time(), session_uuid = NA_character_, [13:13:19.268] version = "1.8"), class = "FutureResult") [13:13:19.268] }, finally = { [13:13:19.268] if (!identical(...future.workdir, getwd())) [13:13:19.268] setwd(...future.workdir) [13:13:19.268] { [13:13:19.268] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:19.268] ...future.oldOptions$nwarnings <- NULL [13:13:19.268] } [13:13:19.268] base::options(...future.oldOptions) [13:13:19.268] if (.Platform$OS.type == "windows") { [13:13:19.268] old_names <- names(...future.oldEnvVars) [13:13:19.268] envs <- base::Sys.getenv() [13:13:19.268] names <- names(envs) [13:13:19.268] common <- intersect(names, old_names) [13:13:19.268] added <- setdiff(names, old_names) [13:13:19.268] removed <- setdiff(old_names, names) [13:13:19.268] changed <- common[...future.oldEnvVars[common] != [13:13:19.268] envs[common]] [13:13:19.268] NAMES <- toupper(changed) [13:13:19.268] args <- list() [13:13:19.268] for (kk in seq_along(NAMES)) { [13:13:19.268] name <- changed[[kk]] [13:13:19.268] NAME <- NAMES[[kk]] [13:13:19.268] if (name != NAME && is.element(NAME, old_names)) [13:13:19.268] next [13:13:19.268] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:19.268] } [13:13:19.268] NAMES <- toupper(added) [13:13:19.268] for (kk in seq_along(NAMES)) { [13:13:19.268] name <- added[[kk]] [13:13:19.268] NAME <- NAMES[[kk]] [13:13:19.268] if (name != NAME && is.element(NAME, old_names)) [13:13:19.268] next [13:13:19.268] args[[name]] <- "" [13:13:19.268] } [13:13:19.268] NAMES <- toupper(removed) [13:13:19.268] for (kk in seq_along(NAMES)) { [13:13:19.268] name <- removed[[kk]] [13:13:19.268] NAME <- NAMES[[kk]] [13:13:19.268] if (name != NAME && is.element(NAME, old_names)) [13:13:19.268] next [13:13:19.268] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:19.268] } [13:13:19.268] if (length(args) > 0) [13:13:19.268] base::do.call(base::Sys.setenv, args = args) [13:13:19.268] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:19.268] } [13:13:19.268] else { [13:13:19.268] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:19.268] } [13:13:19.268] { [13:13:19.268] if (base::length(...future.futureOptionsAdded) > [13:13:19.268] 0L) { [13:13:19.268] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:19.268] base::names(opts) <- ...future.futureOptionsAdded [13:13:19.268] base::options(opts) [13:13:19.268] } [13:13:19.268] { [13:13:19.268] { [13:13:19.268] base::options(mc.cores = ...future.mc.cores.old) [13:13:19.268] NULL [13:13:19.268] } [13:13:19.268] options(future.plan = NULL) [13:13:19.268] if (is.na(NA_character_)) [13:13:19.268] Sys.unsetenv("R_FUTURE_PLAN") [13:13:19.268] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:19.268] future::plan(list(function (..., workers = availableCores(), [13:13:19.268] lazy = FALSE, rscript_libs = .libPaths(), [13:13:19.268] envir = parent.frame()) [13:13:19.268] { [13:13:19.268] if (is.function(workers)) [13:13:19.268] workers <- workers() [13:13:19.268] workers <- structure(as.integer(workers), [13:13:19.268] class = class(workers)) [13:13:19.268] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:19.268] workers >= 1) [13:13:19.268] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:19.268] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:19.268] } [13:13:19.268] future <- MultisessionFuture(..., workers = workers, [13:13:19.268] lazy = lazy, rscript_libs = rscript_libs, [13:13:19.268] envir = envir) [13:13:19.268] if (!future$lazy) [13:13:19.268] future <- run(future) [13:13:19.268] invisible(future) [13:13:19.268] }), .cleanup = FALSE, .init = FALSE) [13:13:19.268] } [13:13:19.268] } [13:13:19.268] } [13:13:19.268] }) [13:13:19.268] if (TRUE) { [13:13:19.268] base::sink(type = "output", split = FALSE) [13:13:19.268] if (TRUE) { [13:13:19.268] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:19.268] } [13:13:19.268] else { [13:13:19.268] ...future.result["stdout"] <- base::list(NULL) [13:13:19.268] } [13:13:19.268] base::close(...future.stdout) [13:13:19.268] ...future.stdout <- NULL [13:13:19.268] } [13:13:19.268] ...future.result$conditions <- ...future.conditions [13:13:19.268] ...future.result$finished <- base::Sys.time() [13:13:19.268] ...future.result [13:13:19.268] } [13:13:19.274] Exporting 5 global objects (1.22 KiB) to cluster node #1 ... [13:13:19.274] Exporting '...future.FUN' (1.22 KiB) to cluster node #1 ... [13:13:19.274] Exporting '...future.FUN' (1.22 KiB) to cluster node #1 ... DONE [13:13:19.275] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:13:19.275] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:13:19.275] Exporting '...future.elements_ii' (208 bytes) to cluster node #1 ... [13:13:19.276] Exporting '...future.elements_ii' (208 bytes) to cluster node #1 ... DONE [13:13:19.276] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:19.276] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:19.276] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:19.277] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:19.277] Exporting 5 global objects (1.22 KiB) to cluster node #1 ... DONE [13:13:19.278] MultisessionFuture started [13:13:19.278] - Launch lazy future ... done [13:13:19.278] run() for 'MultisessionFuture' ... done [13:13:19.278] Created future: [13:13:19.294] receiveMessageFromWorker() for ClusterFuture ... [13:13:19.294] - Validating connection of MultisessionFuture [13:13:19.294] - received message: FutureResult [13:13:19.294] - Received FutureResult [13:13:19.294] - Erased future from FutureRegistry [13:13:19.295] result() for ClusterFuture ... [13:13:19.295] - result already collected: FutureResult [13:13:19.295] result() for ClusterFuture ... done [13:13:19.295] receiveMessageFromWorker() for ClusterFuture ... done [13:13:19.278] MultisessionFuture: [13:13:19.278] Label: 'future_eapply-2' [13:13:19.278] Expression: [13:13:19.278] { [13:13:19.278] do.call(function(...) { [13:13:19.278] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:19.278] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:19.278] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:19.278] on.exit(options(oopts), add = TRUE) [13:13:19.278] } [13:13:19.278] { [13:13:19.278] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:19.278] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:19.278] ...future.FUN(...future.X_jj, ...) [13:13:19.278] }) [13:13:19.278] } [13:13:19.278] }, args = future.call.arguments) [13:13:19.278] } [13:13:19.278] Lazy evaluation: FALSE [13:13:19.278] Asynchronous evaluation: TRUE [13:13:19.278] Local evaluation: TRUE [13:13:19.278] Environment: R_GlobalEnv [13:13:19.278] Capture standard output: TRUE [13:13:19.278] Capture condition classes: 'condition' (excluding 'nothing') [13:13:19.278] Globals: 5 objects totaling 1.42 KiB (function '...future.FUN' of 1.22 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 208 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:13:19.278] Packages: 1 packages ('stats') [13:13:19.278] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:19.278] Resolved: TRUE [13:13:19.278] Value: [13:13:19.278] Conditions captured: [13:13:19.278] Early signaling: FALSE [13:13:19.278] Owner process: 9511365f-3977-b8d2-248f-88bd32fc0252 [13:13:19.278] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:19.295] Chunk #2 of 2 ... DONE [13:13:19.296] Launching 2 futures (chunks) ... DONE [13:13:19.296] Resolving 2 futures (chunks) ... [13:13:19.296] resolve() on list ... [13:13:19.296] recursive: 0 [13:13:19.296] length: 2 [13:13:19.296] [13:13:19.297] Future #1 [13:13:19.297] result() for ClusterFuture ... [13:13:19.297] - result already collected: FutureResult [13:13:19.297] result() for ClusterFuture ... done [13:13:19.297] result() for ClusterFuture ... [13:13:19.297] - result already collected: FutureResult [13:13:19.298] result() for ClusterFuture ... done [13:13:19.298] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:13:19.298] - nx: 2 [13:13:19.298] - relay: TRUE [13:13:19.298] - stdout: TRUE [13:13:19.298] - signal: TRUE [13:13:19.298] - resignal: FALSE [13:13:19.299] - force: TRUE [13:13:19.299] - relayed: [n=2] FALSE, FALSE [13:13:19.299] - queued futures: [n=2] FALSE, FALSE [13:13:19.299] - until=1 [13:13:19.299] - relaying element #1 [13:13:19.299] result() for ClusterFuture ... [13:13:19.300] - result already collected: FutureResult [13:13:19.300] result() for ClusterFuture ... done [13:13:19.300] result() for ClusterFuture ... [13:13:19.300] - result already collected: FutureResult [13:13:19.300] result() for ClusterFuture ... done [13:13:19.300] result() for ClusterFuture ... [13:13:19.301] - result already collected: FutureResult [13:13:19.301] result() for ClusterFuture ... done [13:13:19.301] result() for ClusterFuture ... [13:13:19.301] - result already collected: FutureResult [13:13:19.301] result() for ClusterFuture ... done [13:13:19.301] - relayed: [n=2] TRUE, FALSE [13:13:19.302] - queued futures: [n=2] TRUE, FALSE [13:13:19.302] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:13:19.302] length: 1 (resolved future 1) [13:13:19.302] Future #2 [13:13:19.302] result() for ClusterFuture ... [13:13:19.302] - result already collected: FutureResult [13:13:19.302] result() for ClusterFuture ... done [13:13:19.303] result() for ClusterFuture ... [13:13:19.303] - result already collected: FutureResult [13:13:19.303] result() for ClusterFuture ... done [13:13:19.303] signalConditionsASAP(MultisessionFuture, pos=2) ... [13:13:19.303] - nx: 2 [13:13:19.303] - relay: TRUE [13:13:19.304] - stdout: TRUE [13:13:19.304] - signal: TRUE [13:13:19.304] - resignal: FALSE [13:13:19.304] - force: TRUE [13:13:19.304] - relayed: [n=2] TRUE, FALSE [13:13:19.304] - queued futures: [n=2] TRUE, FALSE [13:13:19.305] - until=2 [13:13:19.305] - relaying element #2 [13:13:19.305] result() for ClusterFuture ... [13:13:19.305] - result already collected: FutureResult [13:13:19.305] result() for ClusterFuture ... done [13:13:19.305] result() for ClusterFuture ... [13:13:19.305] - result already collected: FutureResult [13:13:19.306] result() for ClusterFuture ... done [13:13:19.306] result() for ClusterFuture ... [13:13:19.306] - result already collected: FutureResult [13:13:19.306] result() for ClusterFuture ... done [13:13:19.306] result() for ClusterFuture ... [13:13:19.306] - result already collected: FutureResult [13:13:19.307] result() for ClusterFuture ... done [13:13:19.307] - relayed: [n=2] TRUE, TRUE [13:13:19.307] - queued futures: [n=2] TRUE, TRUE [13:13:19.307] signalConditionsASAP(MultisessionFuture, pos=2) ... done [13:13:19.307] length: 0 (resolved future 2) [13:13:19.307] Relaying remaining futures [13:13:19.308] signalConditionsASAP(NULL, pos=0) ... [13:13:19.308] - nx: 2 [13:13:19.308] - relay: TRUE [13:13:19.308] - stdout: TRUE [13:13:19.308] - signal: TRUE [13:13:19.308] - resignal: FALSE [13:13:19.308] - force: TRUE [13:13:19.309] - relayed: [n=2] TRUE, TRUE [13:13:19.309] - queued futures: [n=2] TRUE, TRUE - flush all [13:13:19.309] - relayed: [n=2] TRUE, TRUE [13:13:19.309] - queued futures: [n=2] TRUE, TRUE [13:13:19.309] signalConditionsASAP(NULL, pos=0) ... done [13:13:19.309] resolve() on list ... DONE [13:13:19.310] result() for ClusterFuture ... [13:13:19.310] - result already collected: FutureResult [13:13:19.310] result() for ClusterFuture ... done [13:13:19.310] result() for ClusterFuture ... [13:13:19.310] - result already collected: FutureResult [13:13:19.310] result() for ClusterFuture ... done [13:13:19.311] result() for ClusterFuture ... [13:13:19.311] - result already collected: FutureResult [13:13:19.311] result() for ClusterFuture ... done [13:13:19.311] result() for ClusterFuture ... [13:13:19.311] - result already collected: FutureResult [13:13:19.311] result() for ClusterFuture ... done [13:13:19.312] - Number of value chunks collected: 2 [13:13:19.312] Resolving 2 futures (chunks) ... DONE [13:13:19.312] Reducing values from 2 chunks ... [13:13:19.312] - Number of values collected after concatenation: 3 [13:13:19.312] - Number of values expected: 3 [13:13:19.312] Reducing values from 2 chunks ... DONE [13:13:19.313] future_lapply() ... DONE [13:13:19.313] future_lapply() ... [13:13:19.316] Number of chunks: 2 [13:13:19.316] getGlobalsAndPackagesXApply() ... [13:13:19.316] - future.globals: TRUE [13:13:19.316] getGlobalsAndPackages() ... [13:13:19.316] Searching for globals... [13:13:19.318] - globals found: [2] 'FUN', 'UseMethod' [13:13:19.318] Searching for globals ... DONE [13:13:19.318] Resolving globals: FALSE [13:13:19.318] The total size of the 1 globals is 1.22 KiB (1248 bytes) [13:13:19.319] The total size of the 1 globals exported for future expression ('FUN()') is 1.22 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (1.22 KiB of class 'function') [13:13:19.319] - globals: [1] 'FUN' [13:13:19.319] - packages: [1] 'stats' [13:13:19.320] getGlobalsAndPackages() ... DONE [13:13:19.320] - globals found/used: [n=1] 'FUN' [13:13:19.320] - needed namespaces: [n=1] 'stats' [13:13:19.320] Finding globals ... DONE [13:13:19.320] - use_args: TRUE [13:13:19.320] - Getting '...' globals ... [13:13:19.321] resolve() on list ... [13:13:19.321] recursive: 0 [13:13:19.321] length: 1 [13:13:19.321] elements: '...' [13:13:19.321] length: 0 (resolved future 1) [13:13:19.322] resolve() on list ... DONE [13:13:19.322] - '...' content: [n=0] [13:13:19.322] List of 1 [13:13:19.322] $ ...: list() [13:13:19.322] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:19.322] - attr(*, "where")=List of 1 [13:13:19.322] ..$ ...: [13:13:19.322] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:19.322] - attr(*, "resolved")= logi TRUE [13:13:19.322] - attr(*, "total_size")= num NA [13:13:19.325] - Getting '...' globals ... DONE [13:13:19.325] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [13:13:19.325] List of 2 [13:13:19.325] $ ...future.FUN:function (x, ...) [13:13:19.325] $ ... : list() [13:13:19.325] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [13:13:19.325] - attr(*, "where")=List of 2 [13:13:19.325] ..$ ...future.FUN: [13:13:19.325] ..$ ... : [13:13:19.325] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [13:13:19.325] - attr(*, "resolved")= logi FALSE [13:13:19.325] - attr(*, "total_size")= num 1248 [13:13:19.329] Packages to be attached in all futures: [n=1] 'stats' [13:13:19.329] getGlobalsAndPackagesXApply() ... DONE [13:13:19.330] Number of futures (= number of chunks): 2 [13:13:19.330] Launching 2 futures (chunks) ... [13:13:19.330] Chunk #1 of 2 ... [13:13:19.330] - Finding globals in 'X' for chunk #1 ... [13:13:19.330] getGlobalsAndPackages() ... [13:13:19.330] Searching for globals... [13:13:19.331] [13:13:19.331] Searching for globals ... DONE [13:13:19.331] - globals: [0] [13:13:19.331] getGlobalsAndPackages() ... DONE [13:13:19.331] + additional globals found: [n=0] [13:13:19.332] + additional namespaces needed: [n=0] [13:13:19.332] - Finding globals in 'X' for chunk #1 ... DONE [13:13:19.332] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:19.332] - seeds: [13:13:19.332] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:19.332] getGlobalsAndPackages() ... [13:13:19.333] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:19.333] Resolving globals: FALSE [13:13:19.333] Tweak future expression to call with '...' arguments ... [13:13:19.333] { [13:13:19.333] do.call(function(...) { [13:13:19.333] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:19.333] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:19.333] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:19.333] on.exit(options(oopts), add = TRUE) [13:13:19.333] } [13:13:19.333] { [13:13:19.333] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:19.333] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:19.333] ...future.FUN(...future.X_jj, ...) [13:13:19.333] }) [13:13:19.333] } [13:13:19.333] }, args = future.call.arguments) [13:13:19.333] } [13:13:19.334] Tweak future expression to call with '...' arguments ... DONE [13:13:19.334] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:19.334] - packages: [1] 'stats' [13:13:19.334] getGlobalsAndPackages() ... DONE [13:13:19.335] run() for 'Future' ... [13:13:19.335] - state: 'created' [13:13:19.335] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:19.349] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:19.349] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:19.350] - Field: 'node' [13:13:19.350] - Field: 'label' [13:13:19.350] - Field: 'local' [13:13:19.350] - Field: 'owner' [13:13:19.350] - Field: 'envir' [13:13:19.351] - Field: 'workers' [13:13:19.351] - Field: 'packages' [13:13:19.351] - Field: 'gc' [13:13:19.351] - Field: 'conditions' [13:13:19.351] - Field: 'persistent' [13:13:19.351] - Field: 'expr' [13:13:19.352] - Field: 'uuid' [13:13:19.352] - Field: 'seed' [13:13:19.352] - Field: 'version' [13:13:19.352] - Field: 'result' [13:13:19.352] - Field: 'asynchronous' [13:13:19.353] - Field: 'calls' [13:13:19.353] - Field: 'globals' [13:13:19.353] - Field: 'stdout' [13:13:19.353] - Field: 'earlySignal' [13:13:19.353] - Field: 'lazy' [13:13:19.353] - Field: 'state' [13:13:19.354] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:19.354] - Launch lazy future ... [13:13:19.354] Packages needed by the future expression (n = 1): 'stats' [13:13:19.354] Packages needed by future strategies (n = 0): [13:13:19.355] { [13:13:19.355] { [13:13:19.355] { [13:13:19.355] ...future.startTime <- base::Sys.time() [13:13:19.355] { [13:13:19.355] { [13:13:19.355] { [13:13:19.355] { [13:13:19.355] { [13:13:19.355] base::local({ [13:13:19.355] has_future <- base::requireNamespace("future", [13:13:19.355] quietly = TRUE) [13:13:19.355] if (has_future) { [13:13:19.355] ns <- base::getNamespace("future") [13:13:19.355] version <- ns[[".package"]][["version"]] [13:13:19.355] if (is.null(version)) [13:13:19.355] version <- utils::packageVersion("future") [13:13:19.355] } [13:13:19.355] else { [13:13:19.355] version <- NULL [13:13:19.355] } [13:13:19.355] if (!has_future || version < "1.8.0") { [13:13:19.355] info <- base::c(r_version = base::gsub("R version ", [13:13:19.355] "", base::R.version$version.string), [13:13:19.355] platform = base::sprintf("%s (%s-bit)", [13:13:19.355] base::R.version$platform, 8 * [13:13:19.355] base::.Machine$sizeof.pointer), [13:13:19.355] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:19.355] "release", "version")], collapse = " "), [13:13:19.355] hostname = base::Sys.info()[["nodename"]]) [13:13:19.355] info <- base::sprintf("%s: %s", base::names(info), [13:13:19.355] info) [13:13:19.355] info <- base::paste(info, collapse = "; ") [13:13:19.355] if (!has_future) { [13:13:19.355] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:19.355] info) [13:13:19.355] } [13:13:19.355] else { [13:13:19.355] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:19.355] info, version) [13:13:19.355] } [13:13:19.355] base::stop(msg) [13:13:19.355] } [13:13:19.355] }) [13:13:19.355] } [13:13:19.355] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:19.355] base::options(mc.cores = 1L) [13:13:19.355] } [13:13:19.355] base::local({ [13:13:19.355] for (pkg in "stats") { [13:13:19.355] base::loadNamespace(pkg) [13:13:19.355] base::library(pkg, character.only = TRUE) [13:13:19.355] } [13:13:19.355] }) [13:13:19.355] } [13:13:19.355] options(future.plan = NULL) [13:13:19.355] Sys.unsetenv("R_FUTURE_PLAN") [13:13:19.355] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:19.355] } [13:13:19.355] ...future.workdir <- getwd() [13:13:19.355] } [13:13:19.355] ...future.oldOptions <- base::as.list(base::.Options) [13:13:19.355] ...future.oldEnvVars <- base::Sys.getenv() [13:13:19.355] } [13:13:19.355] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:19.355] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:19.355] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:19.355] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:19.355] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:19.355] future.stdout.windows.reencode = NULL, width = 80L) [13:13:19.355] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:19.355] base::names(...future.oldOptions)) [13:13:19.355] } [13:13:19.355] if (FALSE) { [13:13:19.355] } [13:13:19.355] else { [13:13:19.355] if (TRUE) { [13:13:19.355] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:19.355] open = "w") [13:13:19.355] } [13:13:19.355] else { [13:13:19.355] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:19.355] windows = "NUL", "/dev/null"), open = "w") [13:13:19.355] } [13:13:19.355] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:19.355] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:19.355] base::sink(type = "output", split = FALSE) [13:13:19.355] base::close(...future.stdout) [13:13:19.355] }, add = TRUE) [13:13:19.355] } [13:13:19.355] ...future.frame <- base::sys.nframe() [13:13:19.355] ...future.conditions <- base::list() [13:13:19.355] ...future.rng <- base::globalenv()$.Random.seed [13:13:19.355] if (FALSE) { [13:13:19.355] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:19.355] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:19.355] } [13:13:19.355] ...future.result <- base::tryCatch({ [13:13:19.355] base::withCallingHandlers({ [13:13:19.355] ...future.value <- base::withVisible(base::local({ [13:13:19.355] ...future.makeSendCondition <- local({ [13:13:19.355] sendCondition <- NULL [13:13:19.355] function(frame = 1L) { [13:13:19.355] if (is.function(sendCondition)) [13:13:19.355] return(sendCondition) [13:13:19.355] ns <- getNamespace("parallel") [13:13:19.355] if (exists("sendData", mode = "function", [13:13:19.355] envir = ns)) { [13:13:19.355] parallel_sendData <- get("sendData", mode = "function", [13:13:19.355] envir = ns) [13:13:19.355] envir <- sys.frame(frame) [13:13:19.355] master <- NULL [13:13:19.355] while (!identical(envir, .GlobalEnv) && [13:13:19.355] !identical(envir, emptyenv())) { [13:13:19.355] if (exists("master", mode = "list", envir = envir, [13:13:19.355] inherits = FALSE)) { [13:13:19.355] master <- get("master", mode = "list", [13:13:19.355] envir = envir, inherits = FALSE) [13:13:19.355] if (inherits(master, c("SOCKnode", [13:13:19.355] "SOCK0node"))) { [13:13:19.355] sendCondition <<- function(cond) { [13:13:19.355] data <- list(type = "VALUE", value = cond, [13:13:19.355] success = TRUE) [13:13:19.355] parallel_sendData(master, data) [13:13:19.355] } [13:13:19.355] return(sendCondition) [13:13:19.355] } [13:13:19.355] } [13:13:19.355] frame <- frame + 1L [13:13:19.355] envir <- sys.frame(frame) [13:13:19.355] } [13:13:19.355] } [13:13:19.355] sendCondition <<- function(cond) NULL [13:13:19.355] } [13:13:19.355] }) [13:13:19.355] withCallingHandlers({ [13:13:19.355] { [13:13:19.355] do.call(function(...) { [13:13:19.355] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:19.355] if (!identical(...future.globals.maxSize.org, [13:13:19.355] ...future.globals.maxSize)) { [13:13:19.355] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:19.355] on.exit(options(oopts), add = TRUE) [13:13:19.355] } [13:13:19.355] { [13:13:19.355] lapply(seq_along(...future.elements_ii), [13:13:19.355] FUN = function(jj) { [13:13:19.355] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:19.355] ...future.FUN(...future.X_jj, ...) [13:13:19.355] }) [13:13:19.355] } [13:13:19.355] }, args = future.call.arguments) [13:13:19.355] } [13:13:19.355] }, immediateCondition = function(cond) { [13:13:19.355] sendCondition <- ...future.makeSendCondition() [13:13:19.355] sendCondition(cond) [13:13:19.355] muffleCondition <- function (cond, pattern = "^muffle") [13:13:19.355] { [13:13:19.355] inherits <- base::inherits [13:13:19.355] invokeRestart <- base::invokeRestart [13:13:19.355] is.null <- base::is.null [13:13:19.355] muffled <- FALSE [13:13:19.355] if (inherits(cond, "message")) { [13:13:19.355] muffled <- grepl(pattern, "muffleMessage") [13:13:19.355] if (muffled) [13:13:19.355] invokeRestart("muffleMessage") [13:13:19.355] } [13:13:19.355] else if (inherits(cond, "warning")) { [13:13:19.355] muffled <- grepl(pattern, "muffleWarning") [13:13:19.355] if (muffled) [13:13:19.355] invokeRestart("muffleWarning") [13:13:19.355] } [13:13:19.355] else if (inherits(cond, "condition")) { [13:13:19.355] if (!is.null(pattern)) { [13:13:19.355] computeRestarts <- base::computeRestarts [13:13:19.355] grepl <- base::grepl [13:13:19.355] restarts <- computeRestarts(cond) [13:13:19.355] for (restart in restarts) { [13:13:19.355] name <- restart$name [13:13:19.355] if (is.null(name)) [13:13:19.355] next [13:13:19.355] if (!grepl(pattern, name)) [13:13:19.355] next [13:13:19.355] invokeRestart(restart) [13:13:19.355] muffled <- TRUE [13:13:19.355] break [13:13:19.355] } [13:13:19.355] } [13:13:19.355] } [13:13:19.355] invisible(muffled) [13:13:19.355] } [13:13:19.355] muffleCondition(cond) [13:13:19.355] }) [13:13:19.355] })) [13:13:19.355] future::FutureResult(value = ...future.value$value, [13:13:19.355] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:19.355] ...future.rng), globalenv = if (FALSE) [13:13:19.355] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:19.355] ...future.globalenv.names)) [13:13:19.355] else NULL, started = ...future.startTime, version = "1.8") [13:13:19.355] }, condition = base::local({ [13:13:19.355] c <- base::c [13:13:19.355] inherits <- base::inherits [13:13:19.355] invokeRestart <- base::invokeRestart [13:13:19.355] length <- base::length [13:13:19.355] list <- base::list [13:13:19.355] seq.int <- base::seq.int [13:13:19.355] signalCondition <- base::signalCondition [13:13:19.355] sys.calls <- base::sys.calls [13:13:19.355] `[[` <- base::`[[` [13:13:19.355] `+` <- base::`+` [13:13:19.355] `<<-` <- base::`<<-` [13:13:19.355] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:19.355] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:19.355] 3L)] [13:13:19.355] } [13:13:19.355] function(cond) { [13:13:19.355] is_error <- inherits(cond, "error") [13:13:19.355] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:19.355] NULL) [13:13:19.355] if (is_error) { [13:13:19.355] sessionInformation <- function() { [13:13:19.355] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:19.355] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:19.355] search = base::search(), system = base::Sys.info()) [13:13:19.355] } [13:13:19.355] ...future.conditions[[length(...future.conditions) + [13:13:19.355] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:19.355] cond$call), session = sessionInformation(), [13:13:19.355] timestamp = base::Sys.time(), signaled = 0L) [13:13:19.355] signalCondition(cond) [13:13:19.355] } [13:13:19.355] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:19.355] "immediateCondition"))) { [13:13:19.355] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:19.355] ...future.conditions[[length(...future.conditions) + [13:13:19.355] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:19.355] if (TRUE && !signal) { [13:13:19.355] muffleCondition <- function (cond, pattern = "^muffle") [13:13:19.355] { [13:13:19.355] inherits <- base::inherits [13:13:19.355] invokeRestart <- base::invokeRestart [13:13:19.355] is.null <- base::is.null [13:13:19.355] muffled <- FALSE [13:13:19.355] if (inherits(cond, "message")) { [13:13:19.355] muffled <- grepl(pattern, "muffleMessage") [13:13:19.355] if (muffled) [13:13:19.355] invokeRestart("muffleMessage") [13:13:19.355] } [13:13:19.355] else if (inherits(cond, "warning")) { [13:13:19.355] muffled <- grepl(pattern, "muffleWarning") [13:13:19.355] if (muffled) [13:13:19.355] invokeRestart("muffleWarning") [13:13:19.355] } [13:13:19.355] else if (inherits(cond, "condition")) { [13:13:19.355] if (!is.null(pattern)) { [13:13:19.355] computeRestarts <- base::computeRestarts [13:13:19.355] grepl <- base::grepl [13:13:19.355] restarts <- computeRestarts(cond) [13:13:19.355] for (restart in restarts) { [13:13:19.355] name <- restart$name [13:13:19.355] if (is.null(name)) [13:13:19.355] next [13:13:19.355] if (!grepl(pattern, name)) [13:13:19.355] next [13:13:19.355] invokeRestart(restart) [13:13:19.355] muffled <- TRUE [13:13:19.355] break [13:13:19.355] } [13:13:19.355] } [13:13:19.355] } [13:13:19.355] invisible(muffled) [13:13:19.355] } [13:13:19.355] muffleCondition(cond, pattern = "^muffle") [13:13:19.355] } [13:13:19.355] } [13:13:19.355] else { [13:13:19.355] if (TRUE) { [13:13:19.355] muffleCondition <- function (cond, pattern = "^muffle") [13:13:19.355] { [13:13:19.355] inherits <- base::inherits [13:13:19.355] invokeRestart <- base::invokeRestart [13:13:19.355] is.null <- base::is.null [13:13:19.355] muffled <- FALSE [13:13:19.355] if (inherits(cond, "message")) { [13:13:19.355] muffled <- grepl(pattern, "muffleMessage") [13:13:19.355] if (muffled) [13:13:19.355] invokeRestart("muffleMessage") [13:13:19.355] } [13:13:19.355] else if (inherits(cond, "warning")) { [13:13:19.355] muffled <- grepl(pattern, "muffleWarning") [13:13:19.355] if (muffled) [13:13:19.355] invokeRestart("muffleWarning") [13:13:19.355] } [13:13:19.355] else if (inherits(cond, "condition")) { [13:13:19.355] if (!is.null(pattern)) { [13:13:19.355] computeRestarts <- base::computeRestarts [13:13:19.355] grepl <- base::grepl [13:13:19.355] restarts <- computeRestarts(cond) [13:13:19.355] for (restart in restarts) { [13:13:19.355] name <- restart$name [13:13:19.355] if (is.null(name)) [13:13:19.355] next [13:13:19.355] if (!grepl(pattern, name)) [13:13:19.355] next [13:13:19.355] invokeRestart(restart) [13:13:19.355] muffled <- TRUE [13:13:19.355] break [13:13:19.355] } [13:13:19.355] } [13:13:19.355] } [13:13:19.355] invisible(muffled) [13:13:19.355] } [13:13:19.355] muffleCondition(cond, pattern = "^muffle") [13:13:19.355] } [13:13:19.355] } [13:13:19.355] } [13:13:19.355] })) [13:13:19.355] }, error = function(ex) { [13:13:19.355] base::structure(base::list(value = NULL, visible = NULL, [13:13:19.355] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:19.355] ...future.rng), started = ...future.startTime, [13:13:19.355] finished = Sys.time(), session_uuid = NA_character_, [13:13:19.355] version = "1.8"), class = "FutureResult") [13:13:19.355] }, finally = { [13:13:19.355] if (!identical(...future.workdir, getwd())) [13:13:19.355] setwd(...future.workdir) [13:13:19.355] { [13:13:19.355] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:19.355] ...future.oldOptions$nwarnings <- NULL [13:13:19.355] } [13:13:19.355] base::options(...future.oldOptions) [13:13:19.355] if (.Platform$OS.type == "windows") { [13:13:19.355] old_names <- names(...future.oldEnvVars) [13:13:19.355] envs <- base::Sys.getenv() [13:13:19.355] names <- names(envs) [13:13:19.355] common <- intersect(names, old_names) [13:13:19.355] added <- setdiff(names, old_names) [13:13:19.355] removed <- setdiff(old_names, names) [13:13:19.355] changed <- common[...future.oldEnvVars[common] != [13:13:19.355] envs[common]] [13:13:19.355] NAMES <- toupper(changed) [13:13:19.355] args <- list() [13:13:19.355] for (kk in seq_along(NAMES)) { [13:13:19.355] name <- changed[[kk]] [13:13:19.355] NAME <- NAMES[[kk]] [13:13:19.355] if (name != NAME && is.element(NAME, old_names)) [13:13:19.355] next [13:13:19.355] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:19.355] } [13:13:19.355] NAMES <- toupper(added) [13:13:19.355] for (kk in seq_along(NAMES)) { [13:13:19.355] name <- added[[kk]] [13:13:19.355] NAME <- NAMES[[kk]] [13:13:19.355] if (name != NAME && is.element(NAME, old_names)) [13:13:19.355] next [13:13:19.355] args[[name]] <- "" [13:13:19.355] } [13:13:19.355] NAMES <- toupper(removed) [13:13:19.355] for (kk in seq_along(NAMES)) { [13:13:19.355] name <- removed[[kk]] [13:13:19.355] NAME <- NAMES[[kk]] [13:13:19.355] if (name != NAME && is.element(NAME, old_names)) [13:13:19.355] next [13:13:19.355] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:19.355] } [13:13:19.355] if (length(args) > 0) [13:13:19.355] base::do.call(base::Sys.setenv, args = args) [13:13:19.355] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:19.355] } [13:13:19.355] else { [13:13:19.355] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:19.355] } [13:13:19.355] { [13:13:19.355] if (base::length(...future.futureOptionsAdded) > [13:13:19.355] 0L) { [13:13:19.355] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:19.355] base::names(opts) <- ...future.futureOptionsAdded [13:13:19.355] base::options(opts) [13:13:19.355] } [13:13:19.355] { [13:13:19.355] { [13:13:19.355] base::options(mc.cores = ...future.mc.cores.old) [13:13:19.355] NULL [13:13:19.355] } [13:13:19.355] options(future.plan = NULL) [13:13:19.355] if (is.na(NA_character_)) [13:13:19.355] Sys.unsetenv("R_FUTURE_PLAN") [13:13:19.355] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:19.355] future::plan(list(function (..., workers = availableCores(), [13:13:19.355] lazy = FALSE, rscript_libs = .libPaths(), [13:13:19.355] envir = parent.frame()) [13:13:19.355] { [13:13:19.355] if (is.function(workers)) [13:13:19.355] workers <- workers() [13:13:19.355] workers <- structure(as.integer(workers), [13:13:19.355] class = class(workers)) [13:13:19.355] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:19.355] workers >= 1) [13:13:19.355] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:19.355] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:19.355] } [13:13:19.355] future <- MultisessionFuture(..., workers = workers, [13:13:19.355] lazy = lazy, rscript_libs = rscript_libs, [13:13:19.355] envir = envir) [13:13:19.355] if (!future$lazy) [13:13:19.355] future <- run(future) [13:13:19.355] invisible(future) [13:13:19.355] }), .cleanup = FALSE, .init = FALSE) [13:13:19.355] } [13:13:19.355] } [13:13:19.355] } [13:13:19.355] }) [13:13:19.355] if (TRUE) { [13:13:19.355] base::sink(type = "output", split = FALSE) [13:13:19.355] if (TRUE) { [13:13:19.355] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:19.355] } [13:13:19.355] else { [13:13:19.355] ...future.result["stdout"] <- base::list(NULL) [13:13:19.355] } [13:13:19.355] base::close(...future.stdout) [13:13:19.355] ...future.stdout <- NULL [13:13:19.355] } [13:13:19.355] ...future.result$conditions <- ...future.conditions [13:13:19.355] ...future.result$finished <- base::Sys.time() [13:13:19.355] ...future.result [13:13:19.355] } [13:13:19.360] Exporting 5 global objects (1.22 KiB) to cluster node #1 ... [13:13:19.361] Exporting '...future.FUN' (1.22 KiB) to cluster node #1 ... [13:13:19.361] Exporting '...future.FUN' (1.22 KiB) to cluster node #1 ... DONE [13:13:19.361] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:13:19.362] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:13:19.362] Exporting '...future.elements_ii' (64 bytes) to cluster node #1 ... [13:13:19.362] Exporting '...future.elements_ii' (64 bytes) to cluster node #1 ... DONE [13:13:19.363] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:19.363] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:19.363] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:19.364] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:19.364] Exporting 5 global objects (1.22 KiB) to cluster node #1 ... DONE [13:13:19.365] MultisessionFuture started [13:13:19.365] - Launch lazy future ... done [13:13:19.365] run() for 'MultisessionFuture' ... done [13:13:19.365] Created future: [13:13:19.381] receiveMessageFromWorker() for ClusterFuture ... [13:13:19.381] - Validating connection of MultisessionFuture [13:13:19.382] - received message: FutureResult [13:13:19.382] - Received FutureResult [13:13:19.382] - Erased future from FutureRegistry [13:13:19.382] result() for ClusterFuture ... [13:13:19.382] - result already collected: FutureResult [13:13:19.383] result() for ClusterFuture ... done [13:13:19.383] receiveMessageFromWorker() for ClusterFuture ... done [13:13:19.365] MultisessionFuture: [13:13:19.365] Label: 'future_eapply-1' [13:13:19.365] Expression: [13:13:19.365] { [13:13:19.365] do.call(function(...) { [13:13:19.365] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:19.365] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:19.365] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:19.365] on.exit(options(oopts), add = TRUE) [13:13:19.365] } [13:13:19.365] { [13:13:19.365] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:19.365] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:19.365] ...future.FUN(...future.X_jj, ...) [13:13:19.365] }) [13:13:19.365] } [13:13:19.365] }, args = future.call.arguments) [13:13:19.365] } [13:13:19.365] Lazy evaluation: FALSE [13:13:19.365] Asynchronous evaluation: TRUE [13:13:19.365] Local evaluation: TRUE [13:13:19.365] Environment: R_GlobalEnv [13:13:19.365] Capture standard output: TRUE [13:13:19.365] Capture condition classes: 'condition' (excluding 'nothing') [13:13:19.365] Globals: 5 objects totaling 1.28 KiB (function '...future.FUN' of 1.22 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 64 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:13:19.365] Packages: 1 packages ('stats') [13:13:19.365] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:19.365] Resolved: TRUE [13:13:19.365] Value: [13:13:19.365] Conditions captured: [13:13:19.365] Early signaling: FALSE [13:13:19.365] Owner process: 9511365f-3977-b8d2-248f-88bd32fc0252 [13:13:19.365] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:19.383] Chunk #1 of 2 ... DONE [13:13:19.383] Chunk #2 of 2 ... [13:13:19.384] - Finding globals in 'X' for chunk #2 ... [13:13:19.384] getGlobalsAndPackages() ... [13:13:19.384] Searching for globals... [13:13:19.384] [13:13:19.384] Searching for globals ... DONE [13:13:19.385] - globals: [0] [13:13:19.385] getGlobalsAndPackages() ... DONE [13:13:19.385] + additional globals found: [n=0] [13:13:19.385] + additional namespaces needed: [n=0] [13:13:19.385] - Finding globals in 'X' for chunk #2 ... DONE [13:13:19.385] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [13:13:19.385] - seeds: [13:13:19.386] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:19.386] getGlobalsAndPackages() ... [13:13:19.386] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:19.386] Resolving globals: FALSE [13:13:19.386] Tweak future expression to call with '...' arguments ... [13:13:19.386] { [13:13:19.386] do.call(function(...) { [13:13:19.386] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:19.386] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:19.386] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:19.386] on.exit(options(oopts), add = TRUE) [13:13:19.386] } [13:13:19.386] { [13:13:19.386] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:19.386] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:19.386] ...future.FUN(...future.X_jj, ...) [13:13:19.386] }) [13:13:19.386] } [13:13:19.386] }, args = future.call.arguments) [13:13:19.386] } [13:13:19.387] Tweak future expression to call with '...' arguments ... DONE [13:13:19.387] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [13:13:19.388] - packages: [1] 'stats' [13:13:19.388] getGlobalsAndPackages() ... DONE [13:13:19.388] run() for 'Future' ... [13:13:19.388] - state: 'created' [13:13:19.389] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [13:13:19.404] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:19.404] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [13:13:19.405] - Field: 'node' [13:13:19.405] - Field: 'label' [13:13:19.405] - Field: 'local' [13:13:19.405] - Field: 'owner' [13:13:19.405] - Field: 'envir' [13:13:19.405] - Field: 'workers' [13:13:19.406] - Field: 'packages' [13:13:19.406] - Field: 'gc' [13:13:19.406] - Field: 'conditions' [13:13:19.406] - Field: 'persistent' [13:13:19.406] - Field: 'expr' [13:13:19.407] - Field: 'uuid' [13:13:19.407] - Field: 'seed' [13:13:19.407] - Field: 'version' [13:13:19.407] - Field: 'result' [13:13:19.407] - Field: 'asynchronous' [13:13:19.407] - Field: 'calls' [13:13:19.408] - Field: 'globals' [13:13:19.408] - Field: 'stdout' [13:13:19.408] - Field: 'earlySignal' [13:13:19.408] - Field: 'lazy' [13:13:19.408] - Field: 'state' [13:13:19.408] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [13:13:19.409] - Launch lazy future ... [13:13:19.409] Packages needed by the future expression (n = 1): 'stats' [13:13:19.409] Packages needed by future strategies (n = 0): [13:13:19.410] { [13:13:19.410] { [13:13:19.410] { [13:13:19.410] ...future.startTime <- base::Sys.time() [13:13:19.410] { [13:13:19.410] { [13:13:19.410] { [13:13:19.410] { [13:13:19.410] { [13:13:19.410] base::local({ [13:13:19.410] has_future <- base::requireNamespace("future", [13:13:19.410] quietly = TRUE) [13:13:19.410] if (has_future) { [13:13:19.410] ns <- base::getNamespace("future") [13:13:19.410] version <- ns[[".package"]][["version"]] [13:13:19.410] if (is.null(version)) [13:13:19.410] version <- utils::packageVersion("future") [13:13:19.410] } [13:13:19.410] else { [13:13:19.410] version <- NULL [13:13:19.410] } [13:13:19.410] if (!has_future || version < "1.8.0") { [13:13:19.410] info <- base::c(r_version = base::gsub("R version ", [13:13:19.410] "", base::R.version$version.string), [13:13:19.410] platform = base::sprintf("%s (%s-bit)", [13:13:19.410] base::R.version$platform, 8 * [13:13:19.410] base::.Machine$sizeof.pointer), [13:13:19.410] os = base::paste(base::Sys.info()[base::c("sysname", [13:13:19.410] "release", "version")], collapse = " "), [13:13:19.410] hostname = base::Sys.info()[["nodename"]]) [13:13:19.410] info <- base::sprintf("%s: %s", base::names(info), [13:13:19.410] info) [13:13:19.410] info <- base::paste(info, collapse = "; ") [13:13:19.410] if (!has_future) { [13:13:19.410] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [13:13:19.410] info) [13:13:19.410] } [13:13:19.410] else { [13:13:19.410] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [13:13:19.410] info, version) [13:13:19.410] } [13:13:19.410] base::stop(msg) [13:13:19.410] } [13:13:19.410] }) [13:13:19.410] } [13:13:19.410] ...future.mc.cores.old <- base::getOption("mc.cores") [13:13:19.410] base::options(mc.cores = 1L) [13:13:19.410] } [13:13:19.410] base::local({ [13:13:19.410] for (pkg in "stats") { [13:13:19.410] base::loadNamespace(pkg) [13:13:19.410] base::library(pkg, character.only = TRUE) [13:13:19.410] } [13:13:19.410] }) [13:13:19.410] } [13:13:19.410] options(future.plan = NULL) [13:13:19.410] Sys.unsetenv("R_FUTURE_PLAN") [13:13:19.410] future::plan("default", .cleanup = FALSE, .init = FALSE) [13:13:19.410] } [13:13:19.410] ...future.workdir <- getwd() [13:13:19.410] } [13:13:19.410] ...future.oldOptions <- base::as.list(base::.Options) [13:13:19.410] ...future.oldEnvVars <- base::Sys.getenv() [13:13:19.410] } [13:13:19.410] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [13:13:19.410] future.globals.maxSize = 1048576000, future.globals.method = NULL, [13:13:19.410] future.globals.onMissing = NULL, future.globals.onReference = NULL, [13:13:19.410] future.globals.resolve = NULL, future.resolve.recursive = NULL, [13:13:19.410] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [13:13:19.410] future.stdout.windows.reencode = NULL, width = 80L) [13:13:19.410] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [13:13:19.410] base::names(...future.oldOptions)) [13:13:19.410] } [13:13:19.410] if (FALSE) { [13:13:19.410] } [13:13:19.410] else { [13:13:19.410] if (TRUE) { [13:13:19.410] ...future.stdout <- base::rawConnection(base::raw(0L), [13:13:19.410] open = "w") [13:13:19.410] } [13:13:19.410] else { [13:13:19.410] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [13:13:19.410] windows = "NUL", "/dev/null"), open = "w") [13:13:19.410] } [13:13:19.410] base::sink(...future.stdout, type = "output", split = FALSE) [13:13:19.410] base::on.exit(if (!base::is.null(...future.stdout)) { [13:13:19.410] base::sink(type = "output", split = FALSE) [13:13:19.410] base::close(...future.stdout) [13:13:19.410] }, add = TRUE) [13:13:19.410] } [13:13:19.410] ...future.frame <- base::sys.nframe() [13:13:19.410] ...future.conditions <- base::list() [13:13:19.410] ...future.rng <- base::globalenv()$.Random.seed [13:13:19.410] if (FALSE) { [13:13:19.410] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [13:13:19.410] "...future.value", "...future.globalenv.names", ".Random.seed") [13:13:19.410] } [13:13:19.410] ...future.result <- base::tryCatch({ [13:13:19.410] base::withCallingHandlers({ [13:13:19.410] ...future.value <- base::withVisible(base::local({ [13:13:19.410] ...future.makeSendCondition <- local({ [13:13:19.410] sendCondition <- NULL [13:13:19.410] function(frame = 1L) { [13:13:19.410] if (is.function(sendCondition)) [13:13:19.410] return(sendCondition) [13:13:19.410] ns <- getNamespace("parallel") [13:13:19.410] if (exists("sendData", mode = "function", [13:13:19.410] envir = ns)) { [13:13:19.410] parallel_sendData <- get("sendData", mode = "function", [13:13:19.410] envir = ns) [13:13:19.410] envir <- sys.frame(frame) [13:13:19.410] master <- NULL [13:13:19.410] while (!identical(envir, .GlobalEnv) && [13:13:19.410] !identical(envir, emptyenv())) { [13:13:19.410] if (exists("master", mode = "list", envir = envir, [13:13:19.410] inherits = FALSE)) { [13:13:19.410] master <- get("master", mode = "list", [13:13:19.410] envir = envir, inherits = FALSE) [13:13:19.410] if (inherits(master, c("SOCKnode", [13:13:19.410] "SOCK0node"))) { [13:13:19.410] sendCondition <<- function(cond) { [13:13:19.410] data <- list(type = "VALUE", value = cond, [13:13:19.410] success = TRUE) [13:13:19.410] parallel_sendData(master, data) [13:13:19.410] } [13:13:19.410] return(sendCondition) [13:13:19.410] } [13:13:19.410] } [13:13:19.410] frame <- frame + 1L [13:13:19.410] envir <- sys.frame(frame) [13:13:19.410] } [13:13:19.410] } [13:13:19.410] sendCondition <<- function(cond) NULL [13:13:19.410] } [13:13:19.410] }) [13:13:19.410] withCallingHandlers({ [13:13:19.410] { [13:13:19.410] do.call(function(...) { [13:13:19.410] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:19.410] if (!identical(...future.globals.maxSize.org, [13:13:19.410] ...future.globals.maxSize)) { [13:13:19.410] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:19.410] on.exit(options(oopts), add = TRUE) [13:13:19.410] } [13:13:19.410] { [13:13:19.410] lapply(seq_along(...future.elements_ii), [13:13:19.410] FUN = function(jj) { [13:13:19.410] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:19.410] ...future.FUN(...future.X_jj, ...) [13:13:19.410] }) [13:13:19.410] } [13:13:19.410] }, args = future.call.arguments) [13:13:19.410] } [13:13:19.410] }, immediateCondition = function(cond) { [13:13:19.410] sendCondition <- ...future.makeSendCondition() [13:13:19.410] sendCondition(cond) [13:13:19.410] muffleCondition <- function (cond, pattern = "^muffle") [13:13:19.410] { [13:13:19.410] inherits <- base::inherits [13:13:19.410] invokeRestart <- base::invokeRestart [13:13:19.410] is.null <- base::is.null [13:13:19.410] muffled <- FALSE [13:13:19.410] if (inherits(cond, "message")) { [13:13:19.410] muffled <- grepl(pattern, "muffleMessage") [13:13:19.410] if (muffled) [13:13:19.410] invokeRestart("muffleMessage") [13:13:19.410] } [13:13:19.410] else if (inherits(cond, "warning")) { [13:13:19.410] muffled <- grepl(pattern, "muffleWarning") [13:13:19.410] if (muffled) [13:13:19.410] invokeRestart("muffleWarning") [13:13:19.410] } [13:13:19.410] else if (inherits(cond, "condition")) { [13:13:19.410] if (!is.null(pattern)) { [13:13:19.410] computeRestarts <- base::computeRestarts [13:13:19.410] grepl <- base::grepl [13:13:19.410] restarts <- computeRestarts(cond) [13:13:19.410] for (restart in restarts) { [13:13:19.410] name <- restart$name [13:13:19.410] if (is.null(name)) [13:13:19.410] next [13:13:19.410] if (!grepl(pattern, name)) [13:13:19.410] next [13:13:19.410] invokeRestart(restart) [13:13:19.410] muffled <- TRUE [13:13:19.410] break [13:13:19.410] } [13:13:19.410] } [13:13:19.410] } [13:13:19.410] invisible(muffled) [13:13:19.410] } [13:13:19.410] muffleCondition(cond) [13:13:19.410] }) [13:13:19.410] })) [13:13:19.410] future::FutureResult(value = ...future.value$value, [13:13:19.410] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [13:13:19.410] ...future.rng), globalenv = if (FALSE) [13:13:19.410] list(added = base::setdiff(base::names(base::.GlobalEnv), [13:13:19.410] ...future.globalenv.names)) [13:13:19.410] else NULL, started = ...future.startTime, version = "1.8") [13:13:19.410] }, condition = base::local({ [13:13:19.410] c <- base::c [13:13:19.410] inherits <- base::inherits [13:13:19.410] invokeRestart <- base::invokeRestart [13:13:19.410] length <- base::length [13:13:19.410] list <- base::list [13:13:19.410] seq.int <- base::seq.int [13:13:19.410] signalCondition <- base::signalCondition [13:13:19.410] sys.calls <- base::sys.calls [13:13:19.410] `[[` <- base::`[[` [13:13:19.410] `+` <- base::`+` [13:13:19.410] `<<-` <- base::`<<-` [13:13:19.410] sysCalls <- function(calls = sys.calls(), from = 1L) { [13:13:19.410] calls[seq.int(from = from + 12L, to = length(calls) - [13:13:19.410] 3L)] [13:13:19.410] } [13:13:19.410] function(cond) { [13:13:19.410] is_error <- inherits(cond, "error") [13:13:19.410] ignore <- !is_error && !is.null(NULL) && inherits(cond, [13:13:19.410] NULL) [13:13:19.410] if (is_error) { [13:13:19.410] sessionInformation <- function() { [13:13:19.410] list(r = base::R.Version(), locale = base::Sys.getlocale(), [13:13:19.410] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [13:13:19.410] search = base::search(), system = base::Sys.info()) [13:13:19.410] } [13:13:19.410] ...future.conditions[[length(...future.conditions) + [13:13:19.410] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [13:13:19.410] cond$call), session = sessionInformation(), [13:13:19.410] timestamp = base::Sys.time(), signaled = 0L) [13:13:19.410] signalCondition(cond) [13:13:19.410] } [13:13:19.410] else if (!ignore && TRUE && inherits(cond, c("condition", [13:13:19.410] "immediateCondition"))) { [13:13:19.410] signal <- TRUE && inherits(cond, "immediateCondition") [13:13:19.410] ...future.conditions[[length(...future.conditions) + [13:13:19.410] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [13:13:19.410] if (TRUE && !signal) { [13:13:19.410] muffleCondition <- function (cond, pattern = "^muffle") [13:13:19.410] { [13:13:19.410] inherits <- base::inherits [13:13:19.410] invokeRestart <- base::invokeRestart [13:13:19.410] is.null <- base::is.null [13:13:19.410] muffled <- FALSE [13:13:19.410] if (inherits(cond, "message")) { [13:13:19.410] muffled <- grepl(pattern, "muffleMessage") [13:13:19.410] if (muffled) [13:13:19.410] invokeRestart("muffleMessage") [13:13:19.410] } [13:13:19.410] else if (inherits(cond, "warning")) { [13:13:19.410] muffled <- grepl(pattern, "muffleWarning") [13:13:19.410] if (muffled) [13:13:19.410] invokeRestart("muffleWarning") [13:13:19.410] } [13:13:19.410] else if (inherits(cond, "condition")) { [13:13:19.410] if (!is.null(pattern)) { [13:13:19.410] computeRestarts <- base::computeRestarts [13:13:19.410] grepl <- base::grepl [13:13:19.410] restarts <- computeRestarts(cond) [13:13:19.410] for (restart in restarts) { [13:13:19.410] name <- restart$name [13:13:19.410] if (is.null(name)) [13:13:19.410] next [13:13:19.410] if (!grepl(pattern, name)) [13:13:19.410] next [13:13:19.410] invokeRestart(restart) [13:13:19.410] muffled <- TRUE [13:13:19.410] break [13:13:19.410] } [13:13:19.410] } [13:13:19.410] } [13:13:19.410] invisible(muffled) [13:13:19.410] } [13:13:19.410] muffleCondition(cond, pattern = "^muffle") [13:13:19.410] } [13:13:19.410] } [13:13:19.410] else { [13:13:19.410] if (TRUE) { [13:13:19.410] muffleCondition <- function (cond, pattern = "^muffle") [13:13:19.410] { [13:13:19.410] inherits <- base::inherits [13:13:19.410] invokeRestart <- base::invokeRestart [13:13:19.410] is.null <- base::is.null [13:13:19.410] muffled <- FALSE [13:13:19.410] if (inherits(cond, "message")) { [13:13:19.410] muffled <- grepl(pattern, "muffleMessage") [13:13:19.410] if (muffled) [13:13:19.410] invokeRestart("muffleMessage") [13:13:19.410] } [13:13:19.410] else if (inherits(cond, "warning")) { [13:13:19.410] muffled <- grepl(pattern, "muffleWarning") [13:13:19.410] if (muffled) [13:13:19.410] invokeRestart("muffleWarning") [13:13:19.410] } [13:13:19.410] else if (inherits(cond, "condition")) { [13:13:19.410] if (!is.null(pattern)) { [13:13:19.410] computeRestarts <- base::computeRestarts [13:13:19.410] grepl <- base::grepl [13:13:19.410] restarts <- computeRestarts(cond) [13:13:19.410] for (restart in restarts) { [13:13:19.410] name <- restart$name [13:13:19.410] if (is.null(name)) [13:13:19.410] next [13:13:19.410] if (!grepl(pattern, name)) [13:13:19.410] next [13:13:19.410] invokeRestart(restart) [13:13:19.410] muffled <- TRUE [13:13:19.410] break [13:13:19.410] } [13:13:19.410] } [13:13:19.410] } [13:13:19.410] invisible(muffled) [13:13:19.410] } [13:13:19.410] muffleCondition(cond, pattern = "^muffle") [13:13:19.410] } [13:13:19.410] } [13:13:19.410] } [13:13:19.410] })) [13:13:19.410] }, error = function(ex) { [13:13:19.410] base::structure(base::list(value = NULL, visible = NULL, [13:13:19.410] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [13:13:19.410] ...future.rng), started = ...future.startTime, [13:13:19.410] finished = Sys.time(), session_uuid = NA_character_, [13:13:19.410] version = "1.8"), class = "FutureResult") [13:13:19.410] }, finally = { [13:13:19.410] if (!identical(...future.workdir, getwd())) [13:13:19.410] setwd(...future.workdir) [13:13:19.410] { [13:13:19.410] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [13:13:19.410] ...future.oldOptions$nwarnings <- NULL [13:13:19.410] } [13:13:19.410] base::options(...future.oldOptions) [13:13:19.410] if (.Platform$OS.type == "windows") { [13:13:19.410] old_names <- names(...future.oldEnvVars) [13:13:19.410] envs <- base::Sys.getenv() [13:13:19.410] names <- names(envs) [13:13:19.410] common <- intersect(names, old_names) [13:13:19.410] added <- setdiff(names, old_names) [13:13:19.410] removed <- setdiff(old_names, names) [13:13:19.410] changed <- common[...future.oldEnvVars[common] != [13:13:19.410] envs[common]] [13:13:19.410] NAMES <- toupper(changed) [13:13:19.410] args <- list() [13:13:19.410] for (kk in seq_along(NAMES)) { [13:13:19.410] name <- changed[[kk]] [13:13:19.410] NAME <- NAMES[[kk]] [13:13:19.410] if (name != NAME && is.element(NAME, old_names)) [13:13:19.410] next [13:13:19.410] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:19.410] } [13:13:19.410] NAMES <- toupper(added) [13:13:19.410] for (kk in seq_along(NAMES)) { [13:13:19.410] name <- added[[kk]] [13:13:19.410] NAME <- NAMES[[kk]] [13:13:19.410] if (name != NAME && is.element(NAME, old_names)) [13:13:19.410] next [13:13:19.410] args[[name]] <- "" [13:13:19.410] } [13:13:19.410] NAMES <- toupper(removed) [13:13:19.410] for (kk in seq_along(NAMES)) { [13:13:19.410] name <- removed[[kk]] [13:13:19.410] NAME <- NAMES[[kk]] [13:13:19.410] if (name != NAME && is.element(NAME, old_names)) [13:13:19.410] next [13:13:19.410] args[[name]] <- ...future.oldEnvVars[[name]] [13:13:19.410] } [13:13:19.410] if (length(args) > 0) [13:13:19.410] base::do.call(base::Sys.setenv, args = args) [13:13:19.410] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [13:13:19.410] } [13:13:19.410] else { [13:13:19.410] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [13:13:19.410] } [13:13:19.410] { [13:13:19.410] if (base::length(...future.futureOptionsAdded) > [13:13:19.410] 0L) { [13:13:19.410] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [13:13:19.410] base::names(opts) <- ...future.futureOptionsAdded [13:13:19.410] base::options(opts) [13:13:19.410] } [13:13:19.410] { [13:13:19.410] { [13:13:19.410] base::options(mc.cores = ...future.mc.cores.old) [13:13:19.410] NULL [13:13:19.410] } [13:13:19.410] options(future.plan = NULL) [13:13:19.410] if (is.na(NA_character_)) [13:13:19.410] Sys.unsetenv("R_FUTURE_PLAN") [13:13:19.410] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [13:13:19.410] future::plan(list(function (..., workers = availableCores(), [13:13:19.410] lazy = FALSE, rscript_libs = .libPaths(), [13:13:19.410] envir = parent.frame()) [13:13:19.410] { [13:13:19.410] if (is.function(workers)) [13:13:19.410] workers <- workers() [13:13:19.410] workers <- structure(as.integer(workers), [13:13:19.410] class = class(workers)) [13:13:19.410] stop_if_not(length(workers) == 1, is.finite(workers), [13:13:19.410] workers >= 1) [13:13:19.410] if (workers == 1L && !inherits(workers, "AsIs")) { [13:13:19.410] return(sequential(..., lazy = TRUE, envir = envir)) [13:13:19.410] } [13:13:19.410] future <- MultisessionFuture(..., workers = workers, [13:13:19.410] lazy = lazy, rscript_libs = rscript_libs, [13:13:19.410] envir = envir) [13:13:19.410] if (!future$lazy) [13:13:19.410] future <- run(future) [13:13:19.410] invisible(future) [13:13:19.410] }), .cleanup = FALSE, .init = FALSE) [13:13:19.410] } [13:13:19.410] } [13:13:19.410] } [13:13:19.410] }) [13:13:19.410] if (TRUE) { [13:13:19.410] base::sink(type = "output", split = FALSE) [13:13:19.410] if (TRUE) { [13:13:19.410] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [13:13:19.410] } [13:13:19.410] else { [13:13:19.410] ...future.result["stdout"] <- base::list(NULL) [13:13:19.410] } [13:13:19.410] base::close(...future.stdout) [13:13:19.410] ...future.stdout <- NULL [13:13:19.410] } [13:13:19.410] ...future.result$conditions <- ...future.conditions [13:13:19.410] ...future.result$finished <- base::Sys.time() [13:13:19.410] ...future.result [13:13:19.410] } [13:13:19.415] Exporting 5 global objects (1.22 KiB) to cluster node #1 ... [13:13:19.415] Exporting '...future.FUN' (1.22 KiB) to cluster node #1 ... [13:13:19.416] Exporting '...future.FUN' (1.22 KiB) to cluster node #1 ... DONE [13:13:19.416] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... [13:13:19.417] Exporting 'future.call.arguments' (0 bytes) to cluster node #1 ... DONE [13:13:19.417] Exporting '...future.elements_ii' (208 bytes) to cluster node #1 ... [13:13:19.417] Exporting '...future.elements_ii' (208 bytes) to cluster node #1 ... DONE [13:13:19.417] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... [13:13:19.418] Exporting '...future.seeds_ii' (0 bytes) to cluster node #1 ... DONE [13:13:19.418] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... [13:13:19.418] Exporting '...future.globals.maxSize' (0 bytes) to cluster node #1 ... DONE [13:13:19.419] Exporting 5 global objects (1.22 KiB) to cluster node #1 ... DONE [13:13:19.419] MultisessionFuture started [13:13:19.420] - Launch lazy future ... done [13:13:19.420] run() for 'MultisessionFuture' ... done [13:13:19.420] Created future: [13:13:19.436] receiveMessageFromWorker() for ClusterFuture ... [13:13:19.436] - Validating connection of MultisessionFuture [13:13:19.436] - received message: FutureResult [13:13:19.437] - Received FutureResult [13:13:19.437] - Erased future from FutureRegistry [13:13:19.437] result() for ClusterFuture ... [13:13:19.437] - result already collected: FutureResult [13:13:19.437] result() for ClusterFuture ... done [13:13:19.438] receiveMessageFromWorker() for ClusterFuture ... done [13:13:19.420] MultisessionFuture: [13:13:19.420] Label: 'future_eapply-2' [13:13:19.420] Expression: [13:13:19.420] { [13:13:19.420] do.call(function(...) { [13:13:19.420] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [13:13:19.420] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [13:13:19.420] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [13:13:19.420] on.exit(options(oopts), add = TRUE) [13:13:19.420] } [13:13:19.420] { [13:13:19.420] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [13:13:19.420] ...future.X_jj <- ...future.elements_ii[[jj]] [13:13:19.420] ...future.FUN(...future.X_jj, ...) [13:13:19.420] }) [13:13:19.420] } [13:13:19.420] }, args = future.call.arguments) [13:13:19.420] } [13:13:19.420] Lazy evaluation: FALSE [13:13:19.420] Asynchronous evaluation: TRUE [13:13:19.420] Local evaluation: TRUE [13:13:19.420] Environment: R_GlobalEnv [13:13:19.420] Capture standard output: TRUE [13:13:19.420] Capture condition classes: 'condition' (excluding 'nothing') [13:13:19.420] Globals: 5 objects totaling 1.42 KiB (function '...future.FUN' of 1.22 KiB, DotDotDotList 'future.call.arguments' of 0 bytes, list '...future.elements_ii' of 208 bytes, NULL '...future.seeds_ii' of 0 bytes, NULL '...future.globals.maxSize' of 0 bytes) [13:13:19.420] Packages: 1 packages ('stats') [13:13:19.420] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [13:13:19.420] Resolved: TRUE [13:13:19.420] Value: [13:13:19.420] Conditions captured: [13:13:19.420] Early signaling: FALSE [13:13:19.420] Owner process: 9511365f-3977-b8d2-248f-88bd32fc0252 [13:13:19.420] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [13:13:19.438] Chunk #2 of 2 ... DONE [13:13:19.438] Launching 2 futures (chunks) ... DONE [13:13:19.438] Resolving 2 futures (chunks) ... [13:13:19.438] resolve() on list ... [13:13:19.439] recursive: 0 [13:13:19.439] length: 2 [13:13:19.439] [13:13:19.439] Future #1 [13:13:19.439] result() for ClusterFuture ... [13:13:19.439] - result already collected: FutureResult [13:13:19.440] result() for ClusterFuture ... done [13:13:19.440] result() for ClusterFuture ... [13:13:19.440] - result already collected: FutureResult [13:13:19.440] result() for ClusterFuture ... done [13:13:19.440] signalConditionsASAP(MultisessionFuture, pos=1) ... [13:13:19.440] - nx: 2 [13:13:19.441] - relay: TRUE [13:13:19.441] - stdout: TRUE [13:13:19.441] - signal: TRUE [13:13:19.441] - resignal: FALSE [13:13:19.441] - force: TRUE [13:13:19.441] - relayed: [n=2] FALSE, FALSE [13:13:19.441] - queued futures: [n=2] FALSE, FALSE [13:13:19.442] - until=1 [13:13:19.442] - relaying element #1 [13:13:19.442] result() for ClusterFuture ... [13:13:19.442] - result already collected: FutureResult [13:13:19.442] result() for ClusterFuture ... done [13:13:19.442] result() for ClusterFuture ... [13:13:19.443] - result already collected: FutureResult [13:13:19.443] result() for ClusterFuture ... done [13:13:19.443] result() for ClusterFuture ... [13:13:19.443] - result already collected: FutureResult [13:13:19.443] result() for ClusterFuture ... done [13:13:19.443] result() for ClusterFuture ... [13:13:19.444] - result already collected: FutureResult [13:13:19.444] result() for ClusterFuture ... done [13:13:19.444] - relayed: [n=2] TRUE, FALSE [13:13:19.444] - queued futures: [n=2] TRUE, FALSE [13:13:19.444] signalConditionsASAP(MultisessionFuture, pos=1) ... done [13:13:19.444] length: 1 (resolved future 1) [13:13:19.445] Future #2 [13:13:19.445] result() for ClusterFuture ... [13:13:19.445] - result already collected: FutureResult [13:13:19.445] result() for ClusterFuture ... done [13:13:19.445] result() for ClusterFuture ... [13:13:19.445] - result already collected: FutureResult [13:13:19.445] result() for ClusterFuture ... done [13:13:19.446] signalConditionsASAP(MultisessionFuture, pos=2) ... [13:13:19.446] - nx: 2 [13:13:19.446] - relay: TRUE [13:13:19.446] - stdout: TRUE [13:13:19.446] - signal: TRUE [13:13:19.446] - resignal: FALSE [13:13:19.447] - force: TRUE [13:13:19.447] - relayed: [n=2] TRUE, FALSE [13:13:19.447] - queued futures: [n=2] TRUE, FALSE [13:13:19.447] - until=2 [13:13:19.447] - relaying element #2 [13:13:19.447] result() for ClusterFuture ... [13:13:19.448] - result already collected: FutureResult [13:13:19.448] result() for ClusterFuture ... done [13:13:19.448] result() for ClusterFuture ... [13:13:19.448] - result already collected: FutureResult [13:13:19.448] result() for ClusterFuture ... done [13:13:19.448] result() for ClusterFuture ... [13:13:19.449] - result already collected: FutureResult [13:13:19.449] result() for ClusterFuture ... done [13:13:19.449] result() for ClusterFuture ... [13:13:19.449] - result already collected: FutureResult [13:13:19.449] result() for ClusterFuture ... done [13:13:19.449] - relayed: [n=2] TRUE, TRUE [13:13:19.449] - queued futures: [n=2] TRUE, TRUE [13:13:19.450] signalConditionsASAP(MultisessionFuture, pos=2) ... done [13:13:19.450] length: 0 (resolved future 2) [13:13:19.450] Relaying remaining futures [13:13:19.450] signalConditionsASAP(NULL, pos=0) ... [13:13:19.450] - nx: 2 [13:13:19.450] - relay: TRUE [13:13:19.451] - stdout: TRUE [13:13:19.451] - signal: TRUE [13:13:19.451] - resignal: FALSE [13:13:19.451] - force: TRUE [13:13:19.451] - relayed: [n=2] TRUE, TRUE [13:13:19.451] - queued futures: [n=2] TRUE, TRUE - flush all [13:13:19.452] - relayed: [n=2] TRUE, TRUE [13:13:19.452] - queued futures: [n=2] TRUE, TRUE [13:13:19.452] signalConditionsASAP(NULL, pos=0) ... done [13:13:19.452] resolve() on list ... DONE [13:13:19.452] result() for ClusterFuture ... [13:13:19.452] - result already collected: FutureResult [13:13:19.453] result() for ClusterFuture ... done [13:13:19.453] result() for ClusterFuture ... [13:13:19.453] - result already collected: FutureResult [13:13:19.453] result() for ClusterFuture ... done [13:13:19.453] result() for ClusterFuture ... [13:13:19.453] - result already collected: FutureResult [13:13:19.454] result() for ClusterFuture ... done [13:13:19.454] result() for ClusterFuture ... [13:13:19.454] - result already collected: FutureResult [13:13:19.454] result() for ClusterFuture ... done [13:13:19.454] - Number of value chunks collected: 2 [13:13:19.454] Resolving 2 futures (chunks) ... DONE [13:13:19.454] Reducing values from 2 chunks ... [13:13:19.455] - Number of values collected after concatenation: 3 [13:13:19.455] - Number of values expected: 3 [13:13:19.455] Reducing values from 2 chunks ... DONE [13:13:19.455] future_lapply() ... DONE [13:13:19.456] plan(): Setting new future strategy stack: [13:13:19.456] List of future strategies: [13:13:19.456] 1. sequential: [13:13:19.456] - args: function (..., envir = parent.frame(), workers = "") [13:13:19.456] - tweaked: FALSE [13:13:19.456] - call: plan(sequential) [13:13:19.457] plan(): nbrOfWorkers() = 1 *** strategy = 'multisession' ... done > > message("*** future_eapply() ... DONE") *** future_eapply() ... DONE > > source("incl/end.R") [13:13:19.458] plan(): Setting new future strategy stack: [13:13:19.458] List of future strategies: [13:13:19.458] 1. FutureStrategy: [13:13:19.458] - args: function (..., envir = parent.frame(), workers = "") [13:13:19.458] - tweaked: FALSE [13:13:19.458] - call: future::plan(oplan) [13:13:19.459] plan(): nbrOfWorkers() = 1 > > proc.time() user system elapsed 1.09 0.09 1.98