R Under development (unstable) (2024-10-26 r87273 ucrt) -- "Unsuffered Consequences" Copyright (C) 2024 The R Foundation for Statistical Computing Platform: x86_64-w64-mingw32/x64 R is free software and comes with ABSOLUTELY NO WARRANTY. You are welcome to redistribute it under certain conditions. Type 'license()' or 'licence()' for distribution details. R is a collaborative project with many contributors. Type 'contributors()' for more information and 'citation()' on how to cite R or R packages in publications. Type 'demo()' for some demos, 'help()' for on-line help, or 'help.start()' for an HTML browser interface to help. Type 'q()' to quit R. > source("incl/start.R") Loading required package: future [18:41:15.878] plan(): Setting new future strategy stack: [18:41:15.879] List of future strategies: [18:41:15.879] 1. sequential: [18:41:15.879] - args: function (..., envir = parent.frame(), workers = "") [18:41:15.879] - tweaked: FALSE [18:41:15.879] - call: future::plan("sequential") [18:41:15.892] plan(): nbrOfWorkers() = 1 > library("listenv") > > message("*** future_lapply() ...") *** future_lapply() ... > > x_a <- list(a = "integer", b = "numeric", c = "character", c = "list") > str(list(x_a = x_a)) List of 1 $ x_a:List of 4 ..$ a: chr "integer" ..$ b: chr "numeric" ..$ c: chr "character" ..$ c: chr "list" > y_a <- lapply(x_a, FUN = base::vector, length = 2L) > str(list(y_a = y_a)) List of 1 $ y_a:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL > > x_b <- list(a = c("hello", b = 1:100)) > str(list(x_b = x_b)) List of 1 $ x_b:List of 1 ..$ a: Named chr [1:101] "hello" "1" "2" "3" ... .. ..- attr(*, "names")= chr [1:101] "" "b1" "b2" "b3" ... > y_b <- lapply(x_b, FUN = future:::hpaste, collapse = "; ", maxHead = 3L) > str(list(y_b = y_b)) List of 1 $ y_b:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" > > x_c <- list() > y_c <- listenv() > y_c$A <- 3L > x_c$a <- y_c > y_c<- listenv() > y_c$A <- 3L > y_c$B <- c("hello", b = 1:100) > x_c$b <- y_c > print(x_c) $a A 'listenv' vector with 1 element ('A'). $b A 'listenv' vector with 2 elements ('A', 'B'). > y_c <- lapply(x_c, FUN = listenv::mapping) > str(list(y_c = y_c)) List of 1 $ y_c:List of 2 ..$ a: Named chr "A" .. ..- attr(*, "names")= chr "A" ..$ b: Named chr [1:2] "A" "B" .. ..- attr(*, "names")= chr [1:2] "A" "B" > > for (cores in 1:availCores) { + message(sprintf("Testing with %d cores ...", cores)) + options(mc.cores = cores) + strategies <- supportedStrategies(cores) + + for (strategy in supportedStrategies()) { + message(sprintf("- plan('%s') ...", strategy)) + plan(strategy) + + for (scheduling in list(FALSE, TRUE, structure(TRUE, ordering = "random"), structure(TRUE, ordering = function(n) rev(seq_len(n))))) { + message("- future_lapply(x, FUN = vector, ...) ...") + y <- future_lapply(x_a, FUN = vector, length = 2L, future.scheduling = scheduling) + str(list(y = y)) + stopifnot(identical(y, y_a)) + + y <- future_lapply(x_a, FUN = "vector", length = 2L, future.scheduling = scheduling) + str(list(y = y)) + stopifnot(identical(y, y_a)) + + message("- future_lapply(x, FUN = base::vector, ...) ...") + y <- future_lapply(x_a, FUN = base::vector, length = 2L, future.scheduling = scheduling) + str(list(y = y)) + stopifnot(identical(y, y_a)) + + message("- future_lapply(x, FUN = future:::hpaste, ...) ...") + y <- future_lapply(x_b, FUN = future:::hpaste, collapse = "; ", maxHead = 3L, future.scheduling = scheduling) + str(list(y = y)) + stopifnot(identical(y, y_b)) + + message("- future_lapply(x, FUN = listenv::listenv, ...) ...") + y <- future_lapply(x_c, FUN = listenv::mapping, future.scheduling = scheduling) + str(list(y = y)) + stopifnot(identical(y, y_c)) + } ## for (scheduling ...) + + message("- future_lapply(x, FUN, ...) for large length(x) ...") + a <- 3.14 + x_d <- 1:1e4 + y <- future_lapply(x_d, FUN = function(z) sqrt(z + a)) + y <- unlist(y, use.names = FALSE) + stopifnot(all.equal(y, sqrt(x_d + a))) + + message("- future_lapply(x, FUN = table, ...) ...") + x <- list(a = 1:4, b = 5:8) + y0 <- lapply(x, FUN = table) + y1 <- future_lapply(x, FUN = table) + stopifnot(all.equal(y1, y0, check.attributes = FALSE)) ## FIXME + + message("- future_lapply(x, ...) where length(x) != length(as.list(x)) ...") + x <- structure(list(a = 1, b = 2), class = "Foo") + as.list.Foo <- function(x, ...) c(x, c = 3) + y0 <- lapply(x, FUN = length) + stopifnot(identical(y0, list(a = 1L, b = 1L, c = 1L))) + y1 <- future_lapply(x, FUN = length) + stopifnot(identical(y1, y0)) + rm(list = "as.list.Foo") + + message("- future_lapply(x, ...) where x[[i]] subsets via S3 method ...") + x <- structure(list(a = 1, b = 2), class = "Foo") + `[[.Foo` <- function(x, ...) 0 + y0 <- lapply(x, FUN = identity) + stopifnot(identical(y0, list(a = 0, b = 0))) + y1 <- future_lapply(x, FUN = identity) + if (getOption("future.apply.chunkWith", "[[") == "[") { + stopifnot(identical(y1, unclass(x))) + } else { + stopifnot(identical(y1, y0)) + } + rm(list = "[[.Foo") + } ## for (strategy ...) + + message(sprintf("Testing with %d cores ... DONE", cores)) + } ## for (cores ...) Testing with 1 cores ... - plan('sequential') ... [18:41:15.973] plan(): Setting new future strategy stack: [18:41:15.973] List of future strategies: [18:41:15.973] 1. sequential: [18:41:15.973] - args: function (..., envir = parent.frame(), workers = "") [18:41:15.973] - tweaked: FALSE [18:41:15.973] - call: plan(strategy) [18:41:15.986] plan(): nbrOfWorkers() = 1 - future_lapply(x, FUN = vector, ...) ... [18:41:15.986] future_lapply() ... [18:41:15.992] Number of chunks: 4 [18:41:15.993] getGlobalsAndPackagesXApply() ... [18:41:15.993] - future.globals: TRUE [18:41:15.994] getGlobalsAndPackages() ... [18:41:15.994] Searching for globals... [18:41:15.996] - globals found: [2] 'FUN', '.Internal' [18:41:15.996] Searching for globals ... DONE [18:41:15.997] Resolving globals: FALSE [18:41:15.998] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:15.998] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:15.998] - globals: [1] 'FUN' [18:41:15.999] [18:41:15.999] getGlobalsAndPackages() ... DONE [18:41:15.999] - globals found/used: [n=1] 'FUN' [18:41:15.999] - needed namespaces: [n=0] [18:41:15.999] Finding globals ... DONE [18:41:15.999] - use_args: TRUE [18:41:16.000] - Getting '...' globals ... [18:41:16.000] resolve() on list ... [18:41:16.001] recursive: 0 [18:41:16.001] length: 1 [18:41:16.001] elements: '...' [18:41:16.001] length: 0 (resolved future 1) [18:41:16.001] resolve() on list ... DONE [18:41:16.002] - '...' content: [n=1] 'length' [18:41:16.002] List of 1 [18:41:16.002] $ ...:List of 1 [18:41:16.002] ..$ length: int 2 [18:41:16.002] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:16.002] - attr(*, "where")=List of 1 [18:41:16.002] ..$ ...: [18:41:16.002] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:16.002] - attr(*, "resolved")= logi TRUE [18:41:16.002] - attr(*, "total_size")= num NA [18:41:16.005] - Getting '...' globals ... DONE [18:41:16.006] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:16.006] List of 2 [18:41:16.006] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:16.006] $ ... :List of 1 [18:41:16.006] ..$ length: int 2 [18:41:16.006] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:16.006] - attr(*, "where")=List of 2 [18:41:16.006] ..$ ...future.FUN: [18:41:16.006] ..$ ... : [18:41:16.006] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:16.006] - attr(*, "resolved")= logi FALSE [18:41:16.006] - attr(*, "total_size")= int 4288 [18:41:16.010] Packages to be attached in all futures: [n=0] [18:41:16.010] getGlobalsAndPackagesXApply() ... DONE [18:41:16.010] Number of futures (= number of chunks): 4 [18:41:16.010] Launching 4 futures (chunks) ... [18:41:16.010] Chunk #1 of 4 ... [18:41:16.011] - Finding globals in 'X' for chunk #1 ... [18:41:16.011] getGlobalsAndPackages() ... [18:41:16.011] Searching for globals... [18:41:16.012] [18:41:16.013] Searching for globals ... DONE [18:41:16.013] - globals: [0] [18:41:16.013] getGlobalsAndPackages() ... DONE [18:41:16.014] + additional globals found: [n=0] [18:41:16.014] + additional namespaces needed: [n=0] [18:41:16.014] - Finding globals in 'X' for chunk #1 ... DONE [18:41:16.014] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:16.014] - seeds: [18:41:16.014] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.015] getGlobalsAndPackages() ... [18:41:16.015] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.015] Resolving globals: FALSE [18:41:16.015] Tweak future expression to call with '...' arguments ... [18:41:16.015] { [18:41:16.015] do.call(function(...) { [18:41:16.015] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.015] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:16.015] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.015] on.exit(options(oopts), add = TRUE) [18:41:16.015] } [18:41:16.015] { [18:41:16.015] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:16.015] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.015] ...future.FUN(...future.X_jj, ...) [18:41:16.015] }) [18:41:16.015] } [18:41:16.015] }, args = future.call.arguments) [18:41:16.015] } [18:41:16.016] Tweak future expression to call with '...' arguments ... DONE [18:41:16.016] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.016] [18:41:16.017] getGlobalsAndPackages() ... DONE [18:41:16.017] run() for 'Future' ... [18:41:16.018] - state: 'created' [18:41:16.018] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:16.018] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:16.018] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:16.019] - Field: 'label' [18:41:16.019] - Field: 'local' [18:41:16.019] - Field: 'owner' [18:41:16.019] - Field: 'envir' [18:41:16.019] - Field: 'packages' [18:41:16.020] - Field: 'gc' [18:41:16.020] - Field: 'conditions' [18:41:16.020] - Field: 'expr' [18:41:16.020] - Field: 'uuid' [18:41:16.020] - Field: 'seed' [18:41:16.020] - Field: 'version' [18:41:16.021] - Field: 'result' [18:41:16.021] - Field: 'asynchronous' [18:41:16.021] - Field: 'calls' [18:41:16.021] - Field: 'globals' [18:41:16.021] - Field: 'stdout' [18:41:16.021] - Field: 'earlySignal' [18:41:16.022] - Field: 'lazy' [18:41:16.022] - Field: 'state' [18:41:16.022] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:16.022] - Launch lazy future ... [18:41:16.023] Packages needed by the future expression (n = 0): [18:41:16.023] Packages needed by future strategies (n = 0): [18:41:16.024] { [18:41:16.024] { [18:41:16.024] { [18:41:16.024] ...future.startTime <- base::Sys.time() [18:41:16.024] { [18:41:16.024] { [18:41:16.024] { [18:41:16.024] base::local({ [18:41:16.024] has_future <- base::requireNamespace("future", [18:41:16.024] quietly = TRUE) [18:41:16.024] if (has_future) { [18:41:16.024] ns <- base::getNamespace("future") [18:41:16.024] version <- ns[[".package"]][["version"]] [18:41:16.024] if (is.null(version)) [18:41:16.024] version <- utils::packageVersion("future") [18:41:16.024] } [18:41:16.024] else { [18:41:16.024] version <- NULL [18:41:16.024] } [18:41:16.024] if (!has_future || version < "1.8.0") { [18:41:16.024] info <- base::c(r_version = base::gsub("R version ", [18:41:16.024] "", base::R.version$version.string), [18:41:16.024] platform = base::sprintf("%s (%s-bit)", [18:41:16.024] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:16.024] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:16.024] "release", "version")], collapse = " "), [18:41:16.024] hostname = base::Sys.info()[["nodename"]]) [18:41:16.024] info <- base::sprintf("%s: %s", base::names(info), [18:41:16.024] info) [18:41:16.024] info <- base::paste(info, collapse = "; ") [18:41:16.024] if (!has_future) { [18:41:16.024] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:16.024] info) [18:41:16.024] } [18:41:16.024] else { [18:41:16.024] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:16.024] info, version) [18:41:16.024] } [18:41:16.024] base::stop(msg) [18:41:16.024] } [18:41:16.024] }) [18:41:16.024] } [18:41:16.024] ...future.strategy.old <- future::plan("list") [18:41:16.024] options(future.plan = NULL) [18:41:16.024] Sys.unsetenv("R_FUTURE_PLAN") [18:41:16.024] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:16.024] } [18:41:16.024] ...future.workdir <- getwd() [18:41:16.024] } [18:41:16.024] ...future.oldOptions <- base::as.list(base::.Options) [18:41:16.024] ...future.oldEnvVars <- base::Sys.getenv() [18:41:16.024] } [18:41:16.024] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:16.024] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:16.024] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:16.024] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:16.024] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:16.024] future.stdout.windows.reencode = NULL, width = 80L) [18:41:16.024] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:16.024] base::names(...future.oldOptions)) [18:41:16.024] } [18:41:16.024] if (FALSE) { [18:41:16.024] } [18:41:16.024] else { [18:41:16.024] if (TRUE) { [18:41:16.024] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:16.024] open = "w") [18:41:16.024] } [18:41:16.024] else { [18:41:16.024] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:16.024] windows = "NUL", "/dev/null"), open = "w") [18:41:16.024] } [18:41:16.024] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:16.024] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:16.024] base::sink(type = "output", split = FALSE) [18:41:16.024] base::close(...future.stdout) [18:41:16.024] }, add = TRUE) [18:41:16.024] } [18:41:16.024] ...future.frame <- base::sys.nframe() [18:41:16.024] ...future.conditions <- base::list() [18:41:16.024] ...future.rng <- base::globalenv()$.Random.seed [18:41:16.024] if (FALSE) { [18:41:16.024] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:16.024] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:16.024] } [18:41:16.024] ...future.result <- base::tryCatch({ [18:41:16.024] base::withCallingHandlers({ [18:41:16.024] ...future.value <- base::withVisible(base::local({ [18:41:16.024] do.call(function(...) { [18:41:16.024] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.024] if (!identical(...future.globals.maxSize.org, [18:41:16.024] ...future.globals.maxSize)) { [18:41:16.024] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.024] on.exit(options(oopts), add = TRUE) [18:41:16.024] } [18:41:16.024] { [18:41:16.024] lapply(seq_along(...future.elements_ii), [18:41:16.024] FUN = function(jj) { [18:41:16.024] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.024] ...future.FUN(...future.X_jj, ...) [18:41:16.024] }) [18:41:16.024] } [18:41:16.024] }, args = future.call.arguments) [18:41:16.024] })) [18:41:16.024] future::FutureResult(value = ...future.value$value, [18:41:16.024] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:16.024] ...future.rng), globalenv = if (FALSE) [18:41:16.024] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:16.024] ...future.globalenv.names)) [18:41:16.024] else NULL, started = ...future.startTime, version = "1.8") [18:41:16.024] }, condition = base::local({ [18:41:16.024] c <- base::c [18:41:16.024] inherits <- base::inherits [18:41:16.024] invokeRestart <- base::invokeRestart [18:41:16.024] length <- base::length [18:41:16.024] list <- base::list [18:41:16.024] seq.int <- base::seq.int [18:41:16.024] signalCondition <- base::signalCondition [18:41:16.024] sys.calls <- base::sys.calls [18:41:16.024] `[[` <- base::`[[` [18:41:16.024] `+` <- base::`+` [18:41:16.024] `<<-` <- base::`<<-` [18:41:16.024] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:16.024] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:16.024] 3L)] [18:41:16.024] } [18:41:16.024] function(cond) { [18:41:16.024] is_error <- inherits(cond, "error") [18:41:16.024] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:16.024] NULL) [18:41:16.024] if (is_error) { [18:41:16.024] sessionInformation <- function() { [18:41:16.024] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:16.024] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:16.024] search = base::search(), system = base::Sys.info()) [18:41:16.024] } [18:41:16.024] ...future.conditions[[length(...future.conditions) + [18:41:16.024] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:16.024] cond$call), session = sessionInformation(), [18:41:16.024] timestamp = base::Sys.time(), signaled = 0L) [18:41:16.024] signalCondition(cond) [18:41:16.024] } [18:41:16.024] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:16.024] "immediateCondition"))) { [18:41:16.024] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:16.024] ...future.conditions[[length(...future.conditions) + [18:41:16.024] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:16.024] if (TRUE && !signal) { [18:41:16.024] muffleCondition <- function (cond, pattern = "^muffle") [18:41:16.024] { [18:41:16.024] inherits <- base::inherits [18:41:16.024] invokeRestart <- base::invokeRestart [18:41:16.024] is.null <- base::is.null [18:41:16.024] muffled <- FALSE [18:41:16.024] if (inherits(cond, "message")) { [18:41:16.024] muffled <- grepl(pattern, "muffleMessage") [18:41:16.024] if (muffled) [18:41:16.024] invokeRestart("muffleMessage") [18:41:16.024] } [18:41:16.024] else if (inherits(cond, "warning")) { [18:41:16.024] muffled <- grepl(pattern, "muffleWarning") [18:41:16.024] if (muffled) [18:41:16.024] invokeRestart("muffleWarning") [18:41:16.024] } [18:41:16.024] else if (inherits(cond, "condition")) { [18:41:16.024] if (!is.null(pattern)) { [18:41:16.024] computeRestarts <- base::computeRestarts [18:41:16.024] grepl <- base::grepl [18:41:16.024] restarts <- computeRestarts(cond) [18:41:16.024] for (restart in restarts) { [18:41:16.024] name <- restart$name [18:41:16.024] if (is.null(name)) [18:41:16.024] next [18:41:16.024] if (!grepl(pattern, name)) [18:41:16.024] next [18:41:16.024] invokeRestart(restart) [18:41:16.024] muffled <- TRUE [18:41:16.024] break [18:41:16.024] } [18:41:16.024] } [18:41:16.024] } [18:41:16.024] invisible(muffled) [18:41:16.024] } [18:41:16.024] muffleCondition(cond, pattern = "^muffle") [18:41:16.024] } [18:41:16.024] } [18:41:16.024] else { [18:41:16.024] if (TRUE) { [18:41:16.024] muffleCondition <- function (cond, pattern = "^muffle") [18:41:16.024] { [18:41:16.024] inherits <- base::inherits [18:41:16.024] invokeRestart <- base::invokeRestart [18:41:16.024] is.null <- base::is.null [18:41:16.024] muffled <- FALSE [18:41:16.024] if (inherits(cond, "message")) { [18:41:16.024] muffled <- grepl(pattern, "muffleMessage") [18:41:16.024] if (muffled) [18:41:16.024] invokeRestart("muffleMessage") [18:41:16.024] } [18:41:16.024] else if (inherits(cond, "warning")) { [18:41:16.024] muffled <- grepl(pattern, "muffleWarning") [18:41:16.024] if (muffled) [18:41:16.024] invokeRestart("muffleWarning") [18:41:16.024] } [18:41:16.024] else if (inherits(cond, "condition")) { [18:41:16.024] if (!is.null(pattern)) { [18:41:16.024] computeRestarts <- base::computeRestarts [18:41:16.024] grepl <- base::grepl [18:41:16.024] restarts <- computeRestarts(cond) [18:41:16.024] for (restart in restarts) { [18:41:16.024] name <- restart$name [18:41:16.024] if (is.null(name)) [18:41:16.024] next [18:41:16.024] if (!grepl(pattern, name)) [18:41:16.024] next [18:41:16.024] invokeRestart(restart) [18:41:16.024] muffled <- TRUE [18:41:16.024] break [18:41:16.024] } [18:41:16.024] } [18:41:16.024] } [18:41:16.024] invisible(muffled) [18:41:16.024] } [18:41:16.024] muffleCondition(cond, pattern = "^muffle") [18:41:16.024] } [18:41:16.024] } [18:41:16.024] } [18:41:16.024] })) [18:41:16.024] }, error = function(ex) { [18:41:16.024] base::structure(base::list(value = NULL, visible = NULL, [18:41:16.024] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:16.024] ...future.rng), started = ...future.startTime, [18:41:16.024] finished = Sys.time(), session_uuid = NA_character_, [18:41:16.024] version = "1.8"), class = "FutureResult") [18:41:16.024] }, finally = { [18:41:16.024] if (!identical(...future.workdir, getwd())) [18:41:16.024] setwd(...future.workdir) [18:41:16.024] { [18:41:16.024] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:16.024] ...future.oldOptions$nwarnings <- NULL [18:41:16.024] } [18:41:16.024] base::options(...future.oldOptions) [18:41:16.024] if (.Platform$OS.type == "windows") { [18:41:16.024] old_names <- names(...future.oldEnvVars) [18:41:16.024] envs <- base::Sys.getenv() [18:41:16.024] names <- names(envs) [18:41:16.024] common <- intersect(names, old_names) [18:41:16.024] added <- setdiff(names, old_names) [18:41:16.024] removed <- setdiff(old_names, names) [18:41:16.024] changed <- common[...future.oldEnvVars[common] != [18:41:16.024] envs[common]] [18:41:16.024] NAMES <- toupper(changed) [18:41:16.024] args <- list() [18:41:16.024] for (kk in seq_along(NAMES)) { [18:41:16.024] name <- changed[[kk]] [18:41:16.024] NAME <- NAMES[[kk]] [18:41:16.024] if (name != NAME && is.element(NAME, old_names)) [18:41:16.024] next [18:41:16.024] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:16.024] } [18:41:16.024] NAMES <- toupper(added) [18:41:16.024] for (kk in seq_along(NAMES)) { [18:41:16.024] name <- added[[kk]] [18:41:16.024] NAME <- NAMES[[kk]] [18:41:16.024] if (name != NAME && is.element(NAME, old_names)) [18:41:16.024] next [18:41:16.024] args[[name]] <- "" [18:41:16.024] } [18:41:16.024] NAMES <- toupper(removed) [18:41:16.024] for (kk in seq_along(NAMES)) { [18:41:16.024] name <- removed[[kk]] [18:41:16.024] NAME <- NAMES[[kk]] [18:41:16.024] if (name != NAME && is.element(NAME, old_names)) [18:41:16.024] next [18:41:16.024] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:16.024] } [18:41:16.024] if (length(args) > 0) [18:41:16.024] base::do.call(base::Sys.setenv, args = args) [18:41:16.024] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:16.024] } [18:41:16.024] else { [18:41:16.024] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:16.024] } [18:41:16.024] { [18:41:16.024] if (base::length(...future.futureOptionsAdded) > [18:41:16.024] 0L) { [18:41:16.024] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:16.024] base::names(opts) <- ...future.futureOptionsAdded [18:41:16.024] base::options(opts) [18:41:16.024] } [18:41:16.024] { [18:41:16.024] { [18:41:16.024] NULL [18:41:16.024] RNGkind("Mersenne-Twister") [18:41:16.024] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:16.024] inherits = FALSE) [18:41:16.024] } [18:41:16.024] options(future.plan = NULL) [18:41:16.024] if (is.na(NA_character_)) [18:41:16.024] Sys.unsetenv("R_FUTURE_PLAN") [18:41:16.024] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:16.024] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:16.024] .init = FALSE) [18:41:16.024] } [18:41:16.024] } [18:41:16.024] } [18:41:16.024] }) [18:41:16.024] if (TRUE) { [18:41:16.024] base::sink(type = "output", split = FALSE) [18:41:16.024] if (TRUE) { [18:41:16.024] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:16.024] } [18:41:16.024] else { [18:41:16.024] ...future.result["stdout"] <- base::list(NULL) [18:41:16.024] } [18:41:16.024] base::close(...future.stdout) [18:41:16.024] ...future.stdout <- NULL [18:41:16.024] } [18:41:16.024] ...future.result$conditions <- ...future.conditions [18:41:16.024] ...future.result$finished <- base::Sys.time() [18:41:16.024] ...future.result [18:41:16.024] } [18:41:16.028] assign_globals() ... [18:41:16.028] List of 5 [18:41:16.028] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:16.028] $ future.call.arguments :List of 1 [18:41:16.028] ..$ length: int 2 [18:41:16.028] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:16.028] $ ...future.elements_ii :List of 1 [18:41:16.028] ..$ a: chr "integer" [18:41:16.028] $ ...future.seeds_ii : NULL [18:41:16.028] $ ...future.globals.maxSize: NULL [18:41:16.028] - attr(*, "where")=List of 5 [18:41:16.028] ..$ ...future.FUN : [18:41:16.028] ..$ future.call.arguments : [18:41:16.028] ..$ ...future.elements_ii : [18:41:16.028] ..$ ...future.seeds_ii : [18:41:16.028] ..$ ...future.globals.maxSize: [18:41:16.028] - attr(*, "resolved")= logi FALSE [18:41:16.028] - attr(*, "total_size")= num 4288 [18:41:16.028] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:16.028] - attr(*, "already-done")= logi TRUE [18:41:16.034] - copied '...future.FUN' to environment [18:41:16.034] - copied 'future.call.arguments' to environment [18:41:16.034] - copied '...future.elements_ii' to environment [18:41:16.035] - copied '...future.seeds_ii' to environment [18:41:16.035] - copied '...future.globals.maxSize' to environment [18:41:16.035] assign_globals() ... done [18:41:16.035] plan(): Setting new future strategy stack: [18:41:16.036] List of future strategies: [18:41:16.036] 1. sequential: [18:41:16.036] - args: function (..., envir = parent.frame(), workers = "") [18:41:16.036] - tweaked: FALSE [18:41:16.036] - call: NULL [18:41:16.036] plan(): nbrOfWorkers() = 1 [18:41:16.038] plan(): Setting new future strategy stack: [18:41:16.039] List of future strategies: [18:41:16.039] 1. sequential: [18:41:16.039] - args: function (..., envir = parent.frame(), workers = "") [18:41:16.039] - tweaked: FALSE [18:41:16.039] - call: plan(strategy) [18:41:16.039] plan(): nbrOfWorkers() = 1 [18:41:16.040] SequentialFuture started (and completed) [18:41:16.040] - Launch lazy future ... done [18:41:16.040] run() for 'SequentialFuture' ... done [18:41:16.040] Created future: [18:41:16.041] SequentialFuture: [18:41:16.041] Label: 'future_lapply-1' [18:41:16.041] Expression: [18:41:16.041] { [18:41:16.041] do.call(function(...) { [18:41:16.041] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.041] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:16.041] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.041] on.exit(options(oopts), add = TRUE) [18:41:16.041] } [18:41:16.041] { [18:41:16.041] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:16.041] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.041] ...future.FUN(...future.X_jj, ...) [18:41:16.041] }) [18:41:16.041] } [18:41:16.041] }, args = future.call.arguments) [18:41:16.041] } [18:41:16.041] Lazy evaluation: FALSE [18:41:16.041] Asynchronous evaluation: FALSE [18:41:16.041] Local evaluation: TRUE [18:41:16.041] Environment: R_GlobalEnv [18:41:16.041] Capture standard output: TRUE [18:41:16.041] Capture condition classes: 'condition' (excluding 'nothing') [18:41:16.041] Globals: 5 objects totaling 758 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 96 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:16.041] Packages: [18:41:16.041] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:16.041] Resolved: TRUE [18:41:16.041] Value: 47 bytes of class 'list' [18:41:16.041] Early signaling: FALSE [18:41:16.041] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:16.041] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:16.042] Chunk #1 of 4 ... DONE [18:41:16.042] Chunk #2 of 4 ... [18:41:16.044] - Finding globals in 'X' for chunk #2 ... [18:41:16.044] getGlobalsAndPackages() ... [18:41:16.044] Searching for globals... [18:41:16.044] [18:41:16.044] Searching for globals ... DONE [18:41:16.045] - globals: [0] [18:41:16.045] getGlobalsAndPackages() ... DONE [18:41:16.045] + additional globals found: [n=0] [18:41:16.045] + additional namespaces needed: [n=0] [18:41:16.045] - Finding globals in 'X' for chunk #2 ... DONE [18:41:16.045] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:16.045] - seeds: [18:41:16.046] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.046] getGlobalsAndPackages() ... [18:41:16.046] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.046] Resolving globals: FALSE [18:41:16.046] Tweak future expression to call with '...' arguments ... [18:41:16.046] { [18:41:16.046] do.call(function(...) { [18:41:16.046] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.046] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:16.046] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.046] on.exit(options(oopts), add = TRUE) [18:41:16.046] } [18:41:16.046] { [18:41:16.046] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:16.046] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.046] ...future.FUN(...future.X_jj, ...) [18:41:16.046] }) [18:41:16.046] } [18:41:16.046] }, args = future.call.arguments) [18:41:16.046] } [18:41:16.047] Tweak future expression to call with '...' arguments ... DONE [18:41:16.047] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.048] [18:41:16.048] getGlobalsAndPackages() ... DONE [18:41:16.048] run() for 'Future' ... [18:41:16.048] - state: 'created' [18:41:16.049] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:16.049] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:16.049] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:16.049] - Field: 'label' [18:41:16.049] - Field: 'local' [18:41:16.050] - Field: 'owner' [18:41:16.050] - Field: 'envir' [18:41:16.050] - Field: 'packages' [18:41:16.050] - Field: 'gc' [18:41:16.050] - Field: 'conditions' [18:41:16.051] - Field: 'expr' [18:41:16.051] - Field: 'uuid' [18:41:16.051] - Field: 'seed' [18:41:16.051] - Field: 'version' [18:41:16.051] - Field: 'result' [18:41:16.051] - Field: 'asynchronous' [18:41:16.052] - Field: 'calls' [18:41:16.052] - Field: 'globals' [18:41:16.052] - Field: 'stdout' [18:41:16.052] - Field: 'earlySignal' [18:41:16.052] - Field: 'lazy' [18:41:16.052] - Field: 'state' [18:41:16.053] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:16.053] - Launch lazy future ... [18:41:16.053] Packages needed by the future expression (n = 0): [18:41:16.053] Packages needed by future strategies (n = 0): [18:41:16.054] { [18:41:16.054] { [18:41:16.054] { [18:41:16.054] ...future.startTime <- base::Sys.time() [18:41:16.054] { [18:41:16.054] { [18:41:16.054] { [18:41:16.054] base::local({ [18:41:16.054] has_future <- base::requireNamespace("future", [18:41:16.054] quietly = TRUE) [18:41:16.054] if (has_future) { [18:41:16.054] ns <- base::getNamespace("future") [18:41:16.054] version <- ns[[".package"]][["version"]] [18:41:16.054] if (is.null(version)) [18:41:16.054] version <- utils::packageVersion("future") [18:41:16.054] } [18:41:16.054] else { [18:41:16.054] version <- NULL [18:41:16.054] } [18:41:16.054] if (!has_future || version < "1.8.0") { [18:41:16.054] info <- base::c(r_version = base::gsub("R version ", [18:41:16.054] "", base::R.version$version.string), [18:41:16.054] platform = base::sprintf("%s (%s-bit)", [18:41:16.054] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:16.054] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:16.054] "release", "version")], collapse = " "), [18:41:16.054] hostname = base::Sys.info()[["nodename"]]) [18:41:16.054] info <- base::sprintf("%s: %s", base::names(info), [18:41:16.054] info) [18:41:16.054] info <- base::paste(info, collapse = "; ") [18:41:16.054] if (!has_future) { [18:41:16.054] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:16.054] info) [18:41:16.054] } [18:41:16.054] else { [18:41:16.054] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:16.054] info, version) [18:41:16.054] } [18:41:16.054] base::stop(msg) [18:41:16.054] } [18:41:16.054] }) [18:41:16.054] } [18:41:16.054] ...future.strategy.old <- future::plan("list") [18:41:16.054] options(future.plan = NULL) [18:41:16.054] Sys.unsetenv("R_FUTURE_PLAN") [18:41:16.054] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:16.054] } [18:41:16.054] ...future.workdir <- getwd() [18:41:16.054] } [18:41:16.054] ...future.oldOptions <- base::as.list(base::.Options) [18:41:16.054] ...future.oldEnvVars <- base::Sys.getenv() [18:41:16.054] } [18:41:16.054] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:16.054] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:16.054] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:16.054] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:16.054] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:16.054] future.stdout.windows.reencode = NULL, width = 80L) [18:41:16.054] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:16.054] base::names(...future.oldOptions)) [18:41:16.054] } [18:41:16.054] if (FALSE) { [18:41:16.054] } [18:41:16.054] else { [18:41:16.054] if (TRUE) { [18:41:16.054] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:16.054] open = "w") [18:41:16.054] } [18:41:16.054] else { [18:41:16.054] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:16.054] windows = "NUL", "/dev/null"), open = "w") [18:41:16.054] } [18:41:16.054] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:16.054] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:16.054] base::sink(type = "output", split = FALSE) [18:41:16.054] base::close(...future.stdout) [18:41:16.054] }, add = TRUE) [18:41:16.054] } [18:41:16.054] ...future.frame <- base::sys.nframe() [18:41:16.054] ...future.conditions <- base::list() [18:41:16.054] ...future.rng <- base::globalenv()$.Random.seed [18:41:16.054] if (FALSE) { [18:41:16.054] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:16.054] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:16.054] } [18:41:16.054] ...future.result <- base::tryCatch({ [18:41:16.054] base::withCallingHandlers({ [18:41:16.054] ...future.value <- base::withVisible(base::local({ [18:41:16.054] do.call(function(...) { [18:41:16.054] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.054] if (!identical(...future.globals.maxSize.org, [18:41:16.054] ...future.globals.maxSize)) { [18:41:16.054] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.054] on.exit(options(oopts), add = TRUE) [18:41:16.054] } [18:41:16.054] { [18:41:16.054] lapply(seq_along(...future.elements_ii), [18:41:16.054] FUN = function(jj) { [18:41:16.054] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.054] ...future.FUN(...future.X_jj, ...) [18:41:16.054] }) [18:41:16.054] } [18:41:16.054] }, args = future.call.arguments) [18:41:16.054] })) [18:41:16.054] future::FutureResult(value = ...future.value$value, [18:41:16.054] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:16.054] ...future.rng), globalenv = if (FALSE) [18:41:16.054] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:16.054] ...future.globalenv.names)) [18:41:16.054] else NULL, started = ...future.startTime, version = "1.8") [18:41:16.054] }, condition = base::local({ [18:41:16.054] c <- base::c [18:41:16.054] inherits <- base::inherits [18:41:16.054] invokeRestart <- base::invokeRestart [18:41:16.054] length <- base::length [18:41:16.054] list <- base::list [18:41:16.054] seq.int <- base::seq.int [18:41:16.054] signalCondition <- base::signalCondition [18:41:16.054] sys.calls <- base::sys.calls [18:41:16.054] `[[` <- base::`[[` [18:41:16.054] `+` <- base::`+` [18:41:16.054] `<<-` <- base::`<<-` [18:41:16.054] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:16.054] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:16.054] 3L)] [18:41:16.054] } [18:41:16.054] function(cond) { [18:41:16.054] is_error <- inherits(cond, "error") [18:41:16.054] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:16.054] NULL) [18:41:16.054] if (is_error) { [18:41:16.054] sessionInformation <- function() { [18:41:16.054] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:16.054] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:16.054] search = base::search(), system = base::Sys.info()) [18:41:16.054] } [18:41:16.054] ...future.conditions[[length(...future.conditions) + [18:41:16.054] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:16.054] cond$call), session = sessionInformation(), [18:41:16.054] timestamp = base::Sys.time(), signaled = 0L) [18:41:16.054] signalCondition(cond) [18:41:16.054] } [18:41:16.054] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:16.054] "immediateCondition"))) { [18:41:16.054] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:16.054] ...future.conditions[[length(...future.conditions) + [18:41:16.054] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:16.054] if (TRUE && !signal) { [18:41:16.054] muffleCondition <- function (cond, pattern = "^muffle") [18:41:16.054] { [18:41:16.054] inherits <- base::inherits [18:41:16.054] invokeRestart <- base::invokeRestart [18:41:16.054] is.null <- base::is.null [18:41:16.054] muffled <- FALSE [18:41:16.054] if (inherits(cond, "message")) { [18:41:16.054] muffled <- grepl(pattern, "muffleMessage") [18:41:16.054] if (muffled) [18:41:16.054] invokeRestart("muffleMessage") [18:41:16.054] } [18:41:16.054] else if (inherits(cond, "warning")) { [18:41:16.054] muffled <- grepl(pattern, "muffleWarning") [18:41:16.054] if (muffled) [18:41:16.054] invokeRestart("muffleWarning") [18:41:16.054] } [18:41:16.054] else if (inherits(cond, "condition")) { [18:41:16.054] if (!is.null(pattern)) { [18:41:16.054] computeRestarts <- base::computeRestarts [18:41:16.054] grepl <- base::grepl [18:41:16.054] restarts <- computeRestarts(cond) [18:41:16.054] for (restart in restarts) { [18:41:16.054] name <- restart$name [18:41:16.054] if (is.null(name)) [18:41:16.054] next [18:41:16.054] if (!grepl(pattern, name)) [18:41:16.054] next [18:41:16.054] invokeRestart(restart) [18:41:16.054] muffled <- TRUE [18:41:16.054] break [18:41:16.054] } [18:41:16.054] } [18:41:16.054] } [18:41:16.054] invisible(muffled) [18:41:16.054] } [18:41:16.054] muffleCondition(cond, pattern = "^muffle") [18:41:16.054] } [18:41:16.054] } [18:41:16.054] else { [18:41:16.054] if (TRUE) { [18:41:16.054] muffleCondition <- function (cond, pattern = "^muffle") [18:41:16.054] { [18:41:16.054] inherits <- base::inherits [18:41:16.054] invokeRestart <- base::invokeRestart [18:41:16.054] is.null <- base::is.null [18:41:16.054] muffled <- FALSE [18:41:16.054] if (inherits(cond, "message")) { [18:41:16.054] muffled <- grepl(pattern, "muffleMessage") [18:41:16.054] if (muffled) [18:41:16.054] invokeRestart("muffleMessage") [18:41:16.054] } [18:41:16.054] else if (inherits(cond, "warning")) { [18:41:16.054] muffled <- grepl(pattern, "muffleWarning") [18:41:16.054] if (muffled) [18:41:16.054] invokeRestart("muffleWarning") [18:41:16.054] } [18:41:16.054] else if (inherits(cond, "condition")) { [18:41:16.054] if (!is.null(pattern)) { [18:41:16.054] computeRestarts <- base::computeRestarts [18:41:16.054] grepl <- base::grepl [18:41:16.054] restarts <- computeRestarts(cond) [18:41:16.054] for (restart in restarts) { [18:41:16.054] name <- restart$name [18:41:16.054] if (is.null(name)) [18:41:16.054] next [18:41:16.054] if (!grepl(pattern, name)) [18:41:16.054] next [18:41:16.054] invokeRestart(restart) [18:41:16.054] muffled <- TRUE [18:41:16.054] break [18:41:16.054] } [18:41:16.054] } [18:41:16.054] } [18:41:16.054] invisible(muffled) [18:41:16.054] } [18:41:16.054] muffleCondition(cond, pattern = "^muffle") [18:41:16.054] } [18:41:16.054] } [18:41:16.054] } [18:41:16.054] })) [18:41:16.054] }, error = function(ex) { [18:41:16.054] base::structure(base::list(value = NULL, visible = NULL, [18:41:16.054] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:16.054] ...future.rng), started = ...future.startTime, [18:41:16.054] finished = Sys.time(), session_uuid = NA_character_, [18:41:16.054] version = "1.8"), class = "FutureResult") [18:41:16.054] }, finally = { [18:41:16.054] if (!identical(...future.workdir, getwd())) [18:41:16.054] setwd(...future.workdir) [18:41:16.054] { [18:41:16.054] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:16.054] ...future.oldOptions$nwarnings <- NULL [18:41:16.054] } [18:41:16.054] base::options(...future.oldOptions) [18:41:16.054] if (.Platform$OS.type == "windows") { [18:41:16.054] old_names <- names(...future.oldEnvVars) [18:41:16.054] envs <- base::Sys.getenv() [18:41:16.054] names <- names(envs) [18:41:16.054] common <- intersect(names, old_names) [18:41:16.054] added <- setdiff(names, old_names) [18:41:16.054] removed <- setdiff(old_names, names) [18:41:16.054] changed <- common[...future.oldEnvVars[common] != [18:41:16.054] envs[common]] [18:41:16.054] NAMES <- toupper(changed) [18:41:16.054] args <- list() [18:41:16.054] for (kk in seq_along(NAMES)) { [18:41:16.054] name <- changed[[kk]] [18:41:16.054] NAME <- NAMES[[kk]] [18:41:16.054] if (name != NAME && is.element(NAME, old_names)) [18:41:16.054] next [18:41:16.054] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:16.054] } [18:41:16.054] NAMES <- toupper(added) [18:41:16.054] for (kk in seq_along(NAMES)) { [18:41:16.054] name <- added[[kk]] [18:41:16.054] NAME <- NAMES[[kk]] [18:41:16.054] if (name != NAME && is.element(NAME, old_names)) [18:41:16.054] next [18:41:16.054] args[[name]] <- "" [18:41:16.054] } [18:41:16.054] NAMES <- toupper(removed) [18:41:16.054] for (kk in seq_along(NAMES)) { [18:41:16.054] name <- removed[[kk]] [18:41:16.054] NAME <- NAMES[[kk]] [18:41:16.054] if (name != NAME && is.element(NAME, old_names)) [18:41:16.054] next [18:41:16.054] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:16.054] } [18:41:16.054] if (length(args) > 0) [18:41:16.054] base::do.call(base::Sys.setenv, args = args) [18:41:16.054] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:16.054] } [18:41:16.054] else { [18:41:16.054] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:16.054] } [18:41:16.054] { [18:41:16.054] if (base::length(...future.futureOptionsAdded) > [18:41:16.054] 0L) { [18:41:16.054] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:16.054] base::names(opts) <- ...future.futureOptionsAdded [18:41:16.054] base::options(opts) [18:41:16.054] } [18:41:16.054] { [18:41:16.054] { [18:41:16.054] NULL [18:41:16.054] RNGkind("Mersenne-Twister") [18:41:16.054] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:16.054] inherits = FALSE) [18:41:16.054] } [18:41:16.054] options(future.plan = NULL) [18:41:16.054] if (is.na(NA_character_)) [18:41:16.054] Sys.unsetenv("R_FUTURE_PLAN") [18:41:16.054] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:16.054] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:16.054] .init = FALSE) [18:41:16.054] } [18:41:16.054] } [18:41:16.054] } [18:41:16.054] }) [18:41:16.054] if (TRUE) { [18:41:16.054] base::sink(type = "output", split = FALSE) [18:41:16.054] if (TRUE) { [18:41:16.054] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:16.054] } [18:41:16.054] else { [18:41:16.054] ...future.result["stdout"] <- base::list(NULL) [18:41:16.054] } [18:41:16.054] base::close(...future.stdout) [18:41:16.054] ...future.stdout <- NULL [18:41:16.054] } [18:41:16.054] ...future.result$conditions <- ...future.conditions [18:41:16.054] ...future.result$finished <- base::Sys.time() [18:41:16.054] ...future.result [18:41:16.054] } [18:41:16.057] assign_globals() ... [18:41:16.058] List of 5 [18:41:16.058] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:16.058] $ future.call.arguments :List of 1 [18:41:16.058] ..$ length: int 2 [18:41:16.058] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:16.058] $ ...future.elements_ii :List of 1 [18:41:16.058] ..$ b: chr "numeric" [18:41:16.058] $ ...future.seeds_ii : NULL [18:41:16.058] $ ...future.globals.maxSize: NULL [18:41:16.058] - attr(*, "where")=List of 5 [18:41:16.058] ..$ ...future.FUN : [18:41:16.058] ..$ future.call.arguments : [18:41:16.058] ..$ ...future.elements_ii : [18:41:16.058] ..$ ...future.seeds_ii : [18:41:16.058] ..$ ...future.globals.maxSize: [18:41:16.058] - attr(*, "resolved")= logi FALSE [18:41:16.058] - attr(*, "total_size")= num 4288 [18:41:16.058] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:16.058] - attr(*, "already-done")= logi TRUE [18:41:16.063] - copied '...future.FUN' to environment [18:41:16.064] - copied 'future.call.arguments' to environment [18:41:16.064] - copied '...future.elements_ii' to environment [18:41:16.064] - copied '...future.seeds_ii' to environment [18:41:16.064] - copied '...future.globals.maxSize' to environment [18:41:16.064] assign_globals() ... done [18:41:16.065] plan(): Setting new future strategy stack: [18:41:16.065] List of future strategies: [18:41:16.065] 1. sequential: [18:41:16.065] - args: function (..., envir = parent.frame(), workers = "") [18:41:16.065] - tweaked: FALSE [18:41:16.065] - call: NULL [18:41:16.065] plan(): nbrOfWorkers() = 1 [18:41:16.067] plan(): Setting new future strategy stack: [18:41:16.067] List of future strategies: [18:41:16.067] 1. sequential: [18:41:16.067] - args: function (..., envir = parent.frame(), workers = "") [18:41:16.067] - tweaked: FALSE [18:41:16.067] - call: plan(strategy) [18:41:16.067] plan(): nbrOfWorkers() = 1 [18:41:16.068] SequentialFuture started (and completed) [18:41:16.068] - Launch lazy future ... done [18:41:16.068] run() for 'SequentialFuture' ... done [18:41:16.068] Created future: [18:41:16.068] SequentialFuture: [18:41:16.068] Label: 'future_lapply-2' [18:41:16.068] Expression: [18:41:16.068] { [18:41:16.068] do.call(function(...) { [18:41:16.068] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.068] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:16.068] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.068] on.exit(options(oopts), add = TRUE) [18:41:16.068] } [18:41:16.068] { [18:41:16.068] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:16.068] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.068] ...future.FUN(...future.X_jj, ...) [18:41:16.068] }) [18:41:16.068] } [18:41:16.068] }, args = future.call.arguments) [18:41:16.068] } [18:41:16.068] Lazy evaluation: FALSE [18:41:16.068] Asynchronous evaluation: FALSE [18:41:16.068] Local evaluation: TRUE [18:41:16.068] Environment: R_GlobalEnv [18:41:16.068] Capture standard output: TRUE [18:41:16.068] Capture condition classes: 'condition' (excluding 'nothing') [18:41:16.068] Globals: 5 objects totaling 758 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 96 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:16.068] Packages: [18:41:16.068] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:16.068] Resolved: TRUE [18:41:16.068] Value: 55 bytes of class 'list' [18:41:16.068] Early signaling: FALSE [18:41:16.068] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:16.068] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:16.070] Chunk #2 of 4 ... DONE [18:41:16.070] Chunk #3 of 4 ... [18:41:16.071] - Finding globals in 'X' for chunk #3 ... [18:41:16.071] getGlobalsAndPackages() ... [18:41:16.071] Searching for globals... [18:41:16.071] [18:41:16.071] Searching for globals ... DONE [18:41:16.072] - globals: [0] [18:41:16.072] getGlobalsAndPackages() ... DONE [18:41:16.072] + additional globals found: [n=0] [18:41:16.072] + additional namespaces needed: [n=0] [18:41:16.072] - Finding globals in 'X' for chunk #3 ... DONE [18:41:16.072] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:16.073] - seeds: [18:41:16.073] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.073] getGlobalsAndPackages() ... [18:41:16.073] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.073] Resolving globals: FALSE [18:41:16.073] Tweak future expression to call with '...' arguments ... [18:41:16.074] { [18:41:16.074] do.call(function(...) { [18:41:16.074] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.074] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:16.074] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.074] on.exit(options(oopts), add = TRUE) [18:41:16.074] } [18:41:16.074] { [18:41:16.074] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:16.074] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.074] ...future.FUN(...future.X_jj, ...) [18:41:16.074] }) [18:41:16.074] } [18:41:16.074] }, args = future.call.arguments) [18:41:16.074] } [18:41:16.074] Tweak future expression to call with '...' arguments ... DONE [18:41:16.075] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.075] [18:41:16.075] getGlobalsAndPackages() ... DONE [18:41:16.075] run() for 'Future' ... [18:41:16.075] - state: 'created' [18:41:16.076] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:16.076] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:16.076] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:16.076] - Field: 'label' [18:41:16.076] - Field: 'local' [18:41:16.077] - Field: 'owner' [18:41:16.077] - Field: 'envir' [18:41:16.077] - Field: 'packages' [18:41:16.077] - Field: 'gc' [18:41:16.077] - Field: 'conditions' [18:41:16.078] - Field: 'expr' [18:41:16.078] - Field: 'uuid' [18:41:16.078] - Field: 'seed' [18:41:16.078] - Field: 'version' [18:41:16.078] - Field: 'result' [18:41:16.078] - Field: 'asynchronous' [18:41:16.079] - Field: 'calls' [18:41:16.079] - Field: 'globals' [18:41:16.079] - Field: 'stdout' [18:41:16.079] - Field: 'earlySignal' [18:41:16.079] - Field: 'lazy' [18:41:16.079] - Field: 'state' [18:41:16.080] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:16.080] - Launch lazy future ... [18:41:16.080] Packages needed by the future expression (n = 0): [18:41:16.080] Packages needed by future strategies (n = 0): [18:41:16.081] { [18:41:16.081] { [18:41:16.081] { [18:41:16.081] ...future.startTime <- base::Sys.time() [18:41:16.081] { [18:41:16.081] { [18:41:16.081] { [18:41:16.081] base::local({ [18:41:16.081] has_future <- base::requireNamespace("future", [18:41:16.081] quietly = TRUE) [18:41:16.081] if (has_future) { [18:41:16.081] ns <- base::getNamespace("future") [18:41:16.081] version <- ns[[".package"]][["version"]] [18:41:16.081] if (is.null(version)) [18:41:16.081] version <- utils::packageVersion("future") [18:41:16.081] } [18:41:16.081] else { [18:41:16.081] version <- NULL [18:41:16.081] } [18:41:16.081] if (!has_future || version < "1.8.0") { [18:41:16.081] info <- base::c(r_version = base::gsub("R version ", [18:41:16.081] "", base::R.version$version.string), [18:41:16.081] platform = base::sprintf("%s (%s-bit)", [18:41:16.081] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:16.081] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:16.081] "release", "version")], collapse = " "), [18:41:16.081] hostname = base::Sys.info()[["nodename"]]) [18:41:16.081] info <- base::sprintf("%s: %s", base::names(info), [18:41:16.081] info) [18:41:16.081] info <- base::paste(info, collapse = "; ") [18:41:16.081] if (!has_future) { [18:41:16.081] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:16.081] info) [18:41:16.081] } [18:41:16.081] else { [18:41:16.081] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:16.081] info, version) [18:41:16.081] } [18:41:16.081] base::stop(msg) [18:41:16.081] } [18:41:16.081] }) [18:41:16.081] } [18:41:16.081] ...future.strategy.old <- future::plan("list") [18:41:16.081] options(future.plan = NULL) [18:41:16.081] Sys.unsetenv("R_FUTURE_PLAN") [18:41:16.081] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:16.081] } [18:41:16.081] ...future.workdir <- getwd() [18:41:16.081] } [18:41:16.081] ...future.oldOptions <- base::as.list(base::.Options) [18:41:16.081] ...future.oldEnvVars <- base::Sys.getenv() [18:41:16.081] } [18:41:16.081] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:16.081] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:16.081] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:16.081] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:16.081] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:16.081] future.stdout.windows.reencode = NULL, width = 80L) [18:41:16.081] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:16.081] base::names(...future.oldOptions)) [18:41:16.081] } [18:41:16.081] if (FALSE) { [18:41:16.081] } [18:41:16.081] else { [18:41:16.081] if (TRUE) { [18:41:16.081] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:16.081] open = "w") [18:41:16.081] } [18:41:16.081] else { [18:41:16.081] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:16.081] windows = "NUL", "/dev/null"), open = "w") [18:41:16.081] } [18:41:16.081] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:16.081] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:16.081] base::sink(type = "output", split = FALSE) [18:41:16.081] base::close(...future.stdout) [18:41:16.081] }, add = TRUE) [18:41:16.081] } [18:41:16.081] ...future.frame <- base::sys.nframe() [18:41:16.081] ...future.conditions <- base::list() [18:41:16.081] ...future.rng <- base::globalenv()$.Random.seed [18:41:16.081] if (FALSE) { [18:41:16.081] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:16.081] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:16.081] } [18:41:16.081] ...future.result <- base::tryCatch({ [18:41:16.081] base::withCallingHandlers({ [18:41:16.081] ...future.value <- base::withVisible(base::local({ [18:41:16.081] do.call(function(...) { [18:41:16.081] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.081] if (!identical(...future.globals.maxSize.org, [18:41:16.081] ...future.globals.maxSize)) { [18:41:16.081] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.081] on.exit(options(oopts), add = TRUE) [18:41:16.081] } [18:41:16.081] { [18:41:16.081] lapply(seq_along(...future.elements_ii), [18:41:16.081] FUN = function(jj) { [18:41:16.081] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.081] ...future.FUN(...future.X_jj, ...) [18:41:16.081] }) [18:41:16.081] } [18:41:16.081] }, args = future.call.arguments) [18:41:16.081] })) [18:41:16.081] future::FutureResult(value = ...future.value$value, [18:41:16.081] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:16.081] ...future.rng), globalenv = if (FALSE) [18:41:16.081] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:16.081] ...future.globalenv.names)) [18:41:16.081] else NULL, started = ...future.startTime, version = "1.8") [18:41:16.081] }, condition = base::local({ [18:41:16.081] c <- base::c [18:41:16.081] inherits <- base::inherits [18:41:16.081] invokeRestart <- base::invokeRestart [18:41:16.081] length <- base::length [18:41:16.081] list <- base::list [18:41:16.081] seq.int <- base::seq.int [18:41:16.081] signalCondition <- base::signalCondition [18:41:16.081] sys.calls <- base::sys.calls [18:41:16.081] `[[` <- base::`[[` [18:41:16.081] `+` <- base::`+` [18:41:16.081] `<<-` <- base::`<<-` [18:41:16.081] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:16.081] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:16.081] 3L)] [18:41:16.081] } [18:41:16.081] function(cond) { [18:41:16.081] is_error <- inherits(cond, "error") [18:41:16.081] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:16.081] NULL) [18:41:16.081] if (is_error) { [18:41:16.081] sessionInformation <- function() { [18:41:16.081] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:16.081] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:16.081] search = base::search(), system = base::Sys.info()) [18:41:16.081] } [18:41:16.081] ...future.conditions[[length(...future.conditions) + [18:41:16.081] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:16.081] cond$call), session = sessionInformation(), [18:41:16.081] timestamp = base::Sys.time(), signaled = 0L) [18:41:16.081] signalCondition(cond) [18:41:16.081] } [18:41:16.081] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:16.081] "immediateCondition"))) { [18:41:16.081] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:16.081] ...future.conditions[[length(...future.conditions) + [18:41:16.081] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:16.081] if (TRUE && !signal) { [18:41:16.081] muffleCondition <- function (cond, pattern = "^muffle") [18:41:16.081] { [18:41:16.081] inherits <- base::inherits [18:41:16.081] invokeRestart <- base::invokeRestart [18:41:16.081] is.null <- base::is.null [18:41:16.081] muffled <- FALSE [18:41:16.081] if (inherits(cond, "message")) { [18:41:16.081] muffled <- grepl(pattern, "muffleMessage") [18:41:16.081] if (muffled) [18:41:16.081] invokeRestart("muffleMessage") [18:41:16.081] } [18:41:16.081] else if (inherits(cond, "warning")) { [18:41:16.081] muffled <- grepl(pattern, "muffleWarning") [18:41:16.081] if (muffled) [18:41:16.081] invokeRestart("muffleWarning") [18:41:16.081] } [18:41:16.081] else if (inherits(cond, "condition")) { [18:41:16.081] if (!is.null(pattern)) { [18:41:16.081] computeRestarts <- base::computeRestarts [18:41:16.081] grepl <- base::grepl [18:41:16.081] restarts <- computeRestarts(cond) [18:41:16.081] for (restart in restarts) { [18:41:16.081] name <- restart$name [18:41:16.081] if (is.null(name)) [18:41:16.081] next [18:41:16.081] if (!grepl(pattern, name)) [18:41:16.081] next [18:41:16.081] invokeRestart(restart) [18:41:16.081] muffled <- TRUE [18:41:16.081] break [18:41:16.081] } [18:41:16.081] } [18:41:16.081] } [18:41:16.081] invisible(muffled) [18:41:16.081] } [18:41:16.081] muffleCondition(cond, pattern = "^muffle") [18:41:16.081] } [18:41:16.081] } [18:41:16.081] else { [18:41:16.081] if (TRUE) { [18:41:16.081] muffleCondition <- function (cond, pattern = "^muffle") [18:41:16.081] { [18:41:16.081] inherits <- base::inherits [18:41:16.081] invokeRestart <- base::invokeRestart [18:41:16.081] is.null <- base::is.null [18:41:16.081] muffled <- FALSE [18:41:16.081] if (inherits(cond, "message")) { [18:41:16.081] muffled <- grepl(pattern, "muffleMessage") [18:41:16.081] if (muffled) [18:41:16.081] invokeRestart("muffleMessage") [18:41:16.081] } [18:41:16.081] else if (inherits(cond, "warning")) { [18:41:16.081] muffled <- grepl(pattern, "muffleWarning") [18:41:16.081] if (muffled) [18:41:16.081] invokeRestart("muffleWarning") [18:41:16.081] } [18:41:16.081] else if (inherits(cond, "condition")) { [18:41:16.081] if (!is.null(pattern)) { [18:41:16.081] computeRestarts <- base::computeRestarts [18:41:16.081] grepl <- base::grepl [18:41:16.081] restarts <- computeRestarts(cond) [18:41:16.081] for (restart in restarts) { [18:41:16.081] name <- restart$name [18:41:16.081] if (is.null(name)) [18:41:16.081] next [18:41:16.081] if (!grepl(pattern, name)) [18:41:16.081] next [18:41:16.081] invokeRestart(restart) [18:41:16.081] muffled <- TRUE [18:41:16.081] break [18:41:16.081] } [18:41:16.081] } [18:41:16.081] } [18:41:16.081] invisible(muffled) [18:41:16.081] } [18:41:16.081] muffleCondition(cond, pattern = "^muffle") [18:41:16.081] } [18:41:16.081] } [18:41:16.081] } [18:41:16.081] })) [18:41:16.081] }, error = function(ex) { [18:41:16.081] base::structure(base::list(value = NULL, visible = NULL, [18:41:16.081] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:16.081] ...future.rng), started = ...future.startTime, [18:41:16.081] finished = Sys.time(), session_uuid = NA_character_, [18:41:16.081] version = "1.8"), class = "FutureResult") [18:41:16.081] }, finally = { [18:41:16.081] if (!identical(...future.workdir, getwd())) [18:41:16.081] setwd(...future.workdir) [18:41:16.081] { [18:41:16.081] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:16.081] ...future.oldOptions$nwarnings <- NULL [18:41:16.081] } [18:41:16.081] base::options(...future.oldOptions) [18:41:16.081] if (.Platform$OS.type == "windows") { [18:41:16.081] old_names <- names(...future.oldEnvVars) [18:41:16.081] envs <- base::Sys.getenv() [18:41:16.081] names <- names(envs) [18:41:16.081] common <- intersect(names, old_names) [18:41:16.081] added <- setdiff(names, old_names) [18:41:16.081] removed <- setdiff(old_names, names) [18:41:16.081] changed <- common[...future.oldEnvVars[common] != [18:41:16.081] envs[common]] [18:41:16.081] NAMES <- toupper(changed) [18:41:16.081] args <- list() [18:41:16.081] for (kk in seq_along(NAMES)) { [18:41:16.081] name <- changed[[kk]] [18:41:16.081] NAME <- NAMES[[kk]] [18:41:16.081] if (name != NAME && is.element(NAME, old_names)) [18:41:16.081] next [18:41:16.081] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:16.081] } [18:41:16.081] NAMES <- toupper(added) [18:41:16.081] for (kk in seq_along(NAMES)) { [18:41:16.081] name <- added[[kk]] [18:41:16.081] NAME <- NAMES[[kk]] [18:41:16.081] if (name != NAME && is.element(NAME, old_names)) [18:41:16.081] next [18:41:16.081] args[[name]] <- "" [18:41:16.081] } [18:41:16.081] NAMES <- toupper(removed) [18:41:16.081] for (kk in seq_along(NAMES)) { [18:41:16.081] name <- removed[[kk]] [18:41:16.081] NAME <- NAMES[[kk]] [18:41:16.081] if (name != NAME && is.element(NAME, old_names)) [18:41:16.081] next [18:41:16.081] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:16.081] } [18:41:16.081] if (length(args) > 0) [18:41:16.081] base::do.call(base::Sys.setenv, args = args) [18:41:16.081] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:16.081] } [18:41:16.081] else { [18:41:16.081] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:16.081] } [18:41:16.081] { [18:41:16.081] if (base::length(...future.futureOptionsAdded) > [18:41:16.081] 0L) { [18:41:16.081] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:16.081] base::names(opts) <- ...future.futureOptionsAdded [18:41:16.081] base::options(opts) [18:41:16.081] } [18:41:16.081] { [18:41:16.081] { [18:41:16.081] NULL [18:41:16.081] RNGkind("Mersenne-Twister") [18:41:16.081] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:16.081] inherits = FALSE) [18:41:16.081] } [18:41:16.081] options(future.plan = NULL) [18:41:16.081] if (is.na(NA_character_)) [18:41:16.081] Sys.unsetenv("R_FUTURE_PLAN") [18:41:16.081] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:16.081] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:16.081] .init = FALSE) [18:41:16.081] } [18:41:16.081] } [18:41:16.081] } [18:41:16.081] }) [18:41:16.081] if (TRUE) { [18:41:16.081] base::sink(type = "output", split = FALSE) [18:41:16.081] if (TRUE) { [18:41:16.081] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:16.081] } [18:41:16.081] else { [18:41:16.081] ...future.result["stdout"] <- base::list(NULL) [18:41:16.081] } [18:41:16.081] base::close(...future.stdout) [18:41:16.081] ...future.stdout <- NULL [18:41:16.081] } [18:41:16.081] ...future.result$conditions <- ...future.conditions [18:41:16.081] ...future.result$finished <- base::Sys.time() [18:41:16.081] ...future.result [18:41:16.081] } [18:41:16.084] assign_globals() ... [18:41:16.085] List of 5 [18:41:16.085] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:16.085] $ future.call.arguments :List of 1 [18:41:16.085] ..$ length: int 2 [18:41:16.085] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:16.085] $ ...future.elements_ii :List of 1 [18:41:16.085] ..$ c: chr "character" [18:41:16.085] $ ...future.seeds_ii : NULL [18:41:16.085] $ ...future.globals.maxSize: NULL [18:41:16.085] - attr(*, "where")=List of 5 [18:41:16.085] ..$ ...future.FUN : [18:41:16.085] ..$ future.call.arguments : [18:41:16.085] ..$ ...future.elements_ii : [18:41:16.085] ..$ ...future.seeds_ii : [18:41:16.085] ..$ ...future.globals.maxSize: [18:41:16.085] - attr(*, "resolved")= logi FALSE [18:41:16.085] - attr(*, "total_size")= num 4288 [18:41:16.085] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:16.085] - attr(*, "already-done")= logi TRUE [18:41:16.090] - copied '...future.FUN' to environment [18:41:16.091] - copied 'future.call.arguments' to environment [18:41:16.091] - copied '...future.elements_ii' to environment [18:41:16.091] - copied '...future.seeds_ii' to environment [18:41:16.091] - copied '...future.globals.maxSize' to environment [18:41:16.091] assign_globals() ... done [18:41:16.092] plan(): Setting new future strategy stack: [18:41:16.092] List of future strategies: [18:41:16.092] 1. sequential: [18:41:16.092] - args: function (..., envir = parent.frame(), workers = "") [18:41:16.092] - tweaked: FALSE [18:41:16.092] - call: NULL [18:41:16.092] plan(): nbrOfWorkers() = 1 [18:41:16.094] plan(): Setting new future strategy stack: [18:41:16.094] List of future strategies: [18:41:16.094] 1. sequential: [18:41:16.094] - args: function (..., envir = parent.frame(), workers = "") [18:41:16.094] - tweaked: FALSE [18:41:16.094] - call: plan(strategy) [18:41:16.094] plan(): nbrOfWorkers() = 1 [18:41:16.095] SequentialFuture started (and completed) [18:41:16.095] - Launch lazy future ... done [18:41:16.095] run() for 'SequentialFuture' ... done [18:41:16.095] Created future: [18:41:16.096] SequentialFuture: [18:41:16.096] Label: 'future_lapply-3' [18:41:16.096] Expression: [18:41:16.096] { [18:41:16.096] do.call(function(...) { [18:41:16.096] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.096] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:16.096] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.096] on.exit(options(oopts), add = TRUE) [18:41:16.096] } [18:41:16.096] { [18:41:16.096] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:16.096] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.096] ...future.FUN(...future.X_jj, ...) [18:41:16.096] }) [18:41:16.096] } [18:41:16.096] }, args = future.call.arguments) [18:41:16.096] } [18:41:16.096] Lazy evaluation: FALSE [18:41:16.096] Asynchronous evaluation: FALSE [18:41:16.096] Local evaluation: TRUE [18:41:16.096] Environment: R_GlobalEnv [18:41:16.096] Capture standard output: TRUE [18:41:16.096] Capture condition classes: 'condition' (excluding 'nothing') [18:41:16.096] Globals: 5 objects totaling 760 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 98 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:16.096] Packages: [18:41:16.096] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:16.096] Resolved: TRUE [18:41:16.096] Value: 55 bytes of class 'list' [18:41:16.096] Early signaling: FALSE [18:41:16.096] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:16.096] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:16.097] Chunk #3 of 4 ... DONE [18:41:16.098] Chunk #4 of 4 ... [18:41:16.098] - Finding globals in 'X' for chunk #4 ... [18:41:16.098] getGlobalsAndPackages() ... [18:41:16.098] Searching for globals... [18:41:16.098] [18:41:16.099] Searching for globals ... DONE [18:41:16.099] - globals: [0] [18:41:16.099] getGlobalsAndPackages() ... DONE [18:41:16.099] + additional globals found: [n=0] [18:41:16.099] + additional namespaces needed: [n=0] [18:41:16.099] - Finding globals in 'X' for chunk #4 ... DONE [18:41:16.099] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:16.100] - seeds: [18:41:16.100] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.100] getGlobalsAndPackages() ... [18:41:16.100] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.100] Resolving globals: FALSE [18:41:16.100] Tweak future expression to call with '...' arguments ... [18:41:16.101] { [18:41:16.101] do.call(function(...) { [18:41:16.101] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.101] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:16.101] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.101] on.exit(options(oopts), add = TRUE) [18:41:16.101] } [18:41:16.101] { [18:41:16.101] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:16.101] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.101] ...future.FUN(...future.X_jj, ...) [18:41:16.101] }) [18:41:16.101] } [18:41:16.101] }, args = future.call.arguments) [18:41:16.101] } [18:41:16.101] Tweak future expression to call with '...' arguments ... DONE [18:41:16.102] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.102] [18:41:16.102] getGlobalsAndPackages() ... DONE [18:41:16.102] run() for 'Future' ... [18:41:16.102] - state: 'created' [18:41:16.103] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:16.103] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:16.103] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:16.103] - Field: 'label' [18:41:16.104] - Field: 'local' [18:41:16.104] - Field: 'owner' [18:41:16.104] - Field: 'envir' [18:41:16.104] - Field: 'packages' [18:41:16.104] - Field: 'gc' [18:41:16.104] - Field: 'conditions' [18:41:16.105] - Field: 'expr' [18:41:16.105] - Field: 'uuid' [18:41:16.105] - Field: 'seed' [18:41:16.105] - Field: 'version' [18:41:16.105] - Field: 'result' [18:41:16.105] - Field: 'asynchronous' [18:41:16.106] - Field: 'calls' [18:41:16.106] - Field: 'globals' [18:41:16.106] - Field: 'stdout' [18:41:16.106] - Field: 'earlySignal' [18:41:16.106] - Field: 'lazy' [18:41:16.106] - Field: 'state' [18:41:16.107] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:16.107] - Launch lazy future ... [18:41:16.107] Packages needed by the future expression (n = 0): [18:41:16.107] Packages needed by future strategies (n = 0): [18:41:16.108] { [18:41:16.108] { [18:41:16.108] { [18:41:16.108] ...future.startTime <- base::Sys.time() [18:41:16.108] { [18:41:16.108] { [18:41:16.108] { [18:41:16.108] base::local({ [18:41:16.108] has_future <- base::requireNamespace("future", [18:41:16.108] quietly = TRUE) [18:41:16.108] if (has_future) { [18:41:16.108] ns <- base::getNamespace("future") [18:41:16.108] version <- ns[[".package"]][["version"]] [18:41:16.108] if (is.null(version)) [18:41:16.108] version <- utils::packageVersion("future") [18:41:16.108] } [18:41:16.108] else { [18:41:16.108] version <- NULL [18:41:16.108] } [18:41:16.108] if (!has_future || version < "1.8.0") { [18:41:16.108] info <- base::c(r_version = base::gsub("R version ", [18:41:16.108] "", base::R.version$version.string), [18:41:16.108] platform = base::sprintf("%s (%s-bit)", [18:41:16.108] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:16.108] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:16.108] "release", "version")], collapse = " "), [18:41:16.108] hostname = base::Sys.info()[["nodename"]]) [18:41:16.108] info <- base::sprintf("%s: %s", base::names(info), [18:41:16.108] info) [18:41:16.108] info <- base::paste(info, collapse = "; ") [18:41:16.108] if (!has_future) { [18:41:16.108] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:16.108] info) [18:41:16.108] } [18:41:16.108] else { [18:41:16.108] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:16.108] info, version) [18:41:16.108] } [18:41:16.108] base::stop(msg) [18:41:16.108] } [18:41:16.108] }) [18:41:16.108] } [18:41:16.108] ...future.strategy.old <- future::plan("list") [18:41:16.108] options(future.plan = NULL) [18:41:16.108] Sys.unsetenv("R_FUTURE_PLAN") [18:41:16.108] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:16.108] } [18:41:16.108] ...future.workdir <- getwd() [18:41:16.108] } [18:41:16.108] ...future.oldOptions <- base::as.list(base::.Options) [18:41:16.108] ...future.oldEnvVars <- base::Sys.getenv() [18:41:16.108] } [18:41:16.108] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:16.108] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:16.108] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:16.108] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:16.108] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:16.108] future.stdout.windows.reencode = NULL, width = 80L) [18:41:16.108] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:16.108] base::names(...future.oldOptions)) [18:41:16.108] } [18:41:16.108] if (FALSE) { [18:41:16.108] } [18:41:16.108] else { [18:41:16.108] if (TRUE) { [18:41:16.108] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:16.108] open = "w") [18:41:16.108] } [18:41:16.108] else { [18:41:16.108] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:16.108] windows = "NUL", "/dev/null"), open = "w") [18:41:16.108] } [18:41:16.108] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:16.108] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:16.108] base::sink(type = "output", split = FALSE) [18:41:16.108] base::close(...future.stdout) [18:41:16.108] }, add = TRUE) [18:41:16.108] } [18:41:16.108] ...future.frame <- base::sys.nframe() [18:41:16.108] ...future.conditions <- base::list() [18:41:16.108] ...future.rng <- base::globalenv()$.Random.seed [18:41:16.108] if (FALSE) { [18:41:16.108] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:16.108] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:16.108] } [18:41:16.108] ...future.result <- base::tryCatch({ [18:41:16.108] base::withCallingHandlers({ [18:41:16.108] ...future.value <- base::withVisible(base::local({ [18:41:16.108] do.call(function(...) { [18:41:16.108] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.108] if (!identical(...future.globals.maxSize.org, [18:41:16.108] ...future.globals.maxSize)) { [18:41:16.108] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.108] on.exit(options(oopts), add = TRUE) [18:41:16.108] } [18:41:16.108] { [18:41:16.108] lapply(seq_along(...future.elements_ii), [18:41:16.108] FUN = function(jj) { [18:41:16.108] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.108] ...future.FUN(...future.X_jj, ...) [18:41:16.108] }) [18:41:16.108] } [18:41:16.108] }, args = future.call.arguments) [18:41:16.108] })) [18:41:16.108] future::FutureResult(value = ...future.value$value, [18:41:16.108] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:16.108] ...future.rng), globalenv = if (FALSE) [18:41:16.108] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:16.108] ...future.globalenv.names)) [18:41:16.108] else NULL, started = ...future.startTime, version = "1.8") [18:41:16.108] }, condition = base::local({ [18:41:16.108] c <- base::c [18:41:16.108] inherits <- base::inherits [18:41:16.108] invokeRestart <- base::invokeRestart [18:41:16.108] length <- base::length [18:41:16.108] list <- base::list [18:41:16.108] seq.int <- base::seq.int [18:41:16.108] signalCondition <- base::signalCondition [18:41:16.108] sys.calls <- base::sys.calls [18:41:16.108] `[[` <- base::`[[` [18:41:16.108] `+` <- base::`+` [18:41:16.108] `<<-` <- base::`<<-` [18:41:16.108] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:16.108] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:16.108] 3L)] [18:41:16.108] } [18:41:16.108] function(cond) { [18:41:16.108] is_error <- inherits(cond, "error") [18:41:16.108] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:16.108] NULL) [18:41:16.108] if (is_error) { [18:41:16.108] sessionInformation <- function() { [18:41:16.108] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:16.108] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:16.108] search = base::search(), system = base::Sys.info()) [18:41:16.108] } [18:41:16.108] ...future.conditions[[length(...future.conditions) + [18:41:16.108] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:16.108] cond$call), session = sessionInformation(), [18:41:16.108] timestamp = base::Sys.time(), signaled = 0L) [18:41:16.108] signalCondition(cond) [18:41:16.108] } [18:41:16.108] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:16.108] "immediateCondition"))) { [18:41:16.108] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:16.108] ...future.conditions[[length(...future.conditions) + [18:41:16.108] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:16.108] if (TRUE && !signal) { [18:41:16.108] muffleCondition <- function (cond, pattern = "^muffle") [18:41:16.108] { [18:41:16.108] inherits <- base::inherits [18:41:16.108] invokeRestart <- base::invokeRestart [18:41:16.108] is.null <- base::is.null [18:41:16.108] muffled <- FALSE [18:41:16.108] if (inherits(cond, "message")) { [18:41:16.108] muffled <- grepl(pattern, "muffleMessage") [18:41:16.108] if (muffled) [18:41:16.108] invokeRestart("muffleMessage") [18:41:16.108] } [18:41:16.108] else if (inherits(cond, "warning")) { [18:41:16.108] muffled <- grepl(pattern, "muffleWarning") [18:41:16.108] if (muffled) [18:41:16.108] invokeRestart("muffleWarning") [18:41:16.108] } [18:41:16.108] else if (inherits(cond, "condition")) { [18:41:16.108] if (!is.null(pattern)) { [18:41:16.108] computeRestarts <- base::computeRestarts [18:41:16.108] grepl <- base::grepl [18:41:16.108] restarts <- computeRestarts(cond) [18:41:16.108] for (restart in restarts) { [18:41:16.108] name <- restart$name [18:41:16.108] if (is.null(name)) [18:41:16.108] next [18:41:16.108] if (!grepl(pattern, name)) [18:41:16.108] next [18:41:16.108] invokeRestart(restart) [18:41:16.108] muffled <- TRUE [18:41:16.108] break [18:41:16.108] } [18:41:16.108] } [18:41:16.108] } [18:41:16.108] invisible(muffled) [18:41:16.108] } [18:41:16.108] muffleCondition(cond, pattern = "^muffle") [18:41:16.108] } [18:41:16.108] } [18:41:16.108] else { [18:41:16.108] if (TRUE) { [18:41:16.108] muffleCondition <- function (cond, pattern = "^muffle") [18:41:16.108] { [18:41:16.108] inherits <- base::inherits [18:41:16.108] invokeRestart <- base::invokeRestart [18:41:16.108] is.null <- base::is.null [18:41:16.108] muffled <- FALSE [18:41:16.108] if (inherits(cond, "message")) { [18:41:16.108] muffled <- grepl(pattern, "muffleMessage") [18:41:16.108] if (muffled) [18:41:16.108] invokeRestart("muffleMessage") [18:41:16.108] } [18:41:16.108] else if (inherits(cond, "warning")) { [18:41:16.108] muffled <- grepl(pattern, "muffleWarning") [18:41:16.108] if (muffled) [18:41:16.108] invokeRestart("muffleWarning") [18:41:16.108] } [18:41:16.108] else if (inherits(cond, "condition")) { [18:41:16.108] if (!is.null(pattern)) { [18:41:16.108] computeRestarts <- base::computeRestarts [18:41:16.108] grepl <- base::grepl [18:41:16.108] restarts <- computeRestarts(cond) [18:41:16.108] for (restart in restarts) { [18:41:16.108] name <- restart$name [18:41:16.108] if (is.null(name)) [18:41:16.108] next [18:41:16.108] if (!grepl(pattern, name)) [18:41:16.108] next [18:41:16.108] invokeRestart(restart) [18:41:16.108] muffled <- TRUE [18:41:16.108] break [18:41:16.108] } [18:41:16.108] } [18:41:16.108] } [18:41:16.108] invisible(muffled) [18:41:16.108] } [18:41:16.108] muffleCondition(cond, pattern = "^muffle") [18:41:16.108] } [18:41:16.108] } [18:41:16.108] } [18:41:16.108] })) [18:41:16.108] }, error = function(ex) { [18:41:16.108] base::structure(base::list(value = NULL, visible = NULL, [18:41:16.108] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:16.108] ...future.rng), started = ...future.startTime, [18:41:16.108] finished = Sys.time(), session_uuid = NA_character_, [18:41:16.108] version = "1.8"), class = "FutureResult") [18:41:16.108] }, finally = { [18:41:16.108] if (!identical(...future.workdir, getwd())) [18:41:16.108] setwd(...future.workdir) [18:41:16.108] { [18:41:16.108] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:16.108] ...future.oldOptions$nwarnings <- NULL [18:41:16.108] } [18:41:16.108] base::options(...future.oldOptions) [18:41:16.108] if (.Platform$OS.type == "windows") { [18:41:16.108] old_names <- names(...future.oldEnvVars) [18:41:16.108] envs <- base::Sys.getenv() [18:41:16.108] names <- names(envs) [18:41:16.108] common <- intersect(names, old_names) [18:41:16.108] added <- setdiff(names, old_names) [18:41:16.108] removed <- setdiff(old_names, names) [18:41:16.108] changed <- common[...future.oldEnvVars[common] != [18:41:16.108] envs[common]] [18:41:16.108] NAMES <- toupper(changed) [18:41:16.108] args <- list() [18:41:16.108] for (kk in seq_along(NAMES)) { [18:41:16.108] name <- changed[[kk]] [18:41:16.108] NAME <- NAMES[[kk]] [18:41:16.108] if (name != NAME && is.element(NAME, old_names)) [18:41:16.108] next [18:41:16.108] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:16.108] } [18:41:16.108] NAMES <- toupper(added) [18:41:16.108] for (kk in seq_along(NAMES)) { [18:41:16.108] name <- added[[kk]] [18:41:16.108] NAME <- NAMES[[kk]] [18:41:16.108] if (name != NAME && is.element(NAME, old_names)) [18:41:16.108] next [18:41:16.108] args[[name]] <- "" [18:41:16.108] } [18:41:16.108] NAMES <- toupper(removed) [18:41:16.108] for (kk in seq_along(NAMES)) { [18:41:16.108] name <- removed[[kk]] [18:41:16.108] NAME <- NAMES[[kk]] [18:41:16.108] if (name != NAME && is.element(NAME, old_names)) [18:41:16.108] next [18:41:16.108] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:16.108] } [18:41:16.108] if (length(args) > 0) [18:41:16.108] base::do.call(base::Sys.setenv, args = args) [18:41:16.108] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:16.108] } [18:41:16.108] else { [18:41:16.108] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:16.108] } [18:41:16.108] { [18:41:16.108] if (base::length(...future.futureOptionsAdded) > [18:41:16.108] 0L) { [18:41:16.108] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:16.108] base::names(opts) <- ...future.futureOptionsAdded [18:41:16.108] base::options(opts) [18:41:16.108] } [18:41:16.108] { [18:41:16.108] { [18:41:16.108] NULL [18:41:16.108] RNGkind("Mersenne-Twister") [18:41:16.108] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:16.108] inherits = FALSE) [18:41:16.108] } [18:41:16.108] options(future.plan = NULL) [18:41:16.108] if (is.na(NA_character_)) [18:41:16.108] Sys.unsetenv("R_FUTURE_PLAN") [18:41:16.108] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:16.108] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:16.108] .init = FALSE) [18:41:16.108] } [18:41:16.108] } [18:41:16.108] } [18:41:16.108] }) [18:41:16.108] if (TRUE) { [18:41:16.108] base::sink(type = "output", split = FALSE) [18:41:16.108] if (TRUE) { [18:41:16.108] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:16.108] } [18:41:16.108] else { [18:41:16.108] ...future.result["stdout"] <- base::list(NULL) [18:41:16.108] } [18:41:16.108] base::close(...future.stdout) [18:41:16.108] ...future.stdout <- NULL [18:41:16.108] } [18:41:16.108] ...future.result$conditions <- ...future.conditions [18:41:16.108] ...future.result$finished <- base::Sys.time() [18:41:16.108] ...future.result [18:41:16.108] } [18:41:16.111] assign_globals() ... [18:41:16.112] List of 5 [18:41:16.112] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:16.112] $ future.call.arguments :List of 1 [18:41:16.112] ..$ length: int 2 [18:41:16.112] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:16.112] $ ...future.elements_ii :List of 1 [18:41:16.112] ..$ c: chr "list" [18:41:16.112] $ ...future.seeds_ii : NULL [18:41:16.112] $ ...future.globals.maxSize: NULL [18:41:16.112] - attr(*, "where")=List of 5 [18:41:16.112] ..$ ...future.FUN : [18:41:16.112] ..$ future.call.arguments : [18:41:16.112] ..$ ...future.elements_ii : [18:41:16.112] ..$ ...future.seeds_ii : [18:41:16.112] ..$ ...future.globals.maxSize: [18:41:16.112] - attr(*, "resolved")= logi FALSE [18:41:16.112] - attr(*, "total_size")= num 4288 [18:41:16.112] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:16.112] - attr(*, "already-done")= logi TRUE [18:41:16.117] - copied '...future.FUN' to environment [18:41:16.118] - copied 'future.call.arguments' to environment [18:41:16.118] - copied '...future.elements_ii' to environment [18:41:16.118] - copied '...future.seeds_ii' to environment [18:41:16.118] - copied '...future.globals.maxSize' to environment [18:41:16.118] assign_globals() ... done [18:41:16.119] plan(): Setting new future strategy stack: [18:41:16.119] List of future strategies: [18:41:16.119] 1. sequential: [18:41:16.119] - args: function (..., envir = parent.frame(), workers = "") [18:41:16.119] - tweaked: FALSE [18:41:16.119] - call: NULL [18:41:16.119] plan(): nbrOfWorkers() = 1 [18:41:16.121] plan(): Setting new future strategy stack: [18:41:16.121] List of future strategies: [18:41:16.121] 1. sequential: [18:41:16.121] - args: function (..., envir = parent.frame(), workers = "") [18:41:16.121] - tweaked: FALSE [18:41:16.121] - call: plan(strategy) [18:41:16.121] plan(): nbrOfWorkers() = 1 [18:41:16.122] SequentialFuture started (and completed) [18:41:16.122] - Launch lazy future ... done [18:41:16.123] run() for 'SequentialFuture' ... done [18:41:16.123] Created future: [18:41:16.123] SequentialFuture: [18:41:16.123] Label: 'future_lapply-4' [18:41:16.123] Expression: [18:41:16.123] { [18:41:16.123] do.call(function(...) { [18:41:16.123] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.123] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:16.123] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.123] on.exit(options(oopts), add = TRUE) [18:41:16.123] } [18:41:16.123] { [18:41:16.123] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:16.123] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.123] ...future.FUN(...future.X_jj, ...) [18:41:16.123] }) [18:41:16.123] } [18:41:16.123] }, args = future.call.arguments) [18:41:16.123] } [18:41:16.123] Lazy evaluation: FALSE [18:41:16.123] Asynchronous evaluation: FALSE [18:41:16.123] Local evaluation: TRUE [18:41:16.123] Environment: R_GlobalEnv [18:41:16.123] Capture standard output: TRUE [18:41:16.123] Capture condition classes: 'condition' (excluding 'nothing') [18:41:16.123] Globals: 5 objects totaling 755 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 93 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:16.123] Packages: [18:41:16.123] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:16.123] Resolved: TRUE [18:41:16.123] Value: 47 bytes of class 'list' [18:41:16.123] Early signaling: FALSE [18:41:16.123] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:16.123] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:16.124] Chunk #4 of 4 ... DONE [18:41:16.124] Launching 4 futures (chunks) ... DONE [18:41:16.125] Resolving 4 futures (chunks) ... [18:41:16.125] resolve() on list ... [18:41:16.125] recursive: 0 [18:41:16.125] length: 4 [18:41:16.125] [18:41:16.126] resolved() for 'SequentialFuture' ... [18:41:16.126] - state: 'finished' [18:41:16.126] - run: TRUE [18:41:16.126] - result: 'FutureResult' [18:41:16.126] resolved() for 'SequentialFuture' ... done [18:41:16.126] Future #1 [18:41:16.127] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:16.127] - nx: 4 [18:41:16.127] - relay: TRUE [18:41:16.127] - stdout: TRUE [18:41:16.128] - signal: TRUE [18:41:16.128] - resignal: FALSE [18:41:16.128] - force: TRUE [18:41:16.128] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [18:41:16.128] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:41:16.128] - until=1 [18:41:16.128] - relaying element #1 [18:41:16.129] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:16.129] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:16.129] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:16.129] length: 3 (resolved future 1) [18:41:16.130] resolved() for 'SequentialFuture' ... [18:41:16.130] - state: 'finished' [18:41:16.130] - run: TRUE [18:41:16.130] - result: 'FutureResult' [18:41:16.130] resolved() for 'SequentialFuture' ... done [18:41:16.130] Future #2 [18:41:16.131] signalConditionsASAP(SequentialFuture, pos=2) ... [18:41:16.131] - nx: 4 [18:41:16.131] - relay: TRUE [18:41:16.131] - stdout: TRUE [18:41:16.131] - signal: TRUE [18:41:16.131] - resignal: FALSE [18:41:16.131] - force: TRUE [18:41:16.132] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:16.132] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:16.132] - until=2 [18:41:16.132] - relaying element #2 [18:41:16.132] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:16.133] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:16.133] signalConditionsASAP(SequentialFuture, pos=2) ... done [18:41:16.133] length: 2 (resolved future 2) [18:41:16.133] resolved() for 'SequentialFuture' ... [18:41:16.133] - state: 'finished' [18:41:16.133] - run: TRUE [18:41:16.134] - result: 'FutureResult' [18:41:16.134] resolved() for 'SequentialFuture' ... done [18:41:16.134] Future #3 [18:41:16.134] signalConditionsASAP(SequentialFuture, pos=3) ... [18:41:16.134] - nx: 4 [18:41:16.134] - relay: TRUE [18:41:16.135] - stdout: TRUE [18:41:16.135] - signal: TRUE [18:41:16.135] - resignal: FALSE [18:41:16.135] - force: TRUE [18:41:16.135] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:16.135] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:16.135] - until=3 [18:41:16.136] - relaying element #3 [18:41:16.136] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:16.136] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:16.136] signalConditionsASAP(SequentialFuture, pos=3) ... done [18:41:16.136] length: 1 (resolved future 3) [18:41:16.137] resolved() for 'SequentialFuture' ... [18:41:16.137] - state: 'finished' [18:41:16.137] - run: TRUE [18:41:16.137] - result: 'FutureResult' [18:41:16.137] resolved() for 'SequentialFuture' ... done [18:41:16.137] Future #4 [18:41:16.138] signalConditionsASAP(SequentialFuture, pos=4) ... [18:41:16.138] - nx: 4 [18:41:16.138] - relay: TRUE [18:41:16.138] - stdout: TRUE [18:41:16.138] - signal: TRUE [18:41:16.138] - resignal: FALSE [18:41:16.139] - force: TRUE [18:41:16.139] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:16.139] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:16.139] - until=4 [18:41:16.139] - relaying element #4 [18:41:16.139] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:16.140] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:16.140] signalConditionsASAP(SequentialFuture, pos=4) ... done [18:41:16.140] length: 0 (resolved future 4) [18:41:16.140] Relaying remaining futures [18:41:16.140] signalConditionsASAP(NULL, pos=0) ... [18:41:16.140] - nx: 4 [18:41:16.141] - relay: TRUE [18:41:16.141] - stdout: TRUE [18:41:16.141] - signal: TRUE [18:41:16.141] - resignal: FALSE [18:41:16.141] - force: TRUE [18:41:16.141] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:16.141] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [18:41:16.142] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:16.142] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:16.142] signalConditionsASAP(NULL, pos=0) ... done [18:41:16.142] resolve() on list ... DONE [18:41:16.143] - Number of value chunks collected: 4 [18:41:16.143] Resolving 4 futures (chunks) ... DONE [18:41:16.143] Reducing values from 4 chunks ... [18:41:16.143] - Number of values collected after concatenation: 4 [18:41:16.143] - Number of values expected: 4 [18:41:16.143] Reducing values from 4 chunks ... DONE [18:41:16.144] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL [18:41:16.146] future_lapply() ... [18:41:16.172] Number of chunks: 4 [18:41:16.172] getGlobalsAndPackagesXApply() ... [18:41:16.172] - future.globals: TRUE [18:41:16.172] getGlobalsAndPackages() ... [18:41:16.172] Searching for globals... [18:41:16.174] - globals found: [2] 'FUN', '.Internal' [18:41:16.174] Searching for globals ... DONE [18:41:16.174] Resolving globals: FALSE [18:41:16.175] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:16.175] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:16.175] - globals: [1] 'FUN' [18:41:16.176] [18:41:16.176] getGlobalsAndPackages() ... DONE [18:41:16.176] - globals found/used: [n=1] 'FUN' [18:41:16.176] - needed namespaces: [n=0] [18:41:16.176] Finding globals ... DONE [18:41:16.176] - use_args: TRUE [18:41:16.176] - Getting '...' globals ... [18:41:16.177] resolve() on list ... [18:41:16.177] recursive: 0 [18:41:16.177] length: 1 [18:41:16.177] elements: '...' [18:41:16.178] length: 0 (resolved future 1) [18:41:16.178] resolve() on list ... DONE [18:41:16.178] - '...' content: [n=1] 'length' [18:41:16.178] List of 1 [18:41:16.178] $ ...:List of 1 [18:41:16.178] ..$ length: int 2 [18:41:16.178] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:16.178] - attr(*, "where")=List of 1 [18:41:16.178] ..$ ...: [18:41:16.178] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:16.178] - attr(*, "resolved")= logi TRUE [18:41:16.178] - attr(*, "total_size")= num NA [18:41:16.181] - Getting '...' globals ... DONE [18:41:16.182] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:16.182] List of 2 [18:41:16.182] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:16.182] $ ... :List of 1 [18:41:16.182] ..$ length: int 2 [18:41:16.182] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:16.182] - attr(*, "where")=List of 2 [18:41:16.182] ..$ ...future.FUN: [18:41:16.182] ..$ ... : [18:41:16.182] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:16.182] - attr(*, "resolved")= logi FALSE [18:41:16.182] - attr(*, "total_size")= int 4324 [18:41:16.186] Packages to be attached in all futures: [n=0] [18:41:16.186] getGlobalsAndPackagesXApply() ... DONE [18:41:16.186] Number of futures (= number of chunks): 4 [18:41:16.186] Launching 4 futures (chunks) ... [18:41:16.186] Chunk #1 of 4 ... [18:41:16.186] - Finding globals in 'X' for chunk #1 ... [18:41:16.187] getGlobalsAndPackages() ... [18:41:16.187] Searching for globals... [18:41:16.187] [18:41:16.187] Searching for globals ... DONE [18:41:16.187] - globals: [0] [18:41:16.188] getGlobalsAndPackages() ... DONE [18:41:16.188] + additional globals found: [n=0] [18:41:16.188] + additional namespaces needed: [n=0] [18:41:16.188] - Finding globals in 'X' for chunk #1 ... DONE [18:41:16.188] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:16.188] - seeds: [18:41:16.189] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.189] getGlobalsAndPackages() ... [18:41:16.189] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.189] Resolving globals: FALSE [18:41:16.189] Tweak future expression to call with '...' arguments ... [18:41:16.190] { [18:41:16.190] do.call(function(...) { [18:41:16.190] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.190] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:16.190] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.190] on.exit(options(oopts), add = TRUE) [18:41:16.190] } [18:41:16.190] { [18:41:16.190] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:16.190] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.190] ...future.FUN(...future.X_jj, ...) [18:41:16.190] }) [18:41:16.190] } [18:41:16.190] }, args = future.call.arguments) [18:41:16.190] } [18:41:16.190] Tweak future expression to call with '...' arguments ... DONE [18:41:16.191] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.191] [18:41:16.191] getGlobalsAndPackages() ... DONE [18:41:16.191] run() for 'Future' ... [18:41:16.191] - state: 'created' [18:41:16.192] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:16.192] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:16.192] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:16.192] - Field: 'label' [18:41:16.193] - Field: 'local' [18:41:16.193] - Field: 'owner' [18:41:16.193] - Field: 'envir' [18:41:16.193] - Field: 'packages' [18:41:16.193] - Field: 'gc' [18:41:16.193] - Field: 'conditions' [18:41:16.194] - Field: 'expr' [18:41:16.194] - Field: 'uuid' [18:41:16.194] - Field: 'seed' [18:41:16.194] - Field: 'version' [18:41:16.194] - Field: 'result' [18:41:16.194] - Field: 'asynchronous' [18:41:16.195] - Field: 'calls' [18:41:16.195] - Field: 'globals' [18:41:16.196] - Field: 'stdout' [18:41:16.196] - Field: 'earlySignal' [18:41:16.196] - Field: 'lazy' [18:41:16.196] - Field: 'state' [18:41:16.196] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:16.196] - Launch lazy future ... [18:41:16.197] Packages needed by the future expression (n = 0): [18:41:16.197] Packages needed by future strategies (n = 0): [18:41:16.197] { [18:41:16.197] { [18:41:16.197] { [18:41:16.197] ...future.startTime <- base::Sys.time() [18:41:16.197] { [18:41:16.197] { [18:41:16.197] { [18:41:16.197] base::local({ [18:41:16.197] has_future <- base::requireNamespace("future", [18:41:16.197] quietly = TRUE) [18:41:16.197] if (has_future) { [18:41:16.197] ns <- base::getNamespace("future") [18:41:16.197] version <- ns[[".package"]][["version"]] [18:41:16.197] if (is.null(version)) [18:41:16.197] version <- utils::packageVersion("future") [18:41:16.197] } [18:41:16.197] else { [18:41:16.197] version <- NULL [18:41:16.197] } [18:41:16.197] if (!has_future || version < "1.8.0") { [18:41:16.197] info <- base::c(r_version = base::gsub("R version ", [18:41:16.197] "", base::R.version$version.string), [18:41:16.197] platform = base::sprintf("%s (%s-bit)", [18:41:16.197] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:16.197] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:16.197] "release", "version")], collapse = " "), [18:41:16.197] hostname = base::Sys.info()[["nodename"]]) [18:41:16.197] info <- base::sprintf("%s: %s", base::names(info), [18:41:16.197] info) [18:41:16.197] info <- base::paste(info, collapse = "; ") [18:41:16.197] if (!has_future) { [18:41:16.197] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:16.197] info) [18:41:16.197] } [18:41:16.197] else { [18:41:16.197] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:16.197] info, version) [18:41:16.197] } [18:41:16.197] base::stop(msg) [18:41:16.197] } [18:41:16.197] }) [18:41:16.197] } [18:41:16.197] ...future.strategy.old <- future::plan("list") [18:41:16.197] options(future.plan = NULL) [18:41:16.197] Sys.unsetenv("R_FUTURE_PLAN") [18:41:16.197] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:16.197] } [18:41:16.197] ...future.workdir <- getwd() [18:41:16.197] } [18:41:16.197] ...future.oldOptions <- base::as.list(base::.Options) [18:41:16.197] ...future.oldEnvVars <- base::Sys.getenv() [18:41:16.197] } [18:41:16.197] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:16.197] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:16.197] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:16.197] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:16.197] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:16.197] future.stdout.windows.reencode = NULL, width = 80L) [18:41:16.197] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:16.197] base::names(...future.oldOptions)) [18:41:16.197] } [18:41:16.197] if (FALSE) { [18:41:16.197] } [18:41:16.197] else { [18:41:16.197] if (TRUE) { [18:41:16.197] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:16.197] open = "w") [18:41:16.197] } [18:41:16.197] else { [18:41:16.197] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:16.197] windows = "NUL", "/dev/null"), open = "w") [18:41:16.197] } [18:41:16.197] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:16.197] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:16.197] base::sink(type = "output", split = FALSE) [18:41:16.197] base::close(...future.stdout) [18:41:16.197] }, add = TRUE) [18:41:16.197] } [18:41:16.197] ...future.frame <- base::sys.nframe() [18:41:16.197] ...future.conditions <- base::list() [18:41:16.197] ...future.rng <- base::globalenv()$.Random.seed [18:41:16.197] if (FALSE) { [18:41:16.197] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:16.197] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:16.197] } [18:41:16.197] ...future.result <- base::tryCatch({ [18:41:16.197] base::withCallingHandlers({ [18:41:16.197] ...future.value <- base::withVisible(base::local({ [18:41:16.197] do.call(function(...) { [18:41:16.197] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.197] if (!identical(...future.globals.maxSize.org, [18:41:16.197] ...future.globals.maxSize)) { [18:41:16.197] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.197] on.exit(options(oopts), add = TRUE) [18:41:16.197] } [18:41:16.197] { [18:41:16.197] lapply(seq_along(...future.elements_ii), [18:41:16.197] FUN = function(jj) { [18:41:16.197] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.197] ...future.FUN(...future.X_jj, ...) [18:41:16.197] }) [18:41:16.197] } [18:41:16.197] }, args = future.call.arguments) [18:41:16.197] })) [18:41:16.197] future::FutureResult(value = ...future.value$value, [18:41:16.197] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:16.197] ...future.rng), globalenv = if (FALSE) [18:41:16.197] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:16.197] ...future.globalenv.names)) [18:41:16.197] else NULL, started = ...future.startTime, version = "1.8") [18:41:16.197] }, condition = base::local({ [18:41:16.197] c <- base::c [18:41:16.197] inherits <- base::inherits [18:41:16.197] invokeRestart <- base::invokeRestart [18:41:16.197] length <- base::length [18:41:16.197] list <- base::list [18:41:16.197] seq.int <- base::seq.int [18:41:16.197] signalCondition <- base::signalCondition [18:41:16.197] sys.calls <- base::sys.calls [18:41:16.197] `[[` <- base::`[[` [18:41:16.197] `+` <- base::`+` [18:41:16.197] `<<-` <- base::`<<-` [18:41:16.197] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:16.197] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:16.197] 3L)] [18:41:16.197] } [18:41:16.197] function(cond) { [18:41:16.197] is_error <- inherits(cond, "error") [18:41:16.197] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:16.197] NULL) [18:41:16.197] if (is_error) { [18:41:16.197] sessionInformation <- function() { [18:41:16.197] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:16.197] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:16.197] search = base::search(), system = base::Sys.info()) [18:41:16.197] } [18:41:16.197] ...future.conditions[[length(...future.conditions) + [18:41:16.197] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:16.197] cond$call), session = sessionInformation(), [18:41:16.197] timestamp = base::Sys.time(), signaled = 0L) [18:41:16.197] signalCondition(cond) [18:41:16.197] } [18:41:16.197] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:16.197] "immediateCondition"))) { [18:41:16.197] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:16.197] ...future.conditions[[length(...future.conditions) + [18:41:16.197] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:16.197] if (TRUE && !signal) { [18:41:16.197] muffleCondition <- function (cond, pattern = "^muffle") [18:41:16.197] { [18:41:16.197] inherits <- base::inherits [18:41:16.197] invokeRestart <- base::invokeRestart [18:41:16.197] is.null <- base::is.null [18:41:16.197] muffled <- FALSE [18:41:16.197] if (inherits(cond, "message")) { [18:41:16.197] muffled <- grepl(pattern, "muffleMessage") [18:41:16.197] if (muffled) [18:41:16.197] invokeRestart("muffleMessage") [18:41:16.197] } [18:41:16.197] else if (inherits(cond, "warning")) { [18:41:16.197] muffled <- grepl(pattern, "muffleWarning") [18:41:16.197] if (muffled) [18:41:16.197] invokeRestart("muffleWarning") [18:41:16.197] } [18:41:16.197] else if (inherits(cond, "condition")) { [18:41:16.197] if (!is.null(pattern)) { [18:41:16.197] computeRestarts <- base::computeRestarts [18:41:16.197] grepl <- base::grepl [18:41:16.197] restarts <- computeRestarts(cond) [18:41:16.197] for (restart in restarts) { [18:41:16.197] name <- restart$name [18:41:16.197] if (is.null(name)) [18:41:16.197] next [18:41:16.197] if (!grepl(pattern, name)) [18:41:16.197] next [18:41:16.197] invokeRestart(restart) [18:41:16.197] muffled <- TRUE [18:41:16.197] break [18:41:16.197] } [18:41:16.197] } [18:41:16.197] } [18:41:16.197] invisible(muffled) [18:41:16.197] } [18:41:16.197] muffleCondition(cond, pattern = "^muffle") [18:41:16.197] } [18:41:16.197] } [18:41:16.197] else { [18:41:16.197] if (TRUE) { [18:41:16.197] muffleCondition <- function (cond, pattern = "^muffle") [18:41:16.197] { [18:41:16.197] inherits <- base::inherits [18:41:16.197] invokeRestart <- base::invokeRestart [18:41:16.197] is.null <- base::is.null [18:41:16.197] muffled <- FALSE [18:41:16.197] if (inherits(cond, "message")) { [18:41:16.197] muffled <- grepl(pattern, "muffleMessage") [18:41:16.197] if (muffled) [18:41:16.197] invokeRestart("muffleMessage") [18:41:16.197] } [18:41:16.197] else if (inherits(cond, "warning")) { [18:41:16.197] muffled <- grepl(pattern, "muffleWarning") [18:41:16.197] if (muffled) [18:41:16.197] invokeRestart("muffleWarning") [18:41:16.197] } [18:41:16.197] else if (inherits(cond, "condition")) { [18:41:16.197] if (!is.null(pattern)) { [18:41:16.197] computeRestarts <- base::computeRestarts [18:41:16.197] grepl <- base::grepl [18:41:16.197] restarts <- computeRestarts(cond) [18:41:16.197] for (restart in restarts) { [18:41:16.197] name <- restart$name [18:41:16.197] if (is.null(name)) [18:41:16.197] next [18:41:16.197] if (!grepl(pattern, name)) [18:41:16.197] next [18:41:16.197] invokeRestart(restart) [18:41:16.197] muffled <- TRUE [18:41:16.197] break [18:41:16.197] } [18:41:16.197] } [18:41:16.197] } [18:41:16.197] invisible(muffled) [18:41:16.197] } [18:41:16.197] muffleCondition(cond, pattern = "^muffle") [18:41:16.197] } [18:41:16.197] } [18:41:16.197] } [18:41:16.197] })) [18:41:16.197] }, error = function(ex) { [18:41:16.197] base::structure(base::list(value = NULL, visible = NULL, [18:41:16.197] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:16.197] ...future.rng), started = ...future.startTime, [18:41:16.197] finished = Sys.time(), session_uuid = NA_character_, [18:41:16.197] version = "1.8"), class = "FutureResult") [18:41:16.197] }, finally = { [18:41:16.197] if (!identical(...future.workdir, getwd())) [18:41:16.197] setwd(...future.workdir) [18:41:16.197] { [18:41:16.197] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:16.197] ...future.oldOptions$nwarnings <- NULL [18:41:16.197] } [18:41:16.197] base::options(...future.oldOptions) [18:41:16.197] if (.Platform$OS.type == "windows") { [18:41:16.197] old_names <- names(...future.oldEnvVars) [18:41:16.197] envs <- base::Sys.getenv() [18:41:16.197] names <- names(envs) [18:41:16.197] common <- intersect(names, old_names) [18:41:16.197] added <- setdiff(names, old_names) [18:41:16.197] removed <- setdiff(old_names, names) [18:41:16.197] changed <- common[...future.oldEnvVars[common] != [18:41:16.197] envs[common]] [18:41:16.197] NAMES <- toupper(changed) [18:41:16.197] args <- list() [18:41:16.197] for (kk in seq_along(NAMES)) { [18:41:16.197] name <- changed[[kk]] [18:41:16.197] NAME <- NAMES[[kk]] [18:41:16.197] if (name != NAME && is.element(NAME, old_names)) [18:41:16.197] next [18:41:16.197] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:16.197] } [18:41:16.197] NAMES <- toupper(added) [18:41:16.197] for (kk in seq_along(NAMES)) { [18:41:16.197] name <- added[[kk]] [18:41:16.197] NAME <- NAMES[[kk]] [18:41:16.197] if (name != NAME && is.element(NAME, old_names)) [18:41:16.197] next [18:41:16.197] args[[name]] <- "" [18:41:16.197] } [18:41:16.197] NAMES <- toupper(removed) [18:41:16.197] for (kk in seq_along(NAMES)) { [18:41:16.197] name <- removed[[kk]] [18:41:16.197] NAME <- NAMES[[kk]] [18:41:16.197] if (name != NAME && is.element(NAME, old_names)) [18:41:16.197] next [18:41:16.197] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:16.197] } [18:41:16.197] if (length(args) > 0) [18:41:16.197] base::do.call(base::Sys.setenv, args = args) [18:41:16.197] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:16.197] } [18:41:16.197] else { [18:41:16.197] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:16.197] } [18:41:16.197] { [18:41:16.197] if (base::length(...future.futureOptionsAdded) > [18:41:16.197] 0L) { [18:41:16.197] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:16.197] base::names(opts) <- ...future.futureOptionsAdded [18:41:16.197] base::options(opts) [18:41:16.197] } [18:41:16.197] { [18:41:16.197] { [18:41:16.197] NULL [18:41:16.197] RNGkind("Mersenne-Twister") [18:41:16.197] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:16.197] inherits = FALSE) [18:41:16.197] } [18:41:16.197] options(future.plan = NULL) [18:41:16.197] if (is.na(NA_character_)) [18:41:16.197] Sys.unsetenv("R_FUTURE_PLAN") [18:41:16.197] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:16.197] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:16.197] .init = FALSE) [18:41:16.197] } [18:41:16.197] } [18:41:16.197] } [18:41:16.197] }) [18:41:16.197] if (TRUE) { [18:41:16.197] base::sink(type = "output", split = FALSE) [18:41:16.197] if (TRUE) { [18:41:16.197] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:16.197] } [18:41:16.197] else { [18:41:16.197] ...future.result["stdout"] <- base::list(NULL) [18:41:16.197] } [18:41:16.197] base::close(...future.stdout) [18:41:16.197] ...future.stdout <- NULL [18:41:16.197] } [18:41:16.197] ...future.result$conditions <- ...future.conditions [18:41:16.197] ...future.result$finished <- base::Sys.time() [18:41:16.197] ...future.result [18:41:16.197] } [18:41:16.201] assign_globals() ... [18:41:16.202] List of 5 [18:41:16.202] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:16.202] $ future.call.arguments :List of 1 [18:41:16.202] ..$ length: int 2 [18:41:16.202] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:16.202] $ ...future.elements_ii :List of 1 [18:41:16.202] ..$ a: chr "integer" [18:41:16.202] $ ...future.seeds_ii : NULL [18:41:16.202] $ ...future.globals.maxSize: NULL [18:41:16.202] - attr(*, "where")=List of 5 [18:41:16.202] ..$ ...future.FUN : [18:41:16.202] ..$ future.call.arguments : [18:41:16.202] ..$ ...future.elements_ii : [18:41:16.202] ..$ ...future.seeds_ii : [18:41:16.202] ..$ ...future.globals.maxSize: [18:41:16.202] - attr(*, "resolved")= logi FALSE [18:41:16.202] - attr(*, "total_size")= num 4324 [18:41:16.202] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:16.202] - attr(*, "already-done")= logi TRUE [18:41:16.208] - copied '...future.FUN' to environment [18:41:16.208] - copied 'future.call.arguments' to environment [18:41:16.208] - copied '...future.elements_ii' to environment [18:41:16.208] - copied '...future.seeds_ii' to environment [18:41:16.208] - copied '...future.globals.maxSize' to environment [18:41:16.208] assign_globals() ... done [18:41:16.209] plan(): Setting new future strategy stack: [18:41:16.209] List of future strategies: [18:41:16.209] 1. sequential: [18:41:16.209] - args: function (..., envir = parent.frame(), workers = "") [18:41:16.209] - tweaked: FALSE [18:41:16.209] - call: NULL [18:41:16.210] plan(): nbrOfWorkers() = 1 [18:41:16.211] plan(): Setting new future strategy stack: [18:41:16.211] List of future strategies: [18:41:16.211] 1. sequential: [18:41:16.211] - args: function (..., envir = parent.frame(), workers = "") [18:41:16.211] - tweaked: FALSE [18:41:16.211] - call: plan(strategy) [18:41:16.212] plan(): nbrOfWorkers() = 1 [18:41:16.212] SequentialFuture started (and completed) [18:41:16.212] - Launch lazy future ... done [18:41:16.212] run() for 'SequentialFuture' ... done [18:41:16.212] Created future: [18:41:16.213] SequentialFuture: [18:41:16.213] Label: 'future_lapply-1' [18:41:16.213] Expression: [18:41:16.213] { [18:41:16.213] do.call(function(...) { [18:41:16.213] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.213] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:16.213] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.213] on.exit(options(oopts), add = TRUE) [18:41:16.213] } [18:41:16.213] { [18:41:16.213] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:16.213] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.213] ...future.FUN(...future.X_jj, ...) [18:41:16.213] }) [18:41:16.213] } [18:41:16.213] }, args = future.call.arguments) [18:41:16.213] } [18:41:16.213] Lazy evaluation: FALSE [18:41:16.213] Asynchronous evaluation: FALSE [18:41:16.213] Local evaluation: TRUE [18:41:16.213] Environment: R_GlobalEnv [18:41:16.213] Capture standard output: TRUE [18:41:16.213] Capture condition classes: 'condition' (excluding 'nothing') [18:41:16.213] Globals: 5 objects totaling 758 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 96 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:16.213] Packages: [18:41:16.213] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:16.213] Resolved: TRUE [18:41:16.213] Value: 47 bytes of class 'list' [18:41:16.213] Early signaling: FALSE [18:41:16.213] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:16.213] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:16.214] Chunk #1 of 4 ... DONE [18:41:16.214] Chunk #2 of 4 ... [18:41:16.214] - Finding globals in 'X' for chunk #2 ... [18:41:16.214] getGlobalsAndPackages() ... [18:41:16.214] Searching for globals... [18:41:16.215] [18:41:16.215] Searching for globals ... DONE [18:41:16.215] - globals: [0] [18:41:16.215] getGlobalsAndPackages() ... DONE [18:41:16.215] + additional globals found: [n=0] [18:41:16.215] + additional namespaces needed: [n=0] [18:41:16.215] - Finding globals in 'X' for chunk #2 ... DONE [18:41:16.216] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:16.216] - seeds: [18:41:16.216] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.216] getGlobalsAndPackages() ... [18:41:16.216] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.216] Resolving globals: FALSE [18:41:16.217] Tweak future expression to call with '...' arguments ... [18:41:16.217] { [18:41:16.217] do.call(function(...) { [18:41:16.217] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.217] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:16.217] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.217] on.exit(options(oopts), add = TRUE) [18:41:16.217] } [18:41:16.217] { [18:41:16.217] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:16.217] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.217] ...future.FUN(...future.X_jj, ...) [18:41:16.217] }) [18:41:16.217] } [18:41:16.217] }, args = future.call.arguments) [18:41:16.217] } [18:41:16.217] Tweak future expression to call with '...' arguments ... DONE [18:41:16.218] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.218] [18:41:16.218] getGlobalsAndPackages() ... DONE [18:41:16.218] run() for 'Future' ... [18:41:16.219] - state: 'created' [18:41:16.219] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:16.219] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:16.219] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:16.220] - Field: 'label' [18:41:16.220] - Field: 'local' [18:41:16.220] - Field: 'owner' [18:41:16.220] - Field: 'envir' [18:41:16.220] - Field: 'packages' [18:41:16.220] - Field: 'gc' [18:41:16.221] - Field: 'conditions' [18:41:16.221] - Field: 'expr' [18:41:16.221] - Field: 'uuid' [18:41:16.221] - Field: 'seed' [18:41:16.221] - Field: 'version' [18:41:16.221] - Field: 'result' [18:41:16.222] - Field: 'asynchronous' [18:41:16.222] - Field: 'calls' [18:41:16.222] - Field: 'globals' [18:41:16.222] - Field: 'stdout' [18:41:16.222] - Field: 'earlySignal' [18:41:16.222] - Field: 'lazy' [18:41:16.223] - Field: 'state' [18:41:16.224] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:16.224] - Launch lazy future ... [18:41:16.224] Packages needed by the future expression (n = 0): [18:41:16.224] Packages needed by future strategies (n = 0): [18:41:16.225] { [18:41:16.225] { [18:41:16.225] { [18:41:16.225] ...future.startTime <- base::Sys.time() [18:41:16.225] { [18:41:16.225] { [18:41:16.225] { [18:41:16.225] base::local({ [18:41:16.225] has_future <- base::requireNamespace("future", [18:41:16.225] quietly = TRUE) [18:41:16.225] if (has_future) { [18:41:16.225] ns <- base::getNamespace("future") [18:41:16.225] version <- ns[[".package"]][["version"]] [18:41:16.225] if (is.null(version)) [18:41:16.225] version <- utils::packageVersion("future") [18:41:16.225] } [18:41:16.225] else { [18:41:16.225] version <- NULL [18:41:16.225] } [18:41:16.225] if (!has_future || version < "1.8.0") { [18:41:16.225] info <- base::c(r_version = base::gsub("R version ", [18:41:16.225] "", base::R.version$version.string), [18:41:16.225] platform = base::sprintf("%s (%s-bit)", [18:41:16.225] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:16.225] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:16.225] "release", "version")], collapse = " "), [18:41:16.225] hostname = base::Sys.info()[["nodename"]]) [18:41:16.225] info <- base::sprintf("%s: %s", base::names(info), [18:41:16.225] info) [18:41:16.225] info <- base::paste(info, collapse = "; ") [18:41:16.225] if (!has_future) { [18:41:16.225] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:16.225] info) [18:41:16.225] } [18:41:16.225] else { [18:41:16.225] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:16.225] info, version) [18:41:16.225] } [18:41:16.225] base::stop(msg) [18:41:16.225] } [18:41:16.225] }) [18:41:16.225] } [18:41:16.225] ...future.strategy.old <- future::plan("list") [18:41:16.225] options(future.plan = NULL) [18:41:16.225] Sys.unsetenv("R_FUTURE_PLAN") [18:41:16.225] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:16.225] } [18:41:16.225] ...future.workdir <- getwd() [18:41:16.225] } [18:41:16.225] ...future.oldOptions <- base::as.list(base::.Options) [18:41:16.225] ...future.oldEnvVars <- base::Sys.getenv() [18:41:16.225] } [18:41:16.225] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:16.225] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:16.225] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:16.225] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:16.225] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:16.225] future.stdout.windows.reencode = NULL, width = 80L) [18:41:16.225] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:16.225] base::names(...future.oldOptions)) [18:41:16.225] } [18:41:16.225] if (FALSE) { [18:41:16.225] } [18:41:16.225] else { [18:41:16.225] if (TRUE) { [18:41:16.225] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:16.225] open = "w") [18:41:16.225] } [18:41:16.225] else { [18:41:16.225] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:16.225] windows = "NUL", "/dev/null"), open = "w") [18:41:16.225] } [18:41:16.225] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:16.225] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:16.225] base::sink(type = "output", split = FALSE) [18:41:16.225] base::close(...future.stdout) [18:41:16.225] }, add = TRUE) [18:41:16.225] } [18:41:16.225] ...future.frame <- base::sys.nframe() [18:41:16.225] ...future.conditions <- base::list() [18:41:16.225] ...future.rng <- base::globalenv()$.Random.seed [18:41:16.225] if (FALSE) { [18:41:16.225] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:16.225] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:16.225] } [18:41:16.225] ...future.result <- base::tryCatch({ [18:41:16.225] base::withCallingHandlers({ [18:41:16.225] ...future.value <- base::withVisible(base::local({ [18:41:16.225] do.call(function(...) { [18:41:16.225] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.225] if (!identical(...future.globals.maxSize.org, [18:41:16.225] ...future.globals.maxSize)) { [18:41:16.225] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.225] on.exit(options(oopts), add = TRUE) [18:41:16.225] } [18:41:16.225] { [18:41:16.225] lapply(seq_along(...future.elements_ii), [18:41:16.225] FUN = function(jj) { [18:41:16.225] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.225] ...future.FUN(...future.X_jj, ...) [18:41:16.225] }) [18:41:16.225] } [18:41:16.225] }, args = future.call.arguments) [18:41:16.225] })) [18:41:16.225] future::FutureResult(value = ...future.value$value, [18:41:16.225] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:16.225] ...future.rng), globalenv = if (FALSE) [18:41:16.225] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:16.225] ...future.globalenv.names)) [18:41:16.225] else NULL, started = ...future.startTime, version = "1.8") [18:41:16.225] }, condition = base::local({ [18:41:16.225] c <- base::c [18:41:16.225] inherits <- base::inherits [18:41:16.225] invokeRestart <- base::invokeRestart [18:41:16.225] length <- base::length [18:41:16.225] list <- base::list [18:41:16.225] seq.int <- base::seq.int [18:41:16.225] signalCondition <- base::signalCondition [18:41:16.225] sys.calls <- base::sys.calls [18:41:16.225] `[[` <- base::`[[` [18:41:16.225] `+` <- base::`+` [18:41:16.225] `<<-` <- base::`<<-` [18:41:16.225] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:16.225] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:16.225] 3L)] [18:41:16.225] } [18:41:16.225] function(cond) { [18:41:16.225] is_error <- inherits(cond, "error") [18:41:16.225] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:16.225] NULL) [18:41:16.225] if (is_error) { [18:41:16.225] sessionInformation <- function() { [18:41:16.225] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:16.225] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:16.225] search = base::search(), system = base::Sys.info()) [18:41:16.225] } [18:41:16.225] ...future.conditions[[length(...future.conditions) + [18:41:16.225] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:16.225] cond$call), session = sessionInformation(), [18:41:16.225] timestamp = base::Sys.time(), signaled = 0L) [18:41:16.225] signalCondition(cond) [18:41:16.225] } [18:41:16.225] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:16.225] "immediateCondition"))) { [18:41:16.225] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:16.225] ...future.conditions[[length(...future.conditions) + [18:41:16.225] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:16.225] if (TRUE && !signal) { [18:41:16.225] muffleCondition <- function (cond, pattern = "^muffle") [18:41:16.225] { [18:41:16.225] inherits <- base::inherits [18:41:16.225] invokeRestart <- base::invokeRestart [18:41:16.225] is.null <- base::is.null [18:41:16.225] muffled <- FALSE [18:41:16.225] if (inherits(cond, "message")) { [18:41:16.225] muffled <- grepl(pattern, "muffleMessage") [18:41:16.225] if (muffled) [18:41:16.225] invokeRestart("muffleMessage") [18:41:16.225] } [18:41:16.225] else if (inherits(cond, "warning")) { [18:41:16.225] muffled <- grepl(pattern, "muffleWarning") [18:41:16.225] if (muffled) [18:41:16.225] invokeRestart("muffleWarning") [18:41:16.225] } [18:41:16.225] else if (inherits(cond, "condition")) { [18:41:16.225] if (!is.null(pattern)) { [18:41:16.225] computeRestarts <- base::computeRestarts [18:41:16.225] grepl <- base::grepl [18:41:16.225] restarts <- computeRestarts(cond) [18:41:16.225] for (restart in restarts) { [18:41:16.225] name <- restart$name [18:41:16.225] if (is.null(name)) [18:41:16.225] next [18:41:16.225] if (!grepl(pattern, name)) [18:41:16.225] next [18:41:16.225] invokeRestart(restart) [18:41:16.225] muffled <- TRUE [18:41:16.225] break [18:41:16.225] } [18:41:16.225] } [18:41:16.225] } [18:41:16.225] invisible(muffled) [18:41:16.225] } [18:41:16.225] muffleCondition(cond, pattern = "^muffle") [18:41:16.225] } [18:41:16.225] } [18:41:16.225] else { [18:41:16.225] if (TRUE) { [18:41:16.225] muffleCondition <- function (cond, pattern = "^muffle") [18:41:16.225] { [18:41:16.225] inherits <- base::inherits [18:41:16.225] invokeRestart <- base::invokeRestart [18:41:16.225] is.null <- base::is.null [18:41:16.225] muffled <- FALSE [18:41:16.225] if (inherits(cond, "message")) { [18:41:16.225] muffled <- grepl(pattern, "muffleMessage") [18:41:16.225] if (muffled) [18:41:16.225] invokeRestart("muffleMessage") [18:41:16.225] } [18:41:16.225] else if (inherits(cond, "warning")) { [18:41:16.225] muffled <- grepl(pattern, "muffleWarning") [18:41:16.225] if (muffled) [18:41:16.225] invokeRestart("muffleWarning") [18:41:16.225] } [18:41:16.225] else if (inherits(cond, "condition")) { [18:41:16.225] if (!is.null(pattern)) { [18:41:16.225] computeRestarts <- base::computeRestarts [18:41:16.225] grepl <- base::grepl [18:41:16.225] restarts <- computeRestarts(cond) [18:41:16.225] for (restart in restarts) { [18:41:16.225] name <- restart$name [18:41:16.225] if (is.null(name)) [18:41:16.225] next [18:41:16.225] if (!grepl(pattern, name)) [18:41:16.225] next [18:41:16.225] invokeRestart(restart) [18:41:16.225] muffled <- TRUE [18:41:16.225] break [18:41:16.225] } [18:41:16.225] } [18:41:16.225] } [18:41:16.225] invisible(muffled) [18:41:16.225] } [18:41:16.225] muffleCondition(cond, pattern = "^muffle") [18:41:16.225] } [18:41:16.225] } [18:41:16.225] } [18:41:16.225] })) [18:41:16.225] }, error = function(ex) { [18:41:16.225] base::structure(base::list(value = NULL, visible = NULL, [18:41:16.225] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:16.225] ...future.rng), started = ...future.startTime, [18:41:16.225] finished = Sys.time(), session_uuid = NA_character_, [18:41:16.225] version = "1.8"), class = "FutureResult") [18:41:16.225] }, finally = { [18:41:16.225] if (!identical(...future.workdir, getwd())) [18:41:16.225] setwd(...future.workdir) [18:41:16.225] { [18:41:16.225] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:16.225] ...future.oldOptions$nwarnings <- NULL [18:41:16.225] } [18:41:16.225] base::options(...future.oldOptions) [18:41:16.225] if (.Platform$OS.type == "windows") { [18:41:16.225] old_names <- names(...future.oldEnvVars) [18:41:16.225] envs <- base::Sys.getenv() [18:41:16.225] names <- names(envs) [18:41:16.225] common <- intersect(names, old_names) [18:41:16.225] added <- setdiff(names, old_names) [18:41:16.225] removed <- setdiff(old_names, names) [18:41:16.225] changed <- common[...future.oldEnvVars[common] != [18:41:16.225] envs[common]] [18:41:16.225] NAMES <- toupper(changed) [18:41:16.225] args <- list() [18:41:16.225] for (kk in seq_along(NAMES)) { [18:41:16.225] name <- changed[[kk]] [18:41:16.225] NAME <- NAMES[[kk]] [18:41:16.225] if (name != NAME && is.element(NAME, old_names)) [18:41:16.225] next [18:41:16.225] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:16.225] } [18:41:16.225] NAMES <- toupper(added) [18:41:16.225] for (kk in seq_along(NAMES)) { [18:41:16.225] name <- added[[kk]] [18:41:16.225] NAME <- NAMES[[kk]] [18:41:16.225] if (name != NAME && is.element(NAME, old_names)) [18:41:16.225] next [18:41:16.225] args[[name]] <- "" [18:41:16.225] } [18:41:16.225] NAMES <- toupper(removed) [18:41:16.225] for (kk in seq_along(NAMES)) { [18:41:16.225] name <- removed[[kk]] [18:41:16.225] NAME <- NAMES[[kk]] [18:41:16.225] if (name != NAME && is.element(NAME, old_names)) [18:41:16.225] next [18:41:16.225] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:16.225] } [18:41:16.225] if (length(args) > 0) [18:41:16.225] base::do.call(base::Sys.setenv, args = args) [18:41:16.225] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:16.225] } [18:41:16.225] else { [18:41:16.225] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:16.225] } [18:41:16.225] { [18:41:16.225] if (base::length(...future.futureOptionsAdded) > [18:41:16.225] 0L) { [18:41:16.225] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:16.225] base::names(opts) <- ...future.futureOptionsAdded [18:41:16.225] base::options(opts) [18:41:16.225] } [18:41:16.225] { [18:41:16.225] { [18:41:16.225] NULL [18:41:16.225] RNGkind("Mersenne-Twister") [18:41:16.225] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:16.225] inherits = FALSE) [18:41:16.225] } [18:41:16.225] options(future.plan = NULL) [18:41:16.225] if (is.na(NA_character_)) [18:41:16.225] Sys.unsetenv("R_FUTURE_PLAN") [18:41:16.225] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:16.225] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:16.225] .init = FALSE) [18:41:16.225] } [18:41:16.225] } [18:41:16.225] } [18:41:16.225] }) [18:41:16.225] if (TRUE) { [18:41:16.225] base::sink(type = "output", split = FALSE) [18:41:16.225] if (TRUE) { [18:41:16.225] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:16.225] } [18:41:16.225] else { [18:41:16.225] ...future.result["stdout"] <- base::list(NULL) [18:41:16.225] } [18:41:16.225] base::close(...future.stdout) [18:41:16.225] ...future.stdout <- NULL [18:41:16.225] } [18:41:16.225] ...future.result$conditions <- ...future.conditions [18:41:16.225] ...future.result$finished <- base::Sys.time() [18:41:16.225] ...future.result [18:41:16.225] } [18:41:16.228] assign_globals() ... [18:41:16.229] List of 5 [18:41:16.229] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:16.229] $ future.call.arguments :List of 1 [18:41:16.229] ..$ length: int 2 [18:41:16.229] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:16.229] $ ...future.elements_ii :List of 1 [18:41:16.229] ..$ b: chr "numeric" [18:41:16.229] $ ...future.seeds_ii : NULL [18:41:16.229] $ ...future.globals.maxSize: NULL [18:41:16.229] - attr(*, "where")=List of 5 [18:41:16.229] ..$ ...future.FUN : [18:41:16.229] ..$ future.call.arguments : [18:41:16.229] ..$ ...future.elements_ii : [18:41:16.229] ..$ ...future.seeds_ii : [18:41:16.229] ..$ ...future.globals.maxSize: [18:41:16.229] - attr(*, "resolved")= logi FALSE [18:41:16.229] - attr(*, "total_size")= num 4324 [18:41:16.229] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:16.229] - attr(*, "already-done")= logi TRUE [18:41:16.235] - copied '...future.FUN' to environment [18:41:16.235] - copied 'future.call.arguments' to environment [18:41:16.235] - copied '...future.elements_ii' to environment [18:41:16.235] - copied '...future.seeds_ii' to environment [18:41:16.235] - copied '...future.globals.maxSize' to environment [18:41:16.236] assign_globals() ... done [18:41:16.236] plan(): Setting new future strategy stack: [18:41:16.236] List of future strategies: [18:41:16.236] 1. sequential: [18:41:16.236] - args: function (..., envir = parent.frame(), workers = "") [18:41:16.236] - tweaked: FALSE [18:41:16.236] - call: NULL [18:41:16.237] plan(): nbrOfWorkers() = 1 [18:41:16.238] plan(): Setting new future strategy stack: [18:41:16.238] List of future strategies: [18:41:16.238] 1. sequential: [18:41:16.238] - args: function (..., envir = parent.frame(), workers = "") [18:41:16.238] - tweaked: FALSE [18:41:16.238] - call: plan(strategy) [18:41:16.239] plan(): nbrOfWorkers() = 1 [18:41:16.239] SequentialFuture started (and completed) [18:41:16.239] - Launch lazy future ... done [18:41:16.239] run() for 'SequentialFuture' ... done [18:41:16.239] Created future: [18:41:16.240] SequentialFuture: [18:41:16.240] Label: 'future_lapply-2' [18:41:16.240] Expression: [18:41:16.240] { [18:41:16.240] do.call(function(...) { [18:41:16.240] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.240] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:16.240] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.240] on.exit(options(oopts), add = TRUE) [18:41:16.240] } [18:41:16.240] { [18:41:16.240] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:16.240] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.240] ...future.FUN(...future.X_jj, ...) [18:41:16.240] }) [18:41:16.240] } [18:41:16.240] }, args = future.call.arguments) [18:41:16.240] } [18:41:16.240] Lazy evaluation: FALSE [18:41:16.240] Asynchronous evaluation: FALSE [18:41:16.240] Local evaluation: TRUE [18:41:16.240] Environment: R_GlobalEnv [18:41:16.240] Capture standard output: TRUE [18:41:16.240] Capture condition classes: 'condition' (excluding 'nothing') [18:41:16.240] Globals: 5 objects totaling 758 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 96 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:16.240] Packages: [18:41:16.240] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:16.240] Resolved: TRUE [18:41:16.240] Value: 55 bytes of class 'list' [18:41:16.240] Early signaling: FALSE [18:41:16.240] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:16.240] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:16.241] Chunk #2 of 4 ... DONE [18:41:16.241] Chunk #3 of 4 ... [18:41:16.241] - Finding globals in 'X' for chunk #3 ... [18:41:16.241] getGlobalsAndPackages() ... [18:41:16.241] Searching for globals... [18:41:16.242] [18:41:16.242] Searching for globals ... DONE [18:41:16.242] - globals: [0] [18:41:16.242] getGlobalsAndPackages() ... DONE [18:41:16.242] + additional globals found: [n=0] [18:41:16.242] + additional namespaces needed: [n=0] [18:41:16.243] - Finding globals in 'X' for chunk #3 ... DONE [18:41:16.243] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:16.243] - seeds: [18:41:16.243] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.243] getGlobalsAndPackages() ... [18:41:16.243] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.244] Resolving globals: FALSE [18:41:16.244] Tweak future expression to call with '...' arguments ... [18:41:16.244] { [18:41:16.244] do.call(function(...) { [18:41:16.244] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.244] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:16.244] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.244] on.exit(options(oopts), add = TRUE) [18:41:16.244] } [18:41:16.244] { [18:41:16.244] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:16.244] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.244] ...future.FUN(...future.X_jj, ...) [18:41:16.244] }) [18:41:16.244] } [18:41:16.244] }, args = future.call.arguments) [18:41:16.244] } [18:41:16.244] Tweak future expression to call with '...' arguments ... DONE [18:41:16.245] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.245] [18:41:16.245] getGlobalsAndPackages() ... DONE [18:41:16.245] run() for 'Future' ... [18:41:16.246] - state: 'created' [18:41:16.246] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:16.246] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:16.246] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:16.247] - Field: 'label' [18:41:16.247] - Field: 'local' [18:41:16.247] - Field: 'owner' [18:41:16.247] - Field: 'envir' [18:41:16.247] - Field: 'packages' [18:41:16.247] - Field: 'gc' [18:41:16.248] - Field: 'conditions' [18:41:16.248] - Field: 'expr' [18:41:16.248] - Field: 'uuid' [18:41:16.248] - Field: 'seed' [18:41:16.248] - Field: 'version' [18:41:16.248] - Field: 'result' [18:41:16.249] - Field: 'asynchronous' [18:41:16.249] - Field: 'calls' [18:41:16.249] - Field: 'globals' [18:41:16.249] - Field: 'stdout' [18:41:16.249] - Field: 'earlySignal' [18:41:16.249] - Field: 'lazy' [18:41:16.250] - Field: 'state' [18:41:16.250] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:16.250] - Launch lazy future ... [18:41:16.251] Packages needed by the future expression (n = 0): [18:41:16.251] Packages needed by future strategies (n = 0): [18:41:16.252] { [18:41:16.252] { [18:41:16.252] { [18:41:16.252] ...future.startTime <- base::Sys.time() [18:41:16.252] { [18:41:16.252] { [18:41:16.252] { [18:41:16.252] base::local({ [18:41:16.252] has_future <- base::requireNamespace("future", [18:41:16.252] quietly = TRUE) [18:41:16.252] if (has_future) { [18:41:16.252] ns <- base::getNamespace("future") [18:41:16.252] version <- ns[[".package"]][["version"]] [18:41:16.252] if (is.null(version)) [18:41:16.252] version <- utils::packageVersion("future") [18:41:16.252] } [18:41:16.252] else { [18:41:16.252] version <- NULL [18:41:16.252] } [18:41:16.252] if (!has_future || version < "1.8.0") { [18:41:16.252] info <- base::c(r_version = base::gsub("R version ", [18:41:16.252] "", base::R.version$version.string), [18:41:16.252] platform = base::sprintf("%s (%s-bit)", [18:41:16.252] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:16.252] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:16.252] "release", "version")], collapse = " "), [18:41:16.252] hostname = base::Sys.info()[["nodename"]]) [18:41:16.252] info <- base::sprintf("%s: %s", base::names(info), [18:41:16.252] info) [18:41:16.252] info <- base::paste(info, collapse = "; ") [18:41:16.252] if (!has_future) { [18:41:16.252] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:16.252] info) [18:41:16.252] } [18:41:16.252] else { [18:41:16.252] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:16.252] info, version) [18:41:16.252] } [18:41:16.252] base::stop(msg) [18:41:16.252] } [18:41:16.252] }) [18:41:16.252] } [18:41:16.252] ...future.strategy.old <- future::plan("list") [18:41:16.252] options(future.plan = NULL) [18:41:16.252] Sys.unsetenv("R_FUTURE_PLAN") [18:41:16.252] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:16.252] } [18:41:16.252] ...future.workdir <- getwd() [18:41:16.252] } [18:41:16.252] ...future.oldOptions <- base::as.list(base::.Options) [18:41:16.252] ...future.oldEnvVars <- base::Sys.getenv() [18:41:16.252] } [18:41:16.252] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:16.252] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:16.252] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:16.252] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:16.252] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:16.252] future.stdout.windows.reencode = NULL, width = 80L) [18:41:16.252] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:16.252] base::names(...future.oldOptions)) [18:41:16.252] } [18:41:16.252] if (FALSE) { [18:41:16.252] } [18:41:16.252] else { [18:41:16.252] if (TRUE) { [18:41:16.252] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:16.252] open = "w") [18:41:16.252] } [18:41:16.252] else { [18:41:16.252] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:16.252] windows = "NUL", "/dev/null"), open = "w") [18:41:16.252] } [18:41:16.252] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:16.252] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:16.252] base::sink(type = "output", split = FALSE) [18:41:16.252] base::close(...future.stdout) [18:41:16.252] }, add = TRUE) [18:41:16.252] } [18:41:16.252] ...future.frame <- base::sys.nframe() [18:41:16.252] ...future.conditions <- base::list() [18:41:16.252] ...future.rng <- base::globalenv()$.Random.seed [18:41:16.252] if (FALSE) { [18:41:16.252] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:16.252] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:16.252] } [18:41:16.252] ...future.result <- base::tryCatch({ [18:41:16.252] base::withCallingHandlers({ [18:41:16.252] ...future.value <- base::withVisible(base::local({ [18:41:16.252] do.call(function(...) { [18:41:16.252] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.252] if (!identical(...future.globals.maxSize.org, [18:41:16.252] ...future.globals.maxSize)) { [18:41:16.252] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.252] on.exit(options(oopts), add = TRUE) [18:41:16.252] } [18:41:16.252] { [18:41:16.252] lapply(seq_along(...future.elements_ii), [18:41:16.252] FUN = function(jj) { [18:41:16.252] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.252] ...future.FUN(...future.X_jj, ...) [18:41:16.252] }) [18:41:16.252] } [18:41:16.252] }, args = future.call.arguments) [18:41:16.252] })) [18:41:16.252] future::FutureResult(value = ...future.value$value, [18:41:16.252] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:16.252] ...future.rng), globalenv = if (FALSE) [18:41:16.252] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:16.252] ...future.globalenv.names)) [18:41:16.252] else NULL, started = ...future.startTime, version = "1.8") [18:41:16.252] }, condition = base::local({ [18:41:16.252] c <- base::c [18:41:16.252] inherits <- base::inherits [18:41:16.252] invokeRestart <- base::invokeRestart [18:41:16.252] length <- base::length [18:41:16.252] list <- base::list [18:41:16.252] seq.int <- base::seq.int [18:41:16.252] signalCondition <- base::signalCondition [18:41:16.252] sys.calls <- base::sys.calls [18:41:16.252] `[[` <- base::`[[` [18:41:16.252] `+` <- base::`+` [18:41:16.252] `<<-` <- base::`<<-` [18:41:16.252] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:16.252] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:16.252] 3L)] [18:41:16.252] } [18:41:16.252] function(cond) { [18:41:16.252] is_error <- inherits(cond, "error") [18:41:16.252] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:16.252] NULL) [18:41:16.252] if (is_error) { [18:41:16.252] sessionInformation <- function() { [18:41:16.252] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:16.252] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:16.252] search = base::search(), system = base::Sys.info()) [18:41:16.252] } [18:41:16.252] ...future.conditions[[length(...future.conditions) + [18:41:16.252] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:16.252] cond$call), session = sessionInformation(), [18:41:16.252] timestamp = base::Sys.time(), signaled = 0L) [18:41:16.252] signalCondition(cond) [18:41:16.252] } [18:41:16.252] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:16.252] "immediateCondition"))) { [18:41:16.252] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:16.252] ...future.conditions[[length(...future.conditions) + [18:41:16.252] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:16.252] if (TRUE && !signal) { [18:41:16.252] muffleCondition <- function (cond, pattern = "^muffle") [18:41:16.252] { [18:41:16.252] inherits <- base::inherits [18:41:16.252] invokeRestart <- base::invokeRestart [18:41:16.252] is.null <- base::is.null [18:41:16.252] muffled <- FALSE [18:41:16.252] if (inherits(cond, "message")) { [18:41:16.252] muffled <- grepl(pattern, "muffleMessage") [18:41:16.252] if (muffled) [18:41:16.252] invokeRestart("muffleMessage") [18:41:16.252] } [18:41:16.252] else if (inherits(cond, "warning")) { [18:41:16.252] muffled <- grepl(pattern, "muffleWarning") [18:41:16.252] if (muffled) [18:41:16.252] invokeRestart("muffleWarning") [18:41:16.252] } [18:41:16.252] else if (inherits(cond, "condition")) { [18:41:16.252] if (!is.null(pattern)) { [18:41:16.252] computeRestarts <- base::computeRestarts [18:41:16.252] grepl <- base::grepl [18:41:16.252] restarts <- computeRestarts(cond) [18:41:16.252] for (restart in restarts) { [18:41:16.252] name <- restart$name [18:41:16.252] if (is.null(name)) [18:41:16.252] next [18:41:16.252] if (!grepl(pattern, name)) [18:41:16.252] next [18:41:16.252] invokeRestart(restart) [18:41:16.252] muffled <- TRUE [18:41:16.252] break [18:41:16.252] } [18:41:16.252] } [18:41:16.252] } [18:41:16.252] invisible(muffled) [18:41:16.252] } [18:41:16.252] muffleCondition(cond, pattern = "^muffle") [18:41:16.252] } [18:41:16.252] } [18:41:16.252] else { [18:41:16.252] if (TRUE) { [18:41:16.252] muffleCondition <- function (cond, pattern = "^muffle") [18:41:16.252] { [18:41:16.252] inherits <- base::inherits [18:41:16.252] invokeRestart <- base::invokeRestart [18:41:16.252] is.null <- base::is.null [18:41:16.252] muffled <- FALSE [18:41:16.252] if (inherits(cond, "message")) { [18:41:16.252] muffled <- grepl(pattern, "muffleMessage") [18:41:16.252] if (muffled) [18:41:16.252] invokeRestart("muffleMessage") [18:41:16.252] } [18:41:16.252] else if (inherits(cond, "warning")) { [18:41:16.252] muffled <- grepl(pattern, "muffleWarning") [18:41:16.252] if (muffled) [18:41:16.252] invokeRestart("muffleWarning") [18:41:16.252] } [18:41:16.252] else if (inherits(cond, "condition")) { [18:41:16.252] if (!is.null(pattern)) { [18:41:16.252] computeRestarts <- base::computeRestarts [18:41:16.252] grepl <- base::grepl [18:41:16.252] restarts <- computeRestarts(cond) [18:41:16.252] for (restart in restarts) { [18:41:16.252] name <- restart$name [18:41:16.252] if (is.null(name)) [18:41:16.252] next [18:41:16.252] if (!grepl(pattern, name)) [18:41:16.252] next [18:41:16.252] invokeRestart(restart) [18:41:16.252] muffled <- TRUE [18:41:16.252] break [18:41:16.252] } [18:41:16.252] } [18:41:16.252] } [18:41:16.252] invisible(muffled) [18:41:16.252] } [18:41:16.252] muffleCondition(cond, pattern = "^muffle") [18:41:16.252] } [18:41:16.252] } [18:41:16.252] } [18:41:16.252] })) [18:41:16.252] }, error = function(ex) { [18:41:16.252] base::structure(base::list(value = NULL, visible = NULL, [18:41:16.252] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:16.252] ...future.rng), started = ...future.startTime, [18:41:16.252] finished = Sys.time(), session_uuid = NA_character_, [18:41:16.252] version = "1.8"), class = "FutureResult") [18:41:16.252] }, finally = { [18:41:16.252] if (!identical(...future.workdir, getwd())) [18:41:16.252] setwd(...future.workdir) [18:41:16.252] { [18:41:16.252] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:16.252] ...future.oldOptions$nwarnings <- NULL [18:41:16.252] } [18:41:16.252] base::options(...future.oldOptions) [18:41:16.252] if (.Platform$OS.type == "windows") { [18:41:16.252] old_names <- names(...future.oldEnvVars) [18:41:16.252] envs <- base::Sys.getenv() [18:41:16.252] names <- names(envs) [18:41:16.252] common <- intersect(names, old_names) [18:41:16.252] added <- setdiff(names, old_names) [18:41:16.252] removed <- setdiff(old_names, names) [18:41:16.252] changed <- common[...future.oldEnvVars[common] != [18:41:16.252] envs[common]] [18:41:16.252] NAMES <- toupper(changed) [18:41:16.252] args <- list() [18:41:16.252] for (kk in seq_along(NAMES)) { [18:41:16.252] name <- changed[[kk]] [18:41:16.252] NAME <- NAMES[[kk]] [18:41:16.252] if (name != NAME && is.element(NAME, old_names)) [18:41:16.252] next [18:41:16.252] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:16.252] } [18:41:16.252] NAMES <- toupper(added) [18:41:16.252] for (kk in seq_along(NAMES)) { [18:41:16.252] name <- added[[kk]] [18:41:16.252] NAME <- NAMES[[kk]] [18:41:16.252] if (name != NAME && is.element(NAME, old_names)) [18:41:16.252] next [18:41:16.252] args[[name]] <- "" [18:41:16.252] } [18:41:16.252] NAMES <- toupper(removed) [18:41:16.252] for (kk in seq_along(NAMES)) { [18:41:16.252] name <- removed[[kk]] [18:41:16.252] NAME <- NAMES[[kk]] [18:41:16.252] if (name != NAME && is.element(NAME, old_names)) [18:41:16.252] next [18:41:16.252] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:16.252] } [18:41:16.252] if (length(args) > 0) [18:41:16.252] base::do.call(base::Sys.setenv, args = args) [18:41:16.252] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:16.252] } [18:41:16.252] else { [18:41:16.252] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:16.252] } [18:41:16.252] { [18:41:16.252] if (base::length(...future.futureOptionsAdded) > [18:41:16.252] 0L) { [18:41:16.252] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:16.252] base::names(opts) <- ...future.futureOptionsAdded [18:41:16.252] base::options(opts) [18:41:16.252] } [18:41:16.252] { [18:41:16.252] { [18:41:16.252] NULL [18:41:16.252] RNGkind("Mersenne-Twister") [18:41:16.252] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:16.252] inherits = FALSE) [18:41:16.252] } [18:41:16.252] options(future.plan = NULL) [18:41:16.252] if (is.na(NA_character_)) [18:41:16.252] Sys.unsetenv("R_FUTURE_PLAN") [18:41:16.252] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:16.252] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:16.252] .init = FALSE) [18:41:16.252] } [18:41:16.252] } [18:41:16.252] } [18:41:16.252] }) [18:41:16.252] if (TRUE) { [18:41:16.252] base::sink(type = "output", split = FALSE) [18:41:16.252] if (TRUE) { [18:41:16.252] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:16.252] } [18:41:16.252] else { [18:41:16.252] ...future.result["stdout"] <- base::list(NULL) [18:41:16.252] } [18:41:16.252] base::close(...future.stdout) [18:41:16.252] ...future.stdout <- NULL [18:41:16.252] } [18:41:16.252] ...future.result$conditions <- ...future.conditions [18:41:16.252] ...future.result$finished <- base::Sys.time() [18:41:16.252] ...future.result [18:41:16.252] } [18:41:16.256] assign_globals() ... [18:41:16.256] List of 5 [18:41:16.256] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:16.256] $ future.call.arguments :List of 1 [18:41:16.256] ..$ length: int 2 [18:41:16.256] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:16.256] $ ...future.elements_ii :List of 1 [18:41:16.256] ..$ c: chr "character" [18:41:16.256] $ ...future.seeds_ii : NULL [18:41:16.256] $ ...future.globals.maxSize: NULL [18:41:16.256] - attr(*, "where")=List of 5 [18:41:16.256] ..$ ...future.FUN : [18:41:16.256] ..$ future.call.arguments : [18:41:16.256] ..$ ...future.elements_ii : [18:41:16.256] ..$ ...future.seeds_ii : [18:41:16.256] ..$ ...future.globals.maxSize: [18:41:16.256] - attr(*, "resolved")= logi FALSE [18:41:16.256] - attr(*, "total_size")= num 4324 [18:41:16.256] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:16.256] - attr(*, "already-done")= logi TRUE [18:41:16.262] - copied '...future.FUN' to environment [18:41:16.262] - copied 'future.call.arguments' to environment [18:41:16.262] - copied '...future.elements_ii' to environment [18:41:16.262] - copied '...future.seeds_ii' to environment [18:41:16.262] - copied '...future.globals.maxSize' to environment [18:41:16.263] assign_globals() ... done [18:41:16.263] plan(): Setting new future strategy stack: [18:41:16.263] List of future strategies: [18:41:16.263] 1. sequential: [18:41:16.263] - args: function (..., envir = parent.frame(), workers = "") [18:41:16.263] - tweaked: FALSE [18:41:16.263] - call: NULL [18:41:16.264] plan(): nbrOfWorkers() = 1 [18:41:16.265] plan(): Setting new future strategy stack: [18:41:16.265] List of future strategies: [18:41:16.265] 1. sequential: [18:41:16.265] - args: function (..., envir = parent.frame(), workers = "") [18:41:16.265] - tweaked: FALSE [18:41:16.265] - call: plan(strategy) [18:41:16.266] plan(): nbrOfWorkers() = 1 [18:41:16.266] SequentialFuture started (and completed) [18:41:16.266] - Launch lazy future ... done [18:41:16.266] run() for 'SequentialFuture' ... done [18:41:16.267] Created future: [18:41:16.267] SequentialFuture: [18:41:16.267] Label: 'future_lapply-3' [18:41:16.267] Expression: [18:41:16.267] { [18:41:16.267] do.call(function(...) { [18:41:16.267] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.267] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:16.267] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.267] on.exit(options(oopts), add = TRUE) [18:41:16.267] } [18:41:16.267] { [18:41:16.267] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:16.267] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.267] ...future.FUN(...future.X_jj, ...) [18:41:16.267] }) [18:41:16.267] } [18:41:16.267] }, args = future.call.arguments) [18:41:16.267] } [18:41:16.267] Lazy evaluation: FALSE [18:41:16.267] Asynchronous evaluation: FALSE [18:41:16.267] Local evaluation: TRUE [18:41:16.267] Environment: R_GlobalEnv [18:41:16.267] Capture standard output: TRUE [18:41:16.267] Capture condition classes: 'condition' (excluding 'nothing') [18:41:16.267] Globals: 5 objects totaling 760 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 98 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:16.267] Packages: [18:41:16.267] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:16.267] Resolved: TRUE [18:41:16.267] Value: 55 bytes of class 'list' [18:41:16.267] Early signaling: FALSE [18:41:16.267] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:16.267] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:16.268] Chunk #3 of 4 ... DONE [18:41:16.268] Chunk #4 of 4 ... [18:41:16.268] - Finding globals in 'X' for chunk #4 ... [18:41:16.268] getGlobalsAndPackages() ... [18:41:16.268] Searching for globals... [18:41:16.269] [18:41:16.269] Searching for globals ... DONE [18:41:16.269] - globals: [0] [18:41:16.269] getGlobalsAndPackages() ... DONE [18:41:16.269] + additional globals found: [n=0] [18:41:16.270] + additional namespaces needed: [n=0] [18:41:16.270] - Finding globals in 'X' for chunk #4 ... DONE [18:41:16.270] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:16.270] - seeds: [18:41:16.270] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.270] getGlobalsAndPackages() ... [18:41:16.270] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.271] Resolving globals: FALSE [18:41:16.271] Tweak future expression to call with '...' arguments ... [18:41:16.271] { [18:41:16.271] do.call(function(...) { [18:41:16.271] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.271] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:16.271] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.271] on.exit(options(oopts), add = TRUE) [18:41:16.271] } [18:41:16.271] { [18:41:16.271] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:16.271] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.271] ...future.FUN(...future.X_jj, ...) [18:41:16.271] }) [18:41:16.271] } [18:41:16.271] }, args = future.call.arguments) [18:41:16.271] } [18:41:16.271] Tweak future expression to call with '...' arguments ... DONE [18:41:16.272] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.272] [18:41:16.272] getGlobalsAndPackages() ... DONE [18:41:16.273] run() for 'Future' ... [18:41:16.273] - state: 'created' [18:41:16.273] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:16.273] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:16.274] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:16.274] - Field: 'label' [18:41:16.274] - Field: 'local' [18:41:16.274] - Field: 'owner' [18:41:16.274] - Field: 'envir' [18:41:16.274] - Field: 'packages' [18:41:16.275] - Field: 'gc' [18:41:16.275] - Field: 'conditions' [18:41:16.275] - Field: 'expr' [18:41:16.275] - Field: 'uuid' [18:41:16.275] - Field: 'seed' [18:41:16.275] - Field: 'version' [18:41:16.276] - Field: 'result' [18:41:16.276] - Field: 'asynchronous' [18:41:16.276] - Field: 'calls' [18:41:16.276] - Field: 'globals' [18:41:16.276] - Field: 'stdout' [18:41:16.276] - Field: 'earlySignal' [18:41:16.277] - Field: 'lazy' [18:41:16.277] - Field: 'state' [18:41:16.277] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:16.277] - Launch lazy future ... [18:41:16.277] Packages needed by the future expression (n = 0): [18:41:16.278] Packages needed by future strategies (n = 0): [18:41:16.279] { [18:41:16.279] { [18:41:16.279] { [18:41:16.279] ...future.startTime <- base::Sys.time() [18:41:16.279] { [18:41:16.279] { [18:41:16.279] { [18:41:16.279] base::local({ [18:41:16.279] has_future <- base::requireNamespace("future", [18:41:16.279] quietly = TRUE) [18:41:16.279] if (has_future) { [18:41:16.279] ns <- base::getNamespace("future") [18:41:16.279] version <- ns[[".package"]][["version"]] [18:41:16.279] if (is.null(version)) [18:41:16.279] version <- utils::packageVersion("future") [18:41:16.279] } [18:41:16.279] else { [18:41:16.279] version <- NULL [18:41:16.279] } [18:41:16.279] if (!has_future || version < "1.8.0") { [18:41:16.279] info <- base::c(r_version = base::gsub("R version ", [18:41:16.279] "", base::R.version$version.string), [18:41:16.279] platform = base::sprintf("%s (%s-bit)", [18:41:16.279] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:16.279] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:16.279] "release", "version")], collapse = " "), [18:41:16.279] hostname = base::Sys.info()[["nodename"]]) [18:41:16.279] info <- base::sprintf("%s: %s", base::names(info), [18:41:16.279] info) [18:41:16.279] info <- base::paste(info, collapse = "; ") [18:41:16.279] if (!has_future) { [18:41:16.279] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:16.279] info) [18:41:16.279] } [18:41:16.279] else { [18:41:16.279] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:16.279] info, version) [18:41:16.279] } [18:41:16.279] base::stop(msg) [18:41:16.279] } [18:41:16.279] }) [18:41:16.279] } [18:41:16.279] ...future.strategy.old <- future::plan("list") [18:41:16.279] options(future.plan = NULL) [18:41:16.279] Sys.unsetenv("R_FUTURE_PLAN") [18:41:16.279] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:16.279] } [18:41:16.279] ...future.workdir <- getwd() [18:41:16.279] } [18:41:16.279] ...future.oldOptions <- base::as.list(base::.Options) [18:41:16.279] ...future.oldEnvVars <- base::Sys.getenv() [18:41:16.279] } [18:41:16.279] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:16.279] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:16.279] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:16.279] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:16.279] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:16.279] future.stdout.windows.reencode = NULL, width = 80L) [18:41:16.279] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:16.279] base::names(...future.oldOptions)) [18:41:16.279] } [18:41:16.279] if (FALSE) { [18:41:16.279] } [18:41:16.279] else { [18:41:16.279] if (TRUE) { [18:41:16.279] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:16.279] open = "w") [18:41:16.279] } [18:41:16.279] else { [18:41:16.279] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:16.279] windows = "NUL", "/dev/null"), open = "w") [18:41:16.279] } [18:41:16.279] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:16.279] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:16.279] base::sink(type = "output", split = FALSE) [18:41:16.279] base::close(...future.stdout) [18:41:16.279] }, add = TRUE) [18:41:16.279] } [18:41:16.279] ...future.frame <- base::sys.nframe() [18:41:16.279] ...future.conditions <- base::list() [18:41:16.279] ...future.rng <- base::globalenv()$.Random.seed [18:41:16.279] if (FALSE) { [18:41:16.279] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:16.279] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:16.279] } [18:41:16.279] ...future.result <- base::tryCatch({ [18:41:16.279] base::withCallingHandlers({ [18:41:16.279] ...future.value <- base::withVisible(base::local({ [18:41:16.279] do.call(function(...) { [18:41:16.279] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.279] if (!identical(...future.globals.maxSize.org, [18:41:16.279] ...future.globals.maxSize)) { [18:41:16.279] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.279] on.exit(options(oopts), add = TRUE) [18:41:16.279] } [18:41:16.279] { [18:41:16.279] lapply(seq_along(...future.elements_ii), [18:41:16.279] FUN = function(jj) { [18:41:16.279] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.279] ...future.FUN(...future.X_jj, ...) [18:41:16.279] }) [18:41:16.279] } [18:41:16.279] }, args = future.call.arguments) [18:41:16.279] })) [18:41:16.279] future::FutureResult(value = ...future.value$value, [18:41:16.279] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:16.279] ...future.rng), globalenv = if (FALSE) [18:41:16.279] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:16.279] ...future.globalenv.names)) [18:41:16.279] else NULL, started = ...future.startTime, version = "1.8") [18:41:16.279] }, condition = base::local({ [18:41:16.279] c <- base::c [18:41:16.279] inherits <- base::inherits [18:41:16.279] invokeRestart <- base::invokeRestart [18:41:16.279] length <- base::length [18:41:16.279] list <- base::list [18:41:16.279] seq.int <- base::seq.int [18:41:16.279] signalCondition <- base::signalCondition [18:41:16.279] sys.calls <- base::sys.calls [18:41:16.279] `[[` <- base::`[[` [18:41:16.279] `+` <- base::`+` [18:41:16.279] `<<-` <- base::`<<-` [18:41:16.279] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:16.279] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:16.279] 3L)] [18:41:16.279] } [18:41:16.279] function(cond) { [18:41:16.279] is_error <- inherits(cond, "error") [18:41:16.279] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:16.279] NULL) [18:41:16.279] if (is_error) { [18:41:16.279] sessionInformation <- function() { [18:41:16.279] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:16.279] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:16.279] search = base::search(), system = base::Sys.info()) [18:41:16.279] } [18:41:16.279] ...future.conditions[[length(...future.conditions) + [18:41:16.279] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:16.279] cond$call), session = sessionInformation(), [18:41:16.279] timestamp = base::Sys.time(), signaled = 0L) [18:41:16.279] signalCondition(cond) [18:41:16.279] } [18:41:16.279] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:16.279] "immediateCondition"))) { [18:41:16.279] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:16.279] ...future.conditions[[length(...future.conditions) + [18:41:16.279] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:16.279] if (TRUE && !signal) { [18:41:16.279] muffleCondition <- function (cond, pattern = "^muffle") [18:41:16.279] { [18:41:16.279] inherits <- base::inherits [18:41:16.279] invokeRestart <- base::invokeRestart [18:41:16.279] is.null <- base::is.null [18:41:16.279] muffled <- FALSE [18:41:16.279] if (inherits(cond, "message")) { [18:41:16.279] muffled <- grepl(pattern, "muffleMessage") [18:41:16.279] if (muffled) [18:41:16.279] invokeRestart("muffleMessage") [18:41:16.279] } [18:41:16.279] else if (inherits(cond, "warning")) { [18:41:16.279] muffled <- grepl(pattern, "muffleWarning") [18:41:16.279] if (muffled) [18:41:16.279] invokeRestart("muffleWarning") [18:41:16.279] } [18:41:16.279] else if (inherits(cond, "condition")) { [18:41:16.279] if (!is.null(pattern)) { [18:41:16.279] computeRestarts <- base::computeRestarts [18:41:16.279] grepl <- base::grepl [18:41:16.279] restarts <- computeRestarts(cond) [18:41:16.279] for (restart in restarts) { [18:41:16.279] name <- restart$name [18:41:16.279] if (is.null(name)) [18:41:16.279] next [18:41:16.279] if (!grepl(pattern, name)) [18:41:16.279] next [18:41:16.279] invokeRestart(restart) [18:41:16.279] muffled <- TRUE [18:41:16.279] break [18:41:16.279] } [18:41:16.279] } [18:41:16.279] } [18:41:16.279] invisible(muffled) [18:41:16.279] } [18:41:16.279] muffleCondition(cond, pattern = "^muffle") [18:41:16.279] } [18:41:16.279] } [18:41:16.279] else { [18:41:16.279] if (TRUE) { [18:41:16.279] muffleCondition <- function (cond, pattern = "^muffle") [18:41:16.279] { [18:41:16.279] inherits <- base::inherits [18:41:16.279] invokeRestart <- base::invokeRestart [18:41:16.279] is.null <- base::is.null [18:41:16.279] muffled <- FALSE [18:41:16.279] if (inherits(cond, "message")) { [18:41:16.279] muffled <- grepl(pattern, "muffleMessage") [18:41:16.279] if (muffled) [18:41:16.279] invokeRestart("muffleMessage") [18:41:16.279] } [18:41:16.279] else if (inherits(cond, "warning")) { [18:41:16.279] muffled <- grepl(pattern, "muffleWarning") [18:41:16.279] if (muffled) [18:41:16.279] invokeRestart("muffleWarning") [18:41:16.279] } [18:41:16.279] else if (inherits(cond, "condition")) { [18:41:16.279] if (!is.null(pattern)) { [18:41:16.279] computeRestarts <- base::computeRestarts [18:41:16.279] grepl <- base::grepl [18:41:16.279] restarts <- computeRestarts(cond) [18:41:16.279] for (restart in restarts) { [18:41:16.279] name <- restart$name [18:41:16.279] if (is.null(name)) [18:41:16.279] next [18:41:16.279] if (!grepl(pattern, name)) [18:41:16.279] next [18:41:16.279] invokeRestart(restart) [18:41:16.279] muffled <- TRUE [18:41:16.279] break [18:41:16.279] } [18:41:16.279] } [18:41:16.279] } [18:41:16.279] invisible(muffled) [18:41:16.279] } [18:41:16.279] muffleCondition(cond, pattern = "^muffle") [18:41:16.279] } [18:41:16.279] } [18:41:16.279] } [18:41:16.279] })) [18:41:16.279] }, error = function(ex) { [18:41:16.279] base::structure(base::list(value = NULL, visible = NULL, [18:41:16.279] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:16.279] ...future.rng), started = ...future.startTime, [18:41:16.279] finished = Sys.time(), session_uuid = NA_character_, [18:41:16.279] version = "1.8"), class = "FutureResult") [18:41:16.279] }, finally = { [18:41:16.279] if (!identical(...future.workdir, getwd())) [18:41:16.279] setwd(...future.workdir) [18:41:16.279] { [18:41:16.279] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:16.279] ...future.oldOptions$nwarnings <- NULL [18:41:16.279] } [18:41:16.279] base::options(...future.oldOptions) [18:41:16.279] if (.Platform$OS.type == "windows") { [18:41:16.279] old_names <- names(...future.oldEnvVars) [18:41:16.279] envs <- base::Sys.getenv() [18:41:16.279] names <- names(envs) [18:41:16.279] common <- intersect(names, old_names) [18:41:16.279] added <- setdiff(names, old_names) [18:41:16.279] removed <- setdiff(old_names, names) [18:41:16.279] changed <- common[...future.oldEnvVars[common] != [18:41:16.279] envs[common]] [18:41:16.279] NAMES <- toupper(changed) [18:41:16.279] args <- list() [18:41:16.279] for (kk in seq_along(NAMES)) { [18:41:16.279] name <- changed[[kk]] [18:41:16.279] NAME <- NAMES[[kk]] [18:41:16.279] if (name != NAME && is.element(NAME, old_names)) [18:41:16.279] next [18:41:16.279] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:16.279] } [18:41:16.279] NAMES <- toupper(added) [18:41:16.279] for (kk in seq_along(NAMES)) { [18:41:16.279] name <- added[[kk]] [18:41:16.279] NAME <- NAMES[[kk]] [18:41:16.279] if (name != NAME && is.element(NAME, old_names)) [18:41:16.279] next [18:41:16.279] args[[name]] <- "" [18:41:16.279] } [18:41:16.279] NAMES <- toupper(removed) [18:41:16.279] for (kk in seq_along(NAMES)) { [18:41:16.279] name <- removed[[kk]] [18:41:16.279] NAME <- NAMES[[kk]] [18:41:16.279] if (name != NAME && is.element(NAME, old_names)) [18:41:16.279] next [18:41:16.279] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:16.279] } [18:41:16.279] if (length(args) > 0) [18:41:16.279] base::do.call(base::Sys.setenv, args = args) [18:41:16.279] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:16.279] } [18:41:16.279] else { [18:41:16.279] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:16.279] } [18:41:16.279] { [18:41:16.279] if (base::length(...future.futureOptionsAdded) > [18:41:16.279] 0L) { [18:41:16.279] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:16.279] base::names(opts) <- ...future.futureOptionsAdded [18:41:16.279] base::options(opts) [18:41:16.279] } [18:41:16.279] { [18:41:16.279] { [18:41:16.279] NULL [18:41:16.279] RNGkind("Mersenne-Twister") [18:41:16.279] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:16.279] inherits = FALSE) [18:41:16.279] } [18:41:16.279] options(future.plan = NULL) [18:41:16.279] if (is.na(NA_character_)) [18:41:16.279] Sys.unsetenv("R_FUTURE_PLAN") [18:41:16.279] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:16.279] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:16.279] .init = FALSE) [18:41:16.279] } [18:41:16.279] } [18:41:16.279] } [18:41:16.279] }) [18:41:16.279] if (TRUE) { [18:41:16.279] base::sink(type = "output", split = FALSE) [18:41:16.279] if (TRUE) { [18:41:16.279] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:16.279] } [18:41:16.279] else { [18:41:16.279] ...future.result["stdout"] <- base::list(NULL) [18:41:16.279] } [18:41:16.279] base::close(...future.stdout) [18:41:16.279] ...future.stdout <- NULL [18:41:16.279] } [18:41:16.279] ...future.result$conditions <- ...future.conditions [18:41:16.279] ...future.result$finished <- base::Sys.time() [18:41:16.279] ...future.result [18:41:16.279] } [18:41:16.283] assign_globals() ... [18:41:16.283] List of 5 [18:41:16.283] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:16.283] $ future.call.arguments :List of 1 [18:41:16.283] ..$ length: int 2 [18:41:16.283] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:16.283] $ ...future.elements_ii :List of 1 [18:41:16.283] ..$ c: chr "list" [18:41:16.283] $ ...future.seeds_ii : NULL [18:41:16.283] $ ...future.globals.maxSize: NULL [18:41:16.283] - attr(*, "where")=List of 5 [18:41:16.283] ..$ ...future.FUN : [18:41:16.283] ..$ future.call.arguments : [18:41:16.283] ..$ ...future.elements_ii : [18:41:16.283] ..$ ...future.seeds_ii : [18:41:16.283] ..$ ...future.globals.maxSize: [18:41:16.283] - attr(*, "resolved")= logi FALSE [18:41:16.283] - attr(*, "total_size")= num 4324 [18:41:16.283] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:16.283] - attr(*, "already-done")= logi TRUE [18:41:16.289] - copied '...future.FUN' to environment [18:41:16.289] - copied 'future.call.arguments' to environment [18:41:16.289] - copied '...future.elements_ii' to environment [18:41:16.289] - copied '...future.seeds_ii' to environment [18:41:16.289] - copied '...future.globals.maxSize' to environment [18:41:16.290] assign_globals() ... done [18:41:16.290] plan(): Setting new future strategy stack: [18:41:16.290] List of future strategies: [18:41:16.290] 1. sequential: [18:41:16.290] - args: function (..., envir = parent.frame(), workers = "") [18:41:16.290] - tweaked: FALSE [18:41:16.290] - call: NULL [18:41:16.291] plan(): nbrOfWorkers() = 1 [18:41:16.292] plan(): Setting new future strategy stack: [18:41:16.292] List of future strategies: [18:41:16.292] 1. sequential: [18:41:16.292] - args: function (..., envir = parent.frame(), workers = "") [18:41:16.292] - tweaked: FALSE [18:41:16.292] - call: plan(strategy) [18:41:16.293] plan(): nbrOfWorkers() = 1 [18:41:16.293] SequentialFuture started (and completed) [18:41:16.293] - Launch lazy future ... done [18:41:16.293] run() for 'SequentialFuture' ... done [18:41:16.293] Created future: [18:41:16.294] SequentialFuture: [18:41:16.294] Label: 'future_lapply-4' [18:41:16.294] Expression: [18:41:16.294] { [18:41:16.294] do.call(function(...) { [18:41:16.294] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.294] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:16.294] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.294] on.exit(options(oopts), add = TRUE) [18:41:16.294] } [18:41:16.294] { [18:41:16.294] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:16.294] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.294] ...future.FUN(...future.X_jj, ...) [18:41:16.294] }) [18:41:16.294] } [18:41:16.294] }, args = future.call.arguments) [18:41:16.294] } [18:41:16.294] Lazy evaluation: FALSE [18:41:16.294] Asynchronous evaluation: FALSE [18:41:16.294] Local evaluation: TRUE [18:41:16.294] Environment: R_GlobalEnv [18:41:16.294] Capture standard output: TRUE [18:41:16.294] Capture condition classes: 'condition' (excluding 'nothing') [18:41:16.294] Globals: 5 objects totaling 755 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 93 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:16.294] Packages: [18:41:16.294] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:16.294] Resolved: TRUE [18:41:16.294] Value: 47 bytes of class 'list' [18:41:16.294] Early signaling: FALSE [18:41:16.294] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:16.294] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:16.295] Chunk #4 of 4 ... DONE [18:41:16.295] Launching 4 futures (chunks) ... DONE [18:41:16.295] Resolving 4 futures (chunks) ... [18:41:16.295] resolve() on list ... [18:41:16.295] recursive: 0 [18:41:16.295] length: 4 [18:41:16.296] [18:41:16.296] resolved() for 'SequentialFuture' ... [18:41:16.296] - state: 'finished' [18:41:16.296] - run: TRUE [18:41:16.296] - result: 'FutureResult' [18:41:16.297] resolved() for 'SequentialFuture' ... done [18:41:16.297] Future #1 [18:41:16.297] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:16.297] - nx: 4 [18:41:16.297] - relay: TRUE [18:41:16.297] - stdout: TRUE [18:41:16.298] - signal: TRUE [18:41:16.298] - resignal: FALSE [18:41:16.298] - force: TRUE [18:41:16.298] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [18:41:16.298] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:41:16.298] - until=1 [18:41:16.299] - relaying element #1 [18:41:16.299] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:16.299] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:16.299] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:16.299] length: 3 (resolved future 1) [18:41:16.300] resolved() for 'SequentialFuture' ... [18:41:16.300] - state: 'finished' [18:41:16.300] - run: TRUE [18:41:16.300] - result: 'FutureResult' [18:41:16.300] resolved() for 'SequentialFuture' ... done [18:41:16.300] Future #2 [18:41:16.301] signalConditionsASAP(SequentialFuture, pos=2) ... [18:41:16.301] - nx: 4 [18:41:16.301] - relay: TRUE [18:41:16.301] - stdout: TRUE [18:41:16.301] - signal: TRUE [18:41:16.301] - resignal: FALSE [18:41:16.302] - force: TRUE [18:41:16.302] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:16.302] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:16.302] - until=2 [18:41:16.302] - relaying element #2 [18:41:16.302] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:16.303] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:16.303] signalConditionsASAP(SequentialFuture, pos=2) ... done [18:41:16.303] length: 2 (resolved future 2) [18:41:16.303] resolved() for 'SequentialFuture' ... [18:41:16.303] - state: 'finished' [18:41:16.304] - run: TRUE [18:41:16.304] - result: 'FutureResult' [18:41:16.304] resolved() for 'SequentialFuture' ... done [18:41:16.304] Future #3 [18:41:16.304] signalConditionsASAP(SequentialFuture, pos=3) ... [18:41:16.304] - nx: 4 [18:41:16.305] - relay: TRUE [18:41:16.305] - stdout: TRUE [18:41:16.306] - signal: TRUE [18:41:16.306] - resignal: FALSE [18:41:16.306] - force: TRUE [18:41:16.306] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:16.306] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:16.306] - until=3 [18:41:16.307] - relaying element #3 [18:41:16.307] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:16.307] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:16.307] signalConditionsASAP(SequentialFuture, pos=3) ... done [18:41:16.307] length: 1 (resolved future 3) [18:41:16.307] resolved() for 'SequentialFuture' ... [18:41:16.308] - state: 'finished' [18:41:16.308] - run: TRUE [18:41:16.308] - result: 'FutureResult' [18:41:16.308] resolved() for 'SequentialFuture' ... done [18:41:16.308] Future #4 [18:41:16.309] signalConditionsASAP(SequentialFuture, pos=4) ... [18:41:16.309] - nx: 4 [18:41:16.309] - relay: TRUE [18:41:16.309] - stdout: TRUE [18:41:16.309] - signal: TRUE [18:41:16.309] - resignal: FALSE [18:41:16.309] - force: TRUE [18:41:16.310] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:16.310] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:16.310] - until=4 [18:41:16.310] - relaying element #4 [18:41:16.310] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:16.311] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:16.311] signalConditionsASAP(SequentialFuture, pos=4) ... done [18:41:16.311] length: 0 (resolved future 4) [18:41:16.311] Relaying remaining futures [18:41:16.311] signalConditionsASAP(NULL, pos=0) ... [18:41:16.311] - nx: 4 [18:41:16.311] - relay: TRUE [18:41:16.312] - stdout: TRUE [18:41:16.312] - signal: TRUE [18:41:16.312] - resignal: FALSE [18:41:16.312] - force: TRUE [18:41:16.312] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:16.312] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [18:41:16.313] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:16.313] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:16.313] signalConditionsASAP(NULL, pos=0) ... done [18:41:16.313] resolve() on list ... DONE [18:41:16.313] - Number of value chunks collected: 4 [18:41:16.314] Resolving 4 futures (chunks) ... DONE [18:41:16.314] Reducing values from 4 chunks ... [18:41:16.314] - Number of values collected after concatenation: 4 [18:41:16.314] - Number of values expected: 4 [18:41:16.314] Reducing values from 4 chunks ... DONE [18:41:16.314] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL - future_lapply(x, FUN = base::vector, ...) ... [18:41:16.317] future_lapply() ... [18:41:16.318] Number of chunks: 4 [18:41:16.318] getGlobalsAndPackagesXApply() ... [18:41:16.318] - future.globals: TRUE [18:41:16.318] getGlobalsAndPackages() ... [18:41:16.319] Searching for globals... [18:41:16.320] - globals found: [2] 'FUN', '.Internal' [18:41:16.320] Searching for globals ... DONE [18:41:16.320] Resolving globals: FALSE [18:41:16.321] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:16.321] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:16.321] - globals: [1] 'FUN' [18:41:16.321] [18:41:16.322] getGlobalsAndPackages() ... DONE [18:41:16.322] - globals found/used: [n=1] 'FUN' [18:41:16.322] - needed namespaces: [n=0] [18:41:16.322] Finding globals ... DONE [18:41:16.322] - use_args: TRUE [18:41:16.322] - Getting '...' globals ... [18:41:16.323] resolve() on list ... [18:41:16.323] recursive: 0 [18:41:16.323] length: 1 [18:41:16.323] elements: '...' [18:41:16.323] length: 0 (resolved future 1) [18:41:16.324] resolve() on list ... DONE [18:41:16.324] - '...' content: [n=1] 'length' [18:41:16.324] List of 1 [18:41:16.324] $ ...:List of 1 [18:41:16.324] ..$ length: int 2 [18:41:16.324] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:16.324] - attr(*, "where")=List of 1 [18:41:16.324] ..$ ...: [18:41:16.324] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:16.324] - attr(*, "resolved")= logi TRUE [18:41:16.324] - attr(*, "total_size")= num NA [18:41:16.327] - Getting '...' globals ... DONE [18:41:16.327] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:16.328] List of 2 [18:41:16.328] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:16.328] $ ... :List of 1 [18:41:16.328] ..$ length: int 2 [18:41:16.328] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:16.328] - attr(*, "where")=List of 2 [18:41:16.328] ..$ ...future.FUN: [18:41:16.328] ..$ ... : [18:41:16.328] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:16.328] - attr(*, "resolved")= logi FALSE [18:41:16.328] - attr(*, "total_size")= int 4406 [18:41:16.332] Packages to be attached in all futures: [n=0] [18:41:16.332] getGlobalsAndPackagesXApply() ... DONE [18:41:16.332] Number of futures (= number of chunks): 4 [18:41:16.333] Launching 4 futures (chunks) ... [18:41:16.333] Chunk #1 of 4 ... [18:41:16.333] - Finding globals in 'X' for chunk #1 ... [18:41:16.333] getGlobalsAndPackages() ... [18:41:16.333] Searching for globals... [18:41:16.334] [18:41:16.334] Searching for globals ... DONE [18:41:16.334] - globals: [0] [18:41:16.334] getGlobalsAndPackages() ... DONE [18:41:16.334] + additional globals found: [n=0] [18:41:16.334] + additional namespaces needed: [n=0] [18:41:16.334] - Finding globals in 'X' for chunk #1 ... DONE [18:41:16.335] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:16.335] - seeds: [18:41:16.335] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.335] getGlobalsAndPackages() ... [18:41:16.335] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.335] Resolving globals: FALSE [18:41:16.336] Tweak future expression to call with '...' arguments ... [18:41:16.336] { [18:41:16.336] do.call(function(...) { [18:41:16.336] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.336] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:16.336] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.336] on.exit(options(oopts), add = TRUE) [18:41:16.336] } [18:41:16.336] { [18:41:16.336] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:16.336] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.336] ...future.FUN(...future.X_jj, ...) [18:41:16.336] }) [18:41:16.336] } [18:41:16.336] }, args = future.call.arguments) [18:41:16.336] } [18:41:16.336] Tweak future expression to call with '...' arguments ... DONE [18:41:16.337] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.337] [18:41:16.337] getGlobalsAndPackages() ... DONE [18:41:16.337] run() for 'Future' ... [18:41:16.338] - state: 'created' [18:41:16.338] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:16.338] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:16.338] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:16.338] - Field: 'label' [18:41:16.339] - Field: 'local' [18:41:16.339] - Field: 'owner' [18:41:16.339] - Field: 'envir' [18:41:16.339] - Field: 'packages' [18:41:16.339] - Field: 'gc' [18:41:16.340] - Field: 'conditions' [18:41:16.340] - Field: 'expr' [18:41:16.340] - Field: 'uuid' [18:41:16.340] - Field: 'seed' [18:41:16.340] - Field: 'version' [18:41:16.340] - Field: 'result' [18:41:16.341] - Field: 'asynchronous' [18:41:16.341] - Field: 'calls' [18:41:16.341] - Field: 'globals' [18:41:16.341] - Field: 'stdout' [18:41:16.341] - Field: 'earlySignal' [18:41:16.341] - Field: 'lazy' [18:41:16.342] - Field: 'state' [18:41:16.342] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:16.342] - Launch lazy future ... [18:41:16.342] Packages needed by the future expression (n = 0): [18:41:16.342] Packages needed by future strategies (n = 0): [18:41:16.343] { [18:41:16.343] { [18:41:16.343] { [18:41:16.343] ...future.startTime <- base::Sys.time() [18:41:16.343] { [18:41:16.343] { [18:41:16.343] { [18:41:16.343] base::local({ [18:41:16.343] has_future <- base::requireNamespace("future", [18:41:16.343] quietly = TRUE) [18:41:16.343] if (has_future) { [18:41:16.343] ns <- base::getNamespace("future") [18:41:16.343] version <- ns[[".package"]][["version"]] [18:41:16.343] if (is.null(version)) [18:41:16.343] version <- utils::packageVersion("future") [18:41:16.343] } [18:41:16.343] else { [18:41:16.343] version <- NULL [18:41:16.343] } [18:41:16.343] if (!has_future || version < "1.8.0") { [18:41:16.343] info <- base::c(r_version = base::gsub("R version ", [18:41:16.343] "", base::R.version$version.string), [18:41:16.343] platform = base::sprintf("%s (%s-bit)", [18:41:16.343] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:16.343] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:16.343] "release", "version")], collapse = " "), [18:41:16.343] hostname = base::Sys.info()[["nodename"]]) [18:41:16.343] info <- base::sprintf("%s: %s", base::names(info), [18:41:16.343] info) [18:41:16.343] info <- base::paste(info, collapse = "; ") [18:41:16.343] if (!has_future) { [18:41:16.343] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:16.343] info) [18:41:16.343] } [18:41:16.343] else { [18:41:16.343] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:16.343] info, version) [18:41:16.343] } [18:41:16.343] base::stop(msg) [18:41:16.343] } [18:41:16.343] }) [18:41:16.343] } [18:41:16.343] ...future.strategy.old <- future::plan("list") [18:41:16.343] options(future.plan = NULL) [18:41:16.343] Sys.unsetenv("R_FUTURE_PLAN") [18:41:16.343] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:16.343] } [18:41:16.343] ...future.workdir <- getwd() [18:41:16.343] } [18:41:16.343] ...future.oldOptions <- base::as.list(base::.Options) [18:41:16.343] ...future.oldEnvVars <- base::Sys.getenv() [18:41:16.343] } [18:41:16.343] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:16.343] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:16.343] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:16.343] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:16.343] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:16.343] future.stdout.windows.reencode = NULL, width = 80L) [18:41:16.343] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:16.343] base::names(...future.oldOptions)) [18:41:16.343] } [18:41:16.343] if (FALSE) { [18:41:16.343] } [18:41:16.343] else { [18:41:16.343] if (TRUE) { [18:41:16.343] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:16.343] open = "w") [18:41:16.343] } [18:41:16.343] else { [18:41:16.343] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:16.343] windows = "NUL", "/dev/null"), open = "w") [18:41:16.343] } [18:41:16.343] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:16.343] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:16.343] base::sink(type = "output", split = FALSE) [18:41:16.343] base::close(...future.stdout) [18:41:16.343] }, add = TRUE) [18:41:16.343] } [18:41:16.343] ...future.frame <- base::sys.nframe() [18:41:16.343] ...future.conditions <- base::list() [18:41:16.343] ...future.rng <- base::globalenv()$.Random.seed [18:41:16.343] if (FALSE) { [18:41:16.343] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:16.343] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:16.343] } [18:41:16.343] ...future.result <- base::tryCatch({ [18:41:16.343] base::withCallingHandlers({ [18:41:16.343] ...future.value <- base::withVisible(base::local({ [18:41:16.343] do.call(function(...) { [18:41:16.343] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.343] if (!identical(...future.globals.maxSize.org, [18:41:16.343] ...future.globals.maxSize)) { [18:41:16.343] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.343] on.exit(options(oopts), add = TRUE) [18:41:16.343] } [18:41:16.343] { [18:41:16.343] lapply(seq_along(...future.elements_ii), [18:41:16.343] FUN = function(jj) { [18:41:16.343] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.343] ...future.FUN(...future.X_jj, ...) [18:41:16.343] }) [18:41:16.343] } [18:41:16.343] }, args = future.call.arguments) [18:41:16.343] })) [18:41:16.343] future::FutureResult(value = ...future.value$value, [18:41:16.343] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:16.343] ...future.rng), globalenv = if (FALSE) [18:41:16.343] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:16.343] ...future.globalenv.names)) [18:41:16.343] else NULL, started = ...future.startTime, version = "1.8") [18:41:16.343] }, condition = base::local({ [18:41:16.343] c <- base::c [18:41:16.343] inherits <- base::inherits [18:41:16.343] invokeRestart <- base::invokeRestart [18:41:16.343] length <- base::length [18:41:16.343] list <- base::list [18:41:16.343] seq.int <- base::seq.int [18:41:16.343] signalCondition <- base::signalCondition [18:41:16.343] sys.calls <- base::sys.calls [18:41:16.343] `[[` <- base::`[[` [18:41:16.343] `+` <- base::`+` [18:41:16.343] `<<-` <- base::`<<-` [18:41:16.343] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:16.343] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:16.343] 3L)] [18:41:16.343] } [18:41:16.343] function(cond) { [18:41:16.343] is_error <- inherits(cond, "error") [18:41:16.343] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:16.343] NULL) [18:41:16.343] if (is_error) { [18:41:16.343] sessionInformation <- function() { [18:41:16.343] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:16.343] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:16.343] search = base::search(), system = base::Sys.info()) [18:41:16.343] } [18:41:16.343] ...future.conditions[[length(...future.conditions) + [18:41:16.343] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:16.343] cond$call), session = sessionInformation(), [18:41:16.343] timestamp = base::Sys.time(), signaled = 0L) [18:41:16.343] signalCondition(cond) [18:41:16.343] } [18:41:16.343] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:16.343] "immediateCondition"))) { [18:41:16.343] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:16.343] ...future.conditions[[length(...future.conditions) + [18:41:16.343] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:16.343] if (TRUE && !signal) { [18:41:16.343] muffleCondition <- function (cond, pattern = "^muffle") [18:41:16.343] { [18:41:16.343] inherits <- base::inherits [18:41:16.343] invokeRestart <- base::invokeRestart [18:41:16.343] is.null <- base::is.null [18:41:16.343] muffled <- FALSE [18:41:16.343] if (inherits(cond, "message")) { [18:41:16.343] muffled <- grepl(pattern, "muffleMessage") [18:41:16.343] if (muffled) [18:41:16.343] invokeRestart("muffleMessage") [18:41:16.343] } [18:41:16.343] else if (inherits(cond, "warning")) { [18:41:16.343] muffled <- grepl(pattern, "muffleWarning") [18:41:16.343] if (muffled) [18:41:16.343] invokeRestart("muffleWarning") [18:41:16.343] } [18:41:16.343] else if (inherits(cond, "condition")) { [18:41:16.343] if (!is.null(pattern)) { [18:41:16.343] computeRestarts <- base::computeRestarts [18:41:16.343] grepl <- base::grepl [18:41:16.343] restarts <- computeRestarts(cond) [18:41:16.343] for (restart in restarts) { [18:41:16.343] name <- restart$name [18:41:16.343] if (is.null(name)) [18:41:16.343] next [18:41:16.343] if (!grepl(pattern, name)) [18:41:16.343] next [18:41:16.343] invokeRestart(restart) [18:41:16.343] muffled <- TRUE [18:41:16.343] break [18:41:16.343] } [18:41:16.343] } [18:41:16.343] } [18:41:16.343] invisible(muffled) [18:41:16.343] } [18:41:16.343] muffleCondition(cond, pattern = "^muffle") [18:41:16.343] } [18:41:16.343] } [18:41:16.343] else { [18:41:16.343] if (TRUE) { [18:41:16.343] muffleCondition <- function (cond, pattern = "^muffle") [18:41:16.343] { [18:41:16.343] inherits <- base::inherits [18:41:16.343] invokeRestart <- base::invokeRestart [18:41:16.343] is.null <- base::is.null [18:41:16.343] muffled <- FALSE [18:41:16.343] if (inherits(cond, "message")) { [18:41:16.343] muffled <- grepl(pattern, "muffleMessage") [18:41:16.343] if (muffled) [18:41:16.343] invokeRestart("muffleMessage") [18:41:16.343] } [18:41:16.343] else if (inherits(cond, "warning")) { [18:41:16.343] muffled <- grepl(pattern, "muffleWarning") [18:41:16.343] if (muffled) [18:41:16.343] invokeRestart("muffleWarning") [18:41:16.343] } [18:41:16.343] else if (inherits(cond, "condition")) { [18:41:16.343] if (!is.null(pattern)) { [18:41:16.343] computeRestarts <- base::computeRestarts [18:41:16.343] grepl <- base::grepl [18:41:16.343] restarts <- computeRestarts(cond) [18:41:16.343] for (restart in restarts) { [18:41:16.343] name <- restart$name [18:41:16.343] if (is.null(name)) [18:41:16.343] next [18:41:16.343] if (!grepl(pattern, name)) [18:41:16.343] next [18:41:16.343] invokeRestart(restart) [18:41:16.343] muffled <- TRUE [18:41:16.343] break [18:41:16.343] } [18:41:16.343] } [18:41:16.343] } [18:41:16.343] invisible(muffled) [18:41:16.343] } [18:41:16.343] muffleCondition(cond, pattern = "^muffle") [18:41:16.343] } [18:41:16.343] } [18:41:16.343] } [18:41:16.343] })) [18:41:16.343] }, error = function(ex) { [18:41:16.343] base::structure(base::list(value = NULL, visible = NULL, [18:41:16.343] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:16.343] ...future.rng), started = ...future.startTime, [18:41:16.343] finished = Sys.time(), session_uuid = NA_character_, [18:41:16.343] version = "1.8"), class = "FutureResult") [18:41:16.343] }, finally = { [18:41:16.343] if (!identical(...future.workdir, getwd())) [18:41:16.343] setwd(...future.workdir) [18:41:16.343] { [18:41:16.343] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:16.343] ...future.oldOptions$nwarnings <- NULL [18:41:16.343] } [18:41:16.343] base::options(...future.oldOptions) [18:41:16.343] if (.Platform$OS.type == "windows") { [18:41:16.343] old_names <- names(...future.oldEnvVars) [18:41:16.343] envs <- base::Sys.getenv() [18:41:16.343] names <- names(envs) [18:41:16.343] common <- intersect(names, old_names) [18:41:16.343] added <- setdiff(names, old_names) [18:41:16.343] removed <- setdiff(old_names, names) [18:41:16.343] changed <- common[...future.oldEnvVars[common] != [18:41:16.343] envs[common]] [18:41:16.343] NAMES <- toupper(changed) [18:41:16.343] args <- list() [18:41:16.343] for (kk in seq_along(NAMES)) { [18:41:16.343] name <- changed[[kk]] [18:41:16.343] NAME <- NAMES[[kk]] [18:41:16.343] if (name != NAME && is.element(NAME, old_names)) [18:41:16.343] next [18:41:16.343] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:16.343] } [18:41:16.343] NAMES <- toupper(added) [18:41:16.343] for (kk in seq_along(NAMES)) { [18:41:16.343] name <- added[[kk]] [18:41:16.343] NAME <- NAMES[[kk]] [18:41:16.343] if (name != NAME && is.element(NAME, old_names)) [18:41:16.343] next [18:41:16.343] args[[name]] <- "" [18:41:16.343] } [18:41:16.343] NAMES <- toupper(removed) [18:41:16.343] for (kk in seq_along(NAMES)) { [18:41:16.343] name <- removed[[kk]] [18:41:16.343] NAME <- NAMES[[kk]] [18:41:16.343] if (name != NAME && is.element(NAME, old_names)) [18:41:16.343] next [18:41:16.343] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:16.343] } [18:41:16.343] if (length(args) > 0) [18:41:16.343] base::do.call(base::Sys.setenv, args = args) [18:41:16.343] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:16.343] } [18:41:16.343] else { [18:41:16.343] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:16.343] } [18:41:16.343] { [18:41:16.343] if (base::length(...future.futureOptionsAdded) > [18:41:16.343] 0L) { [18:41:16.343] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:16.343] base::names(opts) <- ...future.futureOptionsAdded [18:41:16.343] base::options(opts) [18:41:16.343] } [18:41:16.343] { [18:41:16.343] { [18:41:16.343] NULL [18:41:16.343] RNGkind("Mersenne-Twister") [18:41:16.343] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:16.343] inherits = FALSE) [18:41:16.343] } [18:41:16.343] options(future.plan = NULL) [18:41:16.343] if (is.na(NA_character_)) [18:41:16.343] Sys.unsetenv("R_FUTURE_PLAN") [18:41:16.343] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:16.343] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:16.343] .init = FALSE) [18:41:16.343] } [18:41:16.343] } [18:41:16.343] } [18:41:16.343] }) [18:41:16.343] if (TRUE) { [18:41:16.343] base::sink(type = "output", split = FALSE) [18:41:16.343] if (TRUE) { [18:41:16.343] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:16.343] } [18:41:16.343] else { [18:41:16.343] ...future.result["stdout"] <- base::list(NULL) [18:41:16.343] } [18:41:16.343] base::close(...future.stdout) [18:41:16.343] ...future.stdout <- NULL [18:41:16.343] } [18:41:16.343] ...future.result$conditions <- ...future.conditions [18:41:16.343] ...future.result$finished <- base::Sys.time() [18:41:16.343] ...future.result [18:41:16.343] } [18:41:16.347] assign_globals() ... [18:41:16.347] List of 5 [18:41:16.347] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:16.347] $ future.call.arguments :List of 1 [18:41:16.347] ..$ length: int 2 [18:41:16.347] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:16.347] $ ...future.elements_ii :List of 1 [18:41:16.347] ..$ a: chr "integer" [18:41:16.347] $ ...future.seeds_ii : NULL [18:41:16.347] $ ...future.globals.maxSize: NULL [18:41:16.347] - attr(*, "where")=List of 5 [18:41:16.347] ..$ ...future.FUN : [18:41:16.347] ..$ future.call.arguments : [18:41:16.347] ..$ ...future.elements_ii : [18:41:16.347] ..$ ...future.seeds_ii : [18:41:16.347] ..$ ...future.globals.maxSize: [18:41:16.347] - attr(*, "resolved")= logi FALSE [18:41:16.347] - attr(*, "total_size")= num 4406 [18:41:16.347] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:16.347] - attr(*, "already-done")= logi TRUE [18:41:16.354] - copied '...future.FUN' to environment [18:41:16.354] - copied 'future.call.arguments' to environment [18:41:16.354] - copied '...future.elements_ii' to environment [18:41:16.354] - copied '...future.seeds_ii' to environment [18:41:16.354] - copied '...future.globals.maxSize' to environment [18:41:16.355] assign_globals() ... done [18:41:16.355] plan(): Setting new future strategy stack: [18:41:16.355] List of future strategies: [18:41:16.355] 1. sequential: [18:41:16.355] - args: function (..., envir = parent.frame(), workers = "") [18:41:16.355] - tweaked: FALSE [18:41:16.355] - call: NULL [18:41:16.356] plan(): nbrOfWorkers() = 1 [18:41:16.357] plan(): Setting new future strategy stack: [18:41:16.357] List of future strategies: [18:41:16.357] 1. sequential: [18:41:16.357] - args: function (..., envir = parent.frame(), workers = "") [18:41:16.357] - tweaked: FALSE [18:41:16.357] - call: plan(strategy) [18:41:16.358] plan(): nbrOfWorkers() = 1 [18:41:16.358] SequentialFuture started (and completed) [18:41:16.358] - Launch lazy future ... done [18:41:16.358] run() for 'SequentialFuture' ... done [18:41:16.359] Created future: [18:41:16.359] SequentialFuture: [18:41:16.359] Label: 'future_lapply-1' [18:41:16.359] Expression: [18:41:16.359] { [18:41:16.359] do.call(function(...) { [18:41:16.359] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.359] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:16.359] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.359] on.exit(options(oopts), add = TRUE) [18:41:16.359] } [18:41:16.359] { [18:41:16.359] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:16.359] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.359] ...future.FUN(...future.X_jj, ...) [18:41:16.359] }) [18:41:16.359] } [18:41:16.359] }, args = future.call.arguments) [18:41:16.359] } [18:41:16.359] Lazy evaluation: FALSE [18:41:16.359] Asynchronous evaluation: FALSE [18:41:16.359] Local evaluation: TRUE [18:41:16.359] Environment: R_GlobalEnv [18:41:16.359] Capture standard output: TRUE [18:41:16.359] Capture condition classes: 'condition' (excluding 'nothing') [18:41:16.359] Globals: 5 objects totaling 758 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 96 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:16.359] Packages: [18:41:16.359] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:16.359] Resolved: TRUE [18:41:16.359] Value: 47 bytes of class 'list' [18:41:16.359] Early signaling: FALSE [18:41:16.359] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:16.359] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:16.360] Chunk #1 of 4 ... DONE [18:41:16.360] Chunk #2 of 4 ... [18:41:16.360] - Finding globals in 'X' for chunk #2 ... [18:41:16.360] getGlobalsAndPackages() ... [18:41:16.360] Searching for globals... [18:41:16.361] [18:41:16.361] Searching for globals ... DONE [18:41:16.361] - globals: [0] [18:41:16.361] getGlobalsAndPackages() ... DONE [18:41:16.361] + additional globals found: [n=0] [18:41:16.362] + additional namespaces needed: [n=0] [18:41:16.362] - Finding globals in 'X' for chunk #2 ... DONE [18:41:16.362] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:16.362] - seeds: [18:41:16.362] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.362] getGlobalsAndPackages() ... [18:41:16.363] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.363] Resolving globals: FALSE [18:41:16.363] Tweak future expression to call with '...' arguments ... [18:41:16.363] { [18:41:16.363] do.call(function(...) { [18:41:16.363] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.363] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:16.363] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.363] on.exit(options(oopts), add = TRUE) [18:41:16.363] } [18:41:16.363] { [18:41:16.363] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:16.363] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.363] ...future.FUN(...future.X_jj, ...) [18:41:16.363] }) [18:41:16.363] } [18:41:16.363] }, args = future.call.arguments) [18:41:16.363] } [18:41:16.363] Tweak future expression to call with '...' arguments ... DONE [18:41:16.364] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.364] [18:41:16.364] getGlobalsAndPackages() ... DONE [18:41:16.365] run() for 'Future' ... [18:41:16.365] - state: 'created' [18:41:16.365] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:16.365] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:16.366] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:16.366] - Field: 'label' [18:41:16.366] - Field: 'local' [18:41:16.366] - Field: 'owner' [18:41:16.366] - Field: 'envir' [18:41:16.366] - Field: 'packages' [18:41:16.367] - Field: 'gc' [18:41:16.367] - Field: 'conditions' [18:41:16.367] - Field: 'expr' [18:41:16.367] - Field: 'uuid' [18:41:16.367] - Field: 'seed' [18:41:16.367] - Field: 'version' [18:41:16.368] - Field: 'result' [18:41:16.368] - Field: 'asynchronous' [18:41:16.368] - Field: 'calls' [18:41:16.368] - Field: 'globals' [18:41:16.368] - Field: 'stdout' [18:41:16.368] - Field: 'earlySignal' [18:41:16.369] - Field: 'lazy' [18:41:16.369] - Field: 'state' [18:41:16.369] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:16.369] - Launch lazy future ... [18:41:16.369] Packages needed by the future expression (n = 0): [18:41:16.369] Packages needed by future strategies (n = 0): [18:41:16.370] { [18:41:16.370] { [18:41:16.370] { [18:41:16.370] ...future.startTime <- base::Sys.time() [18:41:16.370] { [18:41:16.370] { [18:41:16.370] { [18:41:16.370] base::local({ [18:41:16.370] has_future <- base::requireNamespace("future", [18:41:16.370] quietly = TRUE) [18:41:16.370] if (has_future) { [18:41:16.370] ns <- base::getNamespace("future") [18:41:16.370] version <- ns[[".package"]][["version"]] [18:41:16.370] if (is.null(version)) [18:41:16.370] version <- utils::packageVersion("future") [18:41:16.370] } [18:41:16.370] else { [18:41:16.370] version <- NULL [18:41:16.370] } [18:41:16.370] if (!has_future || version < "1.8.0") { [18:41:16.370] info <- base::c(r_version = base::gsub("R version ", [18:41:16.370] "", base::R.version$version.string), [18:41:16.370] platform = base::sprintf("%s (%s-bit)", [18:41:16.370] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:16.370] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:16.370] "release", "version")], collapse = " "), [18:41:16.370] hostname = base::Sys.info()[["nodename"]]) [18:41:16.370] info <- base::sprintf("%s: %s", base::names(info), [18:41:16.370] info) [18:41:16.370] info <- base::paste(info, collapse = "; ") [18:41:16.370] if (!has_future) { [18:41:16.370] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:16.370] info) [18:41:16.370] } [18:41:16.370] else { [18:41:16.370] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:16.370] info, version) [18:41:16.370] } [18:41:16.370] base::stop(msg) [18:41:16.370] } [18:41:16.370] }) [18:41:16.370] } [18:41:16.370] ...future.strategy.old <- future::plan("list") [18:41:16.370] options(future.plan = NULL) [18:41:16.370] Sys.unsetenv("R_FUTURE_PLAN") [18:41:16.370] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:16.370] } [18:41:16.370] ...future.workdir <- getwd() [18:41:16.370] } [18:41:16.370] ...future.oldOptions <- base::as.list(base::.Options) [18:41:16.370] ...future.oldEnvVars <- base::Sys.getenv() [18:41:16.370] } [18:41:16.370] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:16.370] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:16.370] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:16.370] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:16.370] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:16.370] future.stdout.windows.reencode = NULL, width = 80L) [18:41:16.370] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:16.370] base::names(...future.oldOptions)) [18:41:16.370] } [18:41:16.370] if (FALSE) { [18:41:16.370] } [18:41:16.370] else { [18:41:16.370] if (TRUE) { [18:41:16.370] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:16.370] open = "w") [18:41:16.370] } [18:41:16.370] else { [18:41:16.370] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:16.370] windows = "NUL", "/dev/null"), open = "w") [18:41:16.370] } [18:41:16.370] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:16.370] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:16.370] base::sink(type = "output", split = FALSE) [18:41:16.370] base::close(...future.stdout) [18:41:16.370] }, add = TRUE) [18:41:16.370] } [18:41:16.370] ...future.frame <- base::sys.nframe() [18:41:16.370] ...future.conditions <- base::list() [18:41:16.370] ...future.rng <- base::globalenv()$.Random.seed [18:41:16.370] if (FALSE) { [18:41:16.370] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:16.370] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:16.370] } [18:41:16.370] ...future.result <- base::tryCatch({ [18:41:16.370] base::withCallingHandlers({ [18:41:16.370] ...future.value <- base::withVisible(base::local({ [18:41:16.370] do.call(function(...) { [18:41:16.370] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.370] if (!identical(...future.globals.maxSize.org, [18:41:16.370] ...future.globals.maxSize)) { [18:41:16.370] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.370] on.exit(options(oopts), add = TRUE) [18:41:16.370] } [18:41:16.370] { [18:41:16.370] lapply(seq_along(...future.elements_ii), [18:41:16.370] FUN = function(jj) { [18:41:16.370] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.370] ...future.FUN(...future.X_jj, ...) [18:41:16.370] }) [18:41:16.370] } [18:41:16.370] }, args = future.call.arguments) [18:41:16.370] })) [18:41:16.370] future::FutureResult(value = ...future.value$value, [18:41:16.370] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:16.370] ...future.rng), globalenv = if (FALSE) [18:41:16.370] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:16.370] ...future.globalenv.names)) [18:41:16.370] else NULL, started = ...future.startTime, version = "1.8") [18:41:16.370] }, condition = base::local({ [18:41:16.370] c <- base::c [18:41:16.370] inherits <- base::inherits [18:41:16.370] invokeRestart <- base::invokeRestart [18:41:16.370] length <- base::length [18:41:16.370] list <- base::list [18:41:16.370] seq.int <- base::seq.int [18:41:16.370] signalCondition <- base::signalCondition [18:41:16.370] sys.calls <- base::sys.calls [18:41:16.370] `[[` <- base::`[[` [18:41:16.370] `+` <- base::`+` [18:41:16.370] `<<-` <- base::`<<-` [18:41:16.370] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:16.370] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:16.370] 3L)] [18:41:16.370] } [18:41:16.370] function(cond) { [18:41:16.370] is_error <- inherits(cond, "error") [18:41:16.370] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:16.370] NULL) [18:41:16.370] if (is_error) { [18:41:16.370] sessionInformation <- function() { [18:41:16.370] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:16.370] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:16.370] search = base::search(), system = base::Sys.info()) [18:41:16.370] } [18:41:16.370] ...future.conditions[[length(...future.conditions) + [18:41:16.370] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:16.370] cond$call), session = sessionInformation(), [18:41:16.370] timestamp = base::Sys.time(), signaled = 0L) [18:41:16.370] signalCondition(cond) [18:41:16.370] } [18:41:16.370] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:16.370] "immediateCondition"))) { [18:41:16.370] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:16.370] ...future.conditions[[length(...future.conditions) + [18:41:16.370] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:16.370] if (TRUE && !signal) { [18:41:16.370] muffleCondition <- function (cond, pattern = "^muffle") [18:41:16.370] { [18:41:16.370] inherits <- base::inherits [18:41:16.370] invokeRestart <- base::invokeRestart [18:41:16.370] is.null <- base::is.null [18:41:16.370] muffled <- FALSE [18:41:16.370] if (inherits(cond, "message")) { [18:41:16.370] muffled <- grepl(pattern, "muffleMessage") [18:41:16.370] if (muffled) [18:41:16.370] invokeRestart("muffleMessage") [18:41:16.370] } [18:41:16.370] else if (inherits(cond, "warning")) { [18:41:16.370] muffled <- grepl(pattern, "muffleWarning") [18:41:16.370] if (muffled) [18:41:16.370] invokeRestart("muffleWarning") [18:41:16.370] } [18:41:16.370] else if (inherits(cond, "condition")) { [18:41:16.370] if (!is.null(pattern)) { [18:41:16.370] computeRestarts <- base::computeRestarts [18:41:16.370] grepl <- base::grepl [18:41:16.370] restarts <- computeRestarts(cond) [18:41:16.370] for (restart in restarts) { [18:41:16.370] name <- restart$name [18:41:16.370] if (is.null(name)) [18:41:16.370] next [18:41:16.370] if (!grepl(pattern, name)) [18:41:16.370] next [18:41:16.370] invokeRestart(restart) [18:41:16.370] muffled <- TRUE [18:41:16.370] break [18:41:16.370] } [18:41:16.370] } [18:41:16.370] } [18:41:16.370] invisible(muffled) [18:41:16.370] } [18:41:16.370] muffleCondition(cond, pattern = "^muffle") [18:41:16.370] } [18:41:16.370] } [18:41:16.370] else { [18:41:16.370] if (TRUE) { [18:41:16.370] muffleCondition <- function (cond, pattern = "^muffle") [18:41:16.370] { [18:41:16.370] inherits <- base::inherits [18:41:16.370] invokeRestart <- base::invokeRestart [18:41:16.370] is.null <- base::is.null [18:41:16.370] muffled <- FALSE [18:41:16.370] if (inherits(cond, "message")) { [18:41:16.370] muffled <- grepl(pattern, "muffleMessage") [18:41:16.370] if (muffled) [18:41:16.370] invokeRestart("muffleMessage") [18:41:16.370] } [18:41:16.370] else if (inherits(cond, "warning")) { [18:41:16.370] muffled <- grepl(pattern, "muffleWarning") [18:41:16.370] if (muffled) [18:41:16.370] invokeRestart("muffleWarning") [18:41:16.370] } [18:41:16.370] else if (inherits(cond, "condition")) { [18:41:16.370] if (!is.null(pattern)) { [18:41:16.370] computeRestarts <- base::computeRestarts [18:41:16.370] grepl <- base::grepl [18:41:16.370] restarts <- computeRestarts(cond) [18:41:16.370] for (restart in restarts) { [18:41:16.370] name <- restart$name [18:41:16.370] if (is.null(name)) [18:41:16.370] next [18:41:16.370] if (!grepl(pattern, name)) [18:41:16.370] next [18:41:16.370] invokeRestart(restart) [18:41:16.370] muffled <- TRUE [18:41:16.370] break [18:41:16.370] } [18:41:16.370] } [18:41:16.370] } [18:41:16.370] invisible(muffled) [18:41:16.370] } [18:41:16.370] muffleCondition(cond, pattern = "^muffle") [18:41:16.370] } [18:41:16.370] } [18:41:16.370] } [18:41:16.370] })) [18:41:16.370] }, error = function(ex) { [18:41:16.370] base::structure(base::list(value = NULL, visible = NULL, [18:41:16.370] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:16.370] ...future.rng), started = ...future.startTime, [18:41:16.370] finished = Sys.time(), session_uuid = NA_character_, [18:41:16.370] version = "1.8"), class = "FutureResult") [18:41:16.370] }, finally = { [18:41:16.370] if (!identical(...future.workdir, getwd())) [18:41:16.370] setwd(...future.workdir) [18:41:16.370] { [18:41:16.370] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:16.370] ...future.oldOptions$nwarnings <- NULL [18:41:16.370] } [18:41:16.370] base::options(...future.oldOptions) [18:41:16.370] if (.Platform$OS.type == "windows") { [18:41:16.370] old_names <- names(...future.oldEnvVars) [18:41:16.370] envs <- base::Sys.getenv() [18:41:16.370] names <- names(envs) [18:41:16.370] common <- intersect(names, old_names) [18:41:16.370] added <- setdiff(names, old_names) [18:41:16.370] removed <- setdiff(old_names, names) [18:41:16.370] changed <- common[...future.oldEnvVars[common] != [18:41:16.370] envs[common]] [18:41:16.370] NAMES <- toupper(changed) [18:41:16.370] args <- list() [18:41:16.370] for (kk in seq_along(NAMES)) { [18:41:16.370] name <- changed[[kk]] [18:41:16.370] NAME <- NAMES[[kk]] [18:41:16.370] if (name != NAME && is.element(NAME, old_names)) [18:41:16.370] next [18:41:16.370] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:16.370] } [18:41:16.370] NAMES <- toupper(added) [18:41:16.370] for (kk in seq_along(NAMES)) { [18:41:16.370] name <- added[[kk]] [18:41:16.370] NAME <- NAMES[[kk]] [18:41:16.370] if (name != NAME && is.element(NAME, old_names)) [18:41:16.370] next [18:41:16.370] args[[name]] <- "" [18:41:16.370] } [18:41:16.370] NAMES <- toupper(removed) [18:41:16.370] for (kk in seq_along(NAMES)) { [18:41:16.370] name <- removed[[kk]] [18:41:16.370] NAME <- NAMES[[kk]] [18:41:16.370] if (name != NAME && is.element(NAME, old_names)) [18:41:16.370] next [18:41:16.370] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:16.370] } [18:41:16.370] if (length(args) > 0) [18:41:16.370] base::do.call(base::Sys.setenv, args = args) [18:41:16.370] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:16.370] } [18:41:16.370] else { [18:41:16.370] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:16.370] } [18:41:16.370] { [18:41:16.370] if (base::length(...future.futureOptionsAdded) > [18:41:16.370] 0L) { [18:41:16.370] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:16.370] base::names(opts) <- ...future.futureOptionsAdded [18:41:16.370] base::options(opts) [18:41:16.370] } [18:41:16.370] { [18:41:16.370] { [18:41:16.370] NULL [18:41:16.370] RNGkind("Mersenne-Twister") [18:41:16.370] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:16.370] inherits = FALSE) [18:41:16.370] } [18:41:16.370] options(future.plan = NULL) [18:41:16.370] if (is.na(NA_character_)) [18:41:16.370] Sys.unsetenv("R_FUTURE_PLAN") [18:41:16.370] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:16.370] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:16.370] .init = FALSE) [18:41:16.370] } [18:41:16.370] } [18:41:16.370] } [18:41:16.370] }) [18:41:16.370] if (TRUE) { [18:41:16.370] base::sink(type = "output", split = FALSE) [18:41:16.370] if (TRUE) { [18:41:16.370] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:16.370] } [18:41:16.370] else { [18:41:16.370] ...future.result["stdout"] <- base::list(NULL) [18:41:16.370] } [18:41:16.370] base::close(...future.stdout) [18:41:16.370] ...future.stdout <- NULL [18:41:16.370] } [18:41:16.370] ...future.result$conditions <- ...future.conditions [18:41:16.370] ...future.result$finished <- base::Sys.time() [18:41:16.370] ...future.result [18:41:16.370] } [18:41:16.374] assign_globals() ... [18:41:16.374] List of 5 [18:41:16.374] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:16.374] $ future.call.arguments :List of 1 [18:41:16.374] ..$ length: int 2 [18:41:16.374] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:16.374] $ ...future.elements_ii :List of 1 [18:41:16.374] ..$ b: chr "numeric" [18:41:16.374] $ ...future.seeds_ii : NULL [18:41:16.374] $ ...future.globals.maxSize: NULL [18:41:16.374] - attr(*, "where")=List of 5 [18:41:16.374] ..$ ...future.FUN : [18:41:16.374] ..$ future.call.arguments : [18:41:16.374] ..$ ...future.elements_ii : [18:41:16.374] ..$ ...future.seeds_ii : [18:41:16.374] ..$ ...future.globals.maxSize: [18:41:16.374] - attr(*, "resolved")= logi FALSE [18:41:16.374] - attr(*, "total_size")= num 4406 [18:41:16.374] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:16.374] - attr(*, "already-done")= logi TRUE [18:41:16.381] - copied '...future.FUN' to environment [18:41:16.381] - copied 'future.call.arguments' to environment [18:41:16.381] - copied '...future.elements_ii' to environment [18:41:16.381] - copied '...future.seeds_ii' to environment [18:41:16.381] - copied '...future.globals.maxSize' to environment [18:41:16.382] assign_globals() ... done [18:41:16.382] plan(): Setting new future strategy stack: [18:41:16.382] List of future strategies: [18:41:16.382] 1. sequential: [18:41:16.382] - args: function (..., envir = parent.frame(), workers = "") [18:41:16.382] - tweaked: FALSE [18:41:16.382] - call: NULL [18:41:16.383] plan(): nbrOfWorkers() = 1 [18:41:16.384] plan(): Setting new future strategy stack: [18:41:16.384] List of future strategies: [18:41:16.384] 1. sequential: [18:41:16.384] - args: function (..., envir = parent.frame(), workers = "") [18:41:16.384] - tweaked: FALSE [18:41:16.384] - call: plan(strategy) [18:41:16.385] plan(): nbrOfWorkers() = 1 [18:41:16.385] SequentialFuture started (and completed) [18:41:16.385] - Launch lazy future ... done [18:41:16.385] run() for 'SequentialFuture' ... done [18:41:16.385] Created future: [18:41:16.386] SequentialFuture: [18:41:16.386] Label: 'future_lapply-2' [18:41:16.386] Expression: [18:41:16.386] { [18:41:16.386] do.call(function(...) { [18:41:16.386] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.386] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:16.386] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.386] on.exit(options(oopts), add = TRUE) [18:41:16.386] } [18:41:16.386] { [18:41:16.386] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:16.386] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.386] ...future.FUN(...future.X_jj, ...) [18:41:16.386] }) [18:41:16.386] } [18:41:16.386] }, args = future.call.arguments) [18:41:16.386] } [18:41:16.386] Lazy evaluation: FALSE [18:41:16.386] Asynchronous evaluation: FALSE [18:41:16.386] Local evaluation: TRUE [18:41:16.386] Environment: R_GlobalEnv [18:41:16.386] Capture standard output: TRUE [18:41:16.386] Capture condition classes: 'condition' (excluding 'nothing') [18:41:16.386] Globals: 5 objects totaling 758 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 96 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:16.386] Packages: [18:41:16.386] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:16.386] Resolved: TRUE [18:41:16.386] Value: 55 bytes of class 'list' [18:41:16.386] Early signaling: FALSE [18:41:16.386] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:16.386] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:16.387] Chunk #2 of 4 ... DONE [18:41:16.387] Chunk #3 of 4 ... [18:41:16.387] - Finding globals in 'X' for chunk #3 ... [18:41:16.387] getGlobalsAndPackages() ... [18:41:16.387] Searching for globals... [18:41:16.388] [18:41:16.388] Searching for globals ... DONE [18:41:16.388] - globals: [0] [18:41:16.388] getGlobalsAndPackages() ... DONE [18:41:16.388] + additional globals found: [n=0] [18:41:16.388] + additional namespaces needed: [n=0] [18:41:16.389] - Finding globals in 'X' for chunk #3 ... DONE [18:41:16.389] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:16.389] - seeds: [18:41:16.389] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.389] getGlobalsAndPackages() ... [18:41:16.389] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.390] Resolving globals: FALSE [18:41:16.390] Tweak future expression to call with '...' arguments ... [18:41:16.390] { [18:41:16.390] do.call(function(...) { [18:41:16.390] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.390] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:16.390] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.390] on.exit(options(oopts), add = TRUE) [18:41:16.390] } [18:41:16.390] { [18:41:16.390] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:16.390] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.390] ...future.FUN(...future.X_jj, ...) [18:41:16.390] }) [18:41:16.390] } [18:41:16.390] }, args = future.call.arguments) [18:41:16.390] } [18:41:16.390] Tweak future expression to call with '...' arguments ... DONE [18:41:16.391] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.391] [18:41:16.391] getGlobalsAndPackages() ... DONE [18:41:16.391] run() for 'Future' ... [18:41:16.392] - state: 'created' [18:41:16.392] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:16.392] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:16.393] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:16.393] - Field: 'label' [18:41:16.393] - Field: 'local' [18:41:16.393] - Field: 'owner' [18:41:16.393] - Field: 'envir' [18:41:16.393] - Field: 'packages' [18:41:16.394] - Field: 'gc' [18:41:16.394] - Field: 'conditions' [18:41:16.394] - Field: 'expr' [18:41:16.394] - Field: 'uuid' [18:41:16.394] - Field: 'seed' [18:41:16.394] - Field: 'version' [18:41:16.395] - Field: 'result' [18:41:16.395] - Field: 'asynchronous' [18:41:16.395] - Field: 'calls' [18:41:16.395] - Field: 'globals' [18:41:16.395] - Field: 'stdout' [18:41:16.395] - Field: 'earlySignal' [18:41:16.396] - Field: 'lazy' [18:41:16.396] - Field: 'state' [18:41:16.396] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:16.396] - Launch lazy future ... [18:41:16.396] Packages needed by the future expression (n = 0): [18:41:16.397] Packages needed by future strategies (n = 0): [18:41:16.397] { [18:41:16.397] { [18:41:16.397] { [18:41:16.397] ...future.startTime <- base::Sys.time() [18:41:16.397] { [18:41:16.397] { [18:41:16.397] { [18:41:16.397] base::local({ [18:41:16.397] has_future <- base::requireNamespace("future", [18:41:16.397] quietly = TRUE) [18:41:16.397] if (has_future) { [18:41:16.397] ns <- base::getNamespace("future") [18:41:16.397] version <- ns[[".package"]][["version"]] [18:41:16.397] if (is.null(version)) [18:41:16.397] version <- utils::packageVersion("future") [18:41:16.397] } [18:41:16.397] else { [18:41:16.397] version <- NULL [18:41:16.397] } [18:41:16.397] if (!has_future || version < "1.8.0") { [18:41:16.397] info <- base::c(r_version = base::gsub("R version ", [18:41:16.397] "", base::R.version$version.string), [18:41:16.397] platform = base::sprintf("%s (%s-bit)", [18:41:16.397] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:16.397] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:16.397] "release", "version")], collapse = " "), [18:41:16.397] hostname = base::Sys.info()[["nodename"]]) [18:41:16.397] info <- base::sprintf("%s: %s", base::names(info), [18:41:16.397] info) [18:41:16.397] info <- base::paste(info, collapse = "; ") [18:41:16.397] if (!has_future) { [18:41:16.397] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:16.397] info) [18:41:16.397] } [18:41:16.397] else { [18:41:16.397] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:16.397] info, version) [18:41:16.397] } [18:41:16.397] base::stop(msg) [18:41:16.397] } [18:41:16.397] }) [18:41:16.397] } [18:41:16.397] ...future.strategy.old <- future::plan("list") [18:41:16.397] options(future.plan = NULL) [18:41:16.397] Sys.unsetenv("R_FUTURE_PLAN") [18:41:16.397] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:16.397] } [18:41:16.397] ...future.workdir <- getwd() [18:41:16.397] } [18:41:16.397] ...future.oldOptions <- base::as.list(base::.Options) [18:41:16.397] ...future.oldEnvVars <- base::Sys.getenv() [18:41:16.397] } [18:41:16.397] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:16.397] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:16.397] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:16.397] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:16.397] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:16.397] future.stdout.windows.reencode = NULL, width = 80L) [18:41:16.397] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:16.397] base::names(...future.oldOptions)) [18:41:16.397] } [18:41:16.397] if (FALSE) { [18:41:16.397] } [18:41:16.397] else { [18:41:16.397] if (TRUE) { [18:41:16.397] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:16.397] open = "w") [18:41:16.397] } [18:41:16.397] else { [18:41:16.397] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:16.397] windows = "NUL", "/dev/null"), open = "w") [18:41:16.397] } [18:41:16.397] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:16.397] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:16.397] base::sink(type = "output", split = FALSE) [18:41:16.397] base::close(...future.stdout) [18:41:16.397] }, add = TRUE) [18:41:16.397] } [18:41:16.397] ...future.frame <- base::sys.nframe() [18:41:16.397] ...future.conditions <- base::list() [18:41:16.397] ...future.rng <- base::globalenv()$.Random.seed [18:41:16.397] if (FALSE) { [18:41:16.397] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:16.397] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:16.397] } [18:41:16.397] ...future.result <- base::tryCatch({ [18:41:16.397] base::withCallingHandlers({ [18:41:16.397] ...future.value <- base::withVisible(base::local({ [18:41:16.397] do.call(function(...) { [18:41:16.397] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.397] if (!identical(...future.globals.maxSize.org, [18:41:16.397] ...future.globals.maxSize)) { [18:41:16.397] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.397] on.exit(options(oopts), add = TRUE) [18:41:16.397] } [18:41:16.397] { [18:41:16.397] lapply(seq_along(...future.elements_ii), [18:41:16.397] FUN = function(jj) { [18:41:16.397] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.397] ...future.FUN(...future.X_jj, ...) [18:41:16.397] }) [18:41:16.397] } [18:41:16.397] }, args = future.call.arguments) [18:41:16.397] })) [18:41:16.397] future::FutureResult(value = ...future.value$value, [18:41:16.397] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:16.397] ...future.rng), globalenv = if (FALSE) [18:41:16.397] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:16.397] ...future.globalenv.names)) [18:41:16.397] else NULL, started = ...future.startTime, version = "1.8") [18:41:16.397] }, condition = base::local({ [18:41:16.397] c <- base::c [18:41:16.397] inherits <- base::inherits [18:41:16.397] invokeRestart <- base::invokeRestart [18:41:16.397] length <- base::length [18:41:16.397] list <- base::list [18:41:16.397] seq.int <- base::seq.int [18:41:16.397] signalCondition <- base::signalCondition [18:41:16.397] sys.calls <- base::sys.calls [18:41:16.397] `[[` <- base::`[[` [18:41:16.397] `+` <- base::`+` [18:41:16.397] `<<-` <- base::`<<-` [18:41:16.397] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:16.397] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:16.397] 3L)] [18:41:16.397] } [18:41:16.397] function(cond) { [18:41:16.397] is_error <- inherits(cond, "error") [18:41:16.397] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:16.397] NULL) [18:41:16.397] if (is_error) { [18:41:16.397] sessionInformation <- function() { [18:41:16.397] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:16.397] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:16.397] search = base::search(), system = base::Sys.info()) [18:41:16.397] } [18:41:16.397] ...future.conditions[[length(...future.conditions) + [18:41:16.397] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:16.397] cond$call), session = sessionInformation(), [18:41:16.397] timestamp = base::Sys.time(), signaled = 0L) [18:41:16.397] signalCondition(cond) [18:41:16.397] } [18:41:16.397] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:16.397] "immediateCondition"))) { [18:41:16.397] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:16.397] ...future.conditions[[length(...future.conditions) + [18:41:16.397] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:16.397] if (TRUE && !signal) { [18:41:16.397] muffleCondition <- function (cond, pattern = "^muffle") [18:41:16.397] { [18:41:16.397] inherits <- base::inherits [18:41:16.397] invokeRestart <- base::invokeRestart [18:41:16.397] is.null <- base::is.null [18:41:16.397] muffled <- FALSE [18:41:16.397] if (inherits(cond, "message")) { [18:41:16.397] muffled <- grepl(pattern, "muffleMessage") [18:41:16.397] if (muffled) [18:41:16.397] invokeRestart("muffleMessage") [18:41:16.397] } [18:41:16.397] else if (inherits(cond, "warning")) { [18:41:16.397] muffled <- grepl(pattern, "muffleWarning") [18:41:16.397] if (muffled) [18:41:16.397] invokeRestart("muffleWarning") [18:41:16.397] } [18:41:16.397] else if (inherits(cond, "condition")) { [18:41:16.397] if (!is.null(pattern)) { [18:41:16.397] computeRestarts <- base::computeRestarts [18:41:16.397] grepl <- base::grepl [18:41:16.397] restarts <- computeRestarts(cond) [18:41:16.397] for (restart in restarts) { [18:41:16.397] name <- restart$name [18:41:16.397] if (is.null(name)) [18:41:16.397] next [18:41:16.397] if (!grepl(pattern, name)) [18:41:16.397] next [18:41:16.397] invokeRestart(restart) [18:41:16.397] muffled <- TRUE [18:41:16.397] break [18:41:16.397] } [18:41:16.397] } [18:41:16.397] } [18:41:16.397] invisible(muffled) [18:41:16.397] } [18:41:16.397] muffleCondition(cond, pattern = "^muffle") [18:41:16.397] } [18:41:16.397] } [18:41:16.397] else { [18:41:16.397] if (TRUE) { [18:41:16.397] muffleCondition <- function (cond, pattern = "^muffle") [18:41:16.397] { [18:41:16.397] inherits <- base::inherits [18:41:16.397] invokeRestart <- base::invokeRestart [18:41:16.397] is.null <- base::is.null [18:41:16.397] muffled <- FALSE [18:41:16.397] if (inherits(cond, "message")) { [18:41:16.397] muffled <- grepl(pattern, "muffleMessage") [18:41:16.397] if (muffled) [18:41:16.397] invokeRestart("muffleMessage") [18:41:16.397] } [18:41:16.397] else if (inherits(cond, "warning")) { [18:41:16.397] muffled <- grepl(pattern, "muffleWarning") [18:41:16.397] if (muffled) [18:41:16.397] invokeRestart("muffleWarning") [18:41:16.397] } [18:41:16.397] else if (inherits(cond, "condition")) { [18:41:16.397] if (!is.null(pattern)) { [18:41:16.397] computeRestarts <- base::computeRestarts [18:41:16.397] grepl <- base::grepl [18:41:16.397] restarts <- computeRestarts(cond) [18:41:16.397] for (restart in restarts) { [18:41:16.397] name <- restart$name [18:41:16.397] if (is.null(name)) [18:41:16.397] next [18:41:16.397] if (!grepl(pattern, name)) [18:41:16.397] next [18:41:16.397] invokeRestart(restart) [18:41:16.397] muffled <- TRUE [18:41:16.397] break [18:41:16.397] } [18:41:16.397] } [18:41:16.397] } [18:41:16.397] invisible(muffled) [18:41:16.397] } [18:41:16.397] muffleCondition(cond, pattern = "^muffle") [18:41:16.397] } [18:41:16.397] } [18:41:16.397] } [18:41:16.397] })) [18:41:16.397] }, error = function(ex) { [18:41:16.397] base::structure(base::list(value = NULL, visible = NULL, [18:41:16.397] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:16.397] ...future.rng), started = ...future.startTime, [18:41:16.397] finished = Sys.time(), session_uuid = NA_character_, [18:41:16.397] version = "1.8"), class = "FutureResult") [18:41:16.397] }, finally = { [18:41:16.397] if (!identical(...future.workdir, getwd())) [18:41:16.397] setwd(...future.workdir) [18:41:16.397] { [18:41:16.397] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:16.397] ...future.oldOptions$nwarnings <- NULL [18:41:16.397] } [18:41:16.397] base::options(...future.oldOptions) [18:41:16.397] if (.Platform$OS.type == "windows") { [18:41:16.397] old_names <- names(...future.oldEnvVars) [18:41:16.397] envs <- base::Sys.getenv() [18:41:16.397] names <- names(envs) [18:41:16.397] common <- intersect(names, old_names) [18:41:16.397] added <- setdiff(names, old_names) [18:41:16.397] removed <- setdiff(old_names, names) [18:41:16.397] changed <- common[...future.oldEnvVars[common] != [18:41:16.397] envs[common]] [18:41:16.397] NAMES <- toupper(changed) [18:41:16.397] args <- list() [18:41:16.397] for (kk in seq_along(NAMES)) { [18:41:16.397] name <- changed[[kk]] [18:41:16.397] NAME <- NAMES[[kk]] [18:41:16.397] if (name != NAME && is.element(NAME, old_names)) [18:41:16.397] next [18:41:16.397] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:16.397] } [18:41:16.397] NAMES <- toupper(added) [18:41:16.397] for (kk in seq_along(NAMES)) { [18:41:16.397] name <- added[[kk]] [18:41:16.397] NAME <- NAMES[[kk]] [18:41:16.397] if (name != NAME && is.element(NAME, old_names)) [18:41:16.397] next [18:41:16.397] args[[name]] <- "" [18:41:16.397] } [18:41:16.397] NAMES <- toupper(removed) [18:41:16.397] for (kk in seq_along(NAMES)) { [18:41:16.397] name <- removed[[kk]] [18:41:16.397] NAME <- NAMES[[kk]] [18:41:16.397] if (name != NAME && is.element(NAME, old_names)) [18:41:16.397] next [18:41:16.397] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:16.397] } [18:41:16.397] if (length(args) > 0) [18:41:16.397] base::do.call(base::Sys.setenv, args = args) [18:41:16.397] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:16.397] } [18:41:16.397] else { [18:41:16.397] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:16.397] } [18:41:16.397] { [18:41:16.397] if (base::length(...future.futureOptionsAdded) > [18:41:16.397] 0L) { [18:41:16.397] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:16.397] base::names(opts) <- ...future.futureOptionsAdded [18:41:16.397] base::options(opts) [18:41:16.397] } [18:41:16.397] { [18:41:16.397] { [18:41:16.397] NULL [18:41:16.397] RNGkind("Mersenne-Twister") [18:41:16.397] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:16.397] inherits = FALSE) [18:41:16.397] } [18:41:16.397] options(future.plan = NULL) [18:41:16.397] if (is.na(NA_character_)) [18:41:16.397] Sys.unsetenv("R_FUTURE_PLAN") [18:41:16.397] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:16.397] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:16.397] .init = FALSE) [18:41:16.397] } [18:41:16.397] } [18:41:16.397] } [18:41:16.397] }) [18:41:16.397] if (TRUE) { [18:41:16.397] base::sink(type = "output", split = FALSE) [18:41:16.397] if (TRUE) { [18:41:16.397] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:16.397] } [18:41:16.397] else { [18:41:16.397] ...future.result["stdout"] <- base::list(NULL) [18:41:16.397] } [18:41:16.397] base::close(...future.stdout) [18:41:16.397] ...future.stdout <- NULL [18:41:16.397] } [18:41:16.397] ...future.result$conditions <- ...future.conditions [18:41:16.397] ...future.result$finished <- base::Sys.time() [18:41:16.397] ...future.result [18:41:16.397] } [18:41:16.401] assign_globals() ... [18:41:16.401] List of 5 [18:41:16.401] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:16.401] $ future.call.arguments :List of 1 [18:41:16.401] ..$ length: int 2 [18:41:16.401] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:16.401] $ ...future.elements_ii :List of 1 [18:41:16.401] ..$ c: chr "character" [18:41:16.401] $ ...future.seeds_ii : NULL [18:41:16.401] $ ...future.globals.maxSize: NULL [18:41:16.401] - attr(*, "where")=List of 5 [18:41:16.401] ..$ ...future.FUN : [18:41:16.401] ..$ future.call.arguments : [18:41:16.401] ..$ ...future.elements_ii : [18:41:16.401] ..$ ...future.seeds_ii : [18:41:16.401] ..$ ...future.globals.maxSize: [18:41:16.401] - attr(*, "resolved")= logi FALSE [18:41:16.401] - attr(*, "total_size")= num 4406 [18:41:16.401] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:16.401] - attr(*, "already-done")= logi TRUE [18:41:16.408] - copied '...future.FUN' to environment [18:41:16.408] - copied 'future.call.arguments' to environment [18:41:16.408] - copied '...future.elements_ii' to environment [18:41:16.409] - copied '...future.seeds_ii' to environment [18:41:16.409] - copied '...future.globals.maxSize' to environment [18:41:16.409] assign_globals() ... done [18:41:16.409] plan(): Setting new future strategy stack: [18:41:16.409] List of future strategies: [18:41:16.409] 1. sequential: [18:41:16.409] - args: function (..., envir = parent.frame(), workers = "") [18:41:16.409] - tweaked: FALSE [18:41:16.409] - call: NULL [18:41:16.410] plan(): nbrOfWorkers() = 1 [18:41:16.411] plan(): Setting new future strategy stack: [18:41:16.411] List of future strategies: [18:41:16.411] 1. sequential: [18:41:16.411] - args: function (..., envir = parent.frame(), workers = "") [18:41:16.411] - tweaked: FALSE [18:41:16.411] - call: plan(strategy) [18:41:16.412] plan(): nbrOfWorkers() = 1 [18:41:16.412] SequentialFuture started (and completed) [18:41:16.412] - Launch lazy future ... done [18:41:16.413] run() for 'SequentialFuture' ... done [18:41:16.413] Created future: [18:41:16.413] SequentialFuture: [18:41:16.413] Label: 'future_lapply-3' [18:41:16.413] Expression: [18:41:16.413] { [18:41:16.413] do.call(function(...) { [18:41:16.413] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.413] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:16.413] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.413] on.exit(options(oopts), add = TRUE) [18:41:16.413] } [18:41:16.413] { [18:41:16.413] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:16.413] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.413] ...future.FUN(...future.X_jj, ...) [18:41:16.413] }) [18:41:16.413] } [18:41:16.413] }, args = future.call.arguments) [18:41:16.413] } [18:41:16.413] Lazy evaluation: FALSE [18:41:16.413] Asynchronous evaluation: FALSE [18:41:16.413] Local evaluation: TRUE [18:41:16.413] Environment: R_GlobalEnv [18:41:16.413] Capture standard output: TRUE [18:41:16.413] Capture condition classes: 'condition' (excluding 'nothing') [18:41:16.413] Globals: 5 objects totaling 760 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 98 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:16.413] Packages: [18:41:16.413] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:16.413] Resolved: TRUE [18:41:16.413] Value: 55 bytes of class 'list' [18:41:16.413] Early signaling: FALSE [18:41:16.413] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:16.413] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:16.414] Chunk #3 of 4 ... DONE [18:41:16.414] Chunk #4 of 4 ... [18:41:16.414] - Finding globals in 'X' for chunk #4 ... [18:41:16.415] getGlobalsAndPackages() ... [18:41:16.415] Searching for globals... [18:41:16.415] [18:41:16.415] Searching for globals ... DONE [18:41:16.415] - globals: [0] [18:41:16.415] getGlobalsAndPackages() ... DONE [18:41:16.416] + additional globals found: [n=0] [18:41:16.416] + additional namespaces needed: [n=0] [18:41:16.416] - Finding globals in 'X' for chunk #4 ... DONE [18:41:16.416] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:16.416] - seeds: [18:41:16.416] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.417] getGlobalsAndPackages() ... [18:41:16.417] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.417] Resolving globals: FALSE [18:41:16.417] Tweak future expression to call with '...' arguments ... [18:41:16.417] { [18:41:16.417] do.call(function(...) { [18:41:16.417] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.417] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:16.417] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.417] on.exit(options(oopts), add = TRUE) [18:41:16.417] } [18:41:16.417] { [18:41:16.417] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:16.417] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.417] ...future.FUN(...future.X_jj, ...) [18:41:16.417] }) [18:41:16.417] } [18:41:16.417] }, args = future.call.arguments) [18:41:16.417] } [18:41:16.418] Tweak future expression to call with '...' arguments ... DONE [18:41:16.418] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.418] [18:41:16.419] getGlobalsAndPackages() ... DONE [18:41:16.419] run() for 'Future' ... [18:41:16.419] - state: 'created' [18:41:16.419] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:16.420] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:16.420] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:16.420] - Field: 'label' [18:41:16.420] - Field: 'local' [18:41:16.420] - Field: 'owner' [18:41:16.421] - Field: 'envir' [18:41:16.421] - Field: 'packages' [18:41:16.421] - Field: 'gc' [18:41:16.421] - Field: 'conditions' [18:41:16.421] - Field: 'expr' [18:41:16.421] - Field: 'uuid' [18:41:16.422] - Field: 'seed' [18:41:16.422] - Field: 'version' [18:41:16.422] - Field: 'result' [18:41:16.422] - Field: 'asynchronous' [18:41:16.422] - Field: 'calls' [18:41:16.422] - Field: 'globals' [18:41:16.423] - Field: 'stdout' [18:41:16.423] - Field: 'earlySignal' [18:41:16.423] - Field: 'lazy' [18:41:16.423] - Field: 'state' [18:41:16.423] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:16.423] - Launch lazy future ... [18:41:16.424] Packages needed by the future expression (n = 0): [18:41:16.424] Packages needed by future strategies (n = 0): [18:41:16.424] { [18:41:16.424] { [18:41:16.424] { [18:41:16.424] ...future.startTime <- base::Sys.time() [18:41:16.424] { [18:41:16.424] { [18:41:16.424] { [18:41:16.424] base::local({ [18:41:16.424] has_future <- base::requireNamespace("future", [18:41:16.424] quietly = TRUE) [18:41:16.424] if (has_future) { [18:41:16.424] ns <- base::getNamespace("future") [18:41:16.424] version <- ns[[".package"]][["version"]] [18:41:16.424] if (is.null(version)) [18:41:16.424] version <- utils::packageVersion("future") [18:41:16.424] } [18:41:16.424] else { [18:41:16.424] version <- NULL [18:41:16.424] } [18:41:16.424] if (!has_future || version < "1.8.0") { [18:41:16.424] info <- base::c(r_version = base::gsub("R version ", [18:41:16.424] "", base::R.version$version.string), [18:41:16.424] platform = base::sprintf("%s (%s-bit)", [18:41:16.424] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:16.424] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:16.424] "release", "version")], collapse = " "), [18:41:16.424] hostname = base::Sys.info()[["nodename"]]) [18:41:16.424] info <- base::sprintf("%s: %s", base::names(info), [18:41:16.424] info) [18:41:16.424] info <- base::paste(info, collapse = "; ") [18:41:16.424] if (!has_future) { [18:41:16.424] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:16.424] info) [18:41:16.424] } [18:41:16.424] else { [18:41:16.424] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:16.424] info, version) [18:41:16.424] } [18:41:16.424] base::stop(msg) [18:41:16.424] } [18:41:16.424] }) [18:41:16.424] } [18:41:16.424] ...future.strategy.old <- future::plan("list") [18:41:16.424] options(future.plan = NULL) [18:41:16.424] Sys.unsetenv("R_FUTURE_PLAN") [18:41:16.424] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:16.424] } [18:41:16.424] ...future.workdir <- getwd() [18:41:16.424] } [18:41:16.424] ...future.oldOptions <- base::as.list(base::.Options) [18:41:16.424] ...future.oldEnvVars <- base::Sys.getenv() [18:41:16.424] } [18:41:16.424] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:16.424] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:16.424] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:16.424] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:16.424] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:16.424] future.stdout.windows.reencode = NULL, width = 80L) [18:41:16.424] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:16.424] base::names(...future.oldOptions)) [18:41:16.424] } [18:41:16.424] if (FALSE) { [18:41:16.424] } [18:41:16.424] else { [18:41:16.424] if (TRUE) { [18:41:16.424] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:16.424] open = "w") [18:41:16.424] } [18:41:16.424] else { [18:41:16.424] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:16.424] windows = "NUL", "/dev/null"), open = "w") [18:41:16.424] } [18:41:16.424] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:16.424] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:16.424] base::sink(type = "output", split = FALSE) [18:41:16.424] base::close(...future.stdout) [18:41:16.424] }, add = TRUE) [18:41:16.424] } [18:41:16.424] ...future.frame <- base::sys.nframe() [18:41:16.424] ...future.conditions <- base::list() [18:41:16.424] ...future.rng <- base::globalenv()$.Random.seed [18:41:16.424] if (FALSE) { [18:41:16.424] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:16.424] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:16.424] } [18:41:16.424] ...future.result <- base::tryCatch({ [18:41:16.424] base::withCallingHandlers({ [18:41:16.424] ...future.value <- base::withVisible(base::local({ [18:41:16.424] do.call(function(...) { [18:41:16.424] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.424] if (!identical(...future.globals.maxSize.org, [18:41:16.424] ...future.globals.maxSize)) { [18:41:16.424] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.424] on.exit(options(oopts), add = TRUE) [18:41:16.424] } [18:41:16.424] { [18:41:16.424] lapply(seq_along(...future.elements_ii), [18:41:16.424] FUN = function(jj) { [18:41:16.424] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.424] ...future.FUN(...future.X_jj, ...) [18:41:16.424] }) [18:41:16.424] } [18:41:16.424] }, args = future.call.arguments) [18:41:16.424] })) [18:41:16.424] future::FutureResult(value = ...future.value$value, [18:41:16.424] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:16.424] ...future.rng), globalenv = if (FALSE) [18:41:16.424] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:16.424] ...future.globalenv.names)) [18:41:16.424] else NULL, started = ...future.startTime, version = "1.8") [18:41:16.424] }, condition = base::local({ [18:41:16.424] c <- base::c [18:41:16.424] inherits <- base::inherits [18:41:16.424] invokeRestart <- base::invokeRestart [18:41:16.424] length <- base::length [18:41:16.424] list <- base::list [18:41:16.424] seq.int <- base::seq.int [18:41:16.424] signalCondition <- base::signalCondition [18:41:16.424] sys.calls <- base::sys.calls [18:41:16.424] `[[` <- base::`[[` [18:41:16.424] `+` <- base::`+` [18:41:16.424] `<<-` <- base::`<<-` [18:41:16.424] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:16.424] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:16.424] 3L)] [18:41:16.424] } [18:41:16.424] function(cond) { [18:41:16.424] is_error <- inherits(cond, "error") [18:41:16.424] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:16.424] NULL) [18:41:16.424] if (is_error) { [18:41:16.424] sessionInformation <- function() { [18:41:16.424] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:16.424] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:16.424] search = base::search(), system = base::Sys.info()) [18:41:16.424] } [18:41:16.424] ...future.conditions[[length(...future.conditions) + [18:41:16.424] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:16.424] cond$call), session = sessionInformation(), [18:41:16.424] timestamp = base::Sys.time(), signaled = 0L) [18:41:16.424] signalCondition(cond) [18:41:16.424] } [18:41:16.424] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:16.424] "immediateCondition"))) { [18:41:16.424] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:16.424] ...future.conditions[[length(...future.conditions) + [18:41:16.424] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:16.424] if (TRUE && !signal) { [18:41:16.424] muffleCondition <- function (cond, pattern = "^muffle") [18:41:16.424] { [18:41:16.424] inherits <- base::inherits [18:41:16.424] invokeRestart <- base::invokeRestart [18:41:16.424] is.null <- base::is.null [18:41:16.424] muffled <- FALSE [18:41:16.424] if (inherits(cond, "message")) { [18:41:16.424] muffled <- grepl(pattern, "muffleMessage") [18:41:16.424] if (muffled) [18:41:16.424] invokeRestart("muffleMessage") [18:41:16.424] } [18:41:16.424] else if (inherits(cond, "warning")) { [18:41:16.424] muffled <- grepl(pattern, "muffleWarning") [18:41:16.424] if (muffled) [18:41:16.424] invokeRestart("muffleWarning") [18:41:16.424] } [18:41:16.424] else if (inherits(cond, "condition")) { [18:41:16.424] if (!is.null(pattern)) { [18:41:16.424] computeRestarts <- base::computeRestarts [18:41:16.424] grepl <- base::grepl [18:41:16.424] restarts <- computeRestarts(cond) [18:41:16.424] for (restart in restarts) { [18:41:16.424] name <- restart$name [18:41:16.424] if (is.null(name)) [18:41:16.424] next [18:41:16.424] if (!grepl(pattern, name)) [18:41:16.424] next [18:41:16.424] invokeRestart(restart) [18:41:16.424] muffled <- TRUE [18:41:16.424] break [18:41:16.424] } [18:41:16.424] } [18:41:16.424] } [18:41:16.424] invisible(muffled) [18:41:16.424] } [18:41:16.424] muffleCondition(cond, pattern = "^muffle") [18:41:16.424] } [18:41:16.424] } [18:41:16.424] else { [18:41:16.424] if (TRUE) { [18:41:16.424] muffleCondition <- function (cond, pattern = "^muffle") [18:41:16.424] { [18:41:16.424] inherits <- base::inherits [18:41:16.424] invokeRestart <- base::invokeRestart [18:41:16.424] is.null <- base::is.null [18:41:16.424] muffled <- FALSE [18:41:16.424] if (inherits(cond, "message")) { [18:41:16.424] muffled <- grepl(pattern, "muffleMessage") [18:41:16.424] if (muffled) [18:41:16.424] invokeRestart("muffleMessage") [18:41:16.424] } [18:41:16.424] else if (inherits(cond, "warning")) { [18:41:16.424] muffled <- grepl(pattern, "muffleWarning") [18:41:16.424] if (muffled) [18:41:16.424] invokeRestart("muffleWarning") [18:41:16.424] } [18:41:16.424] else if (inherits(cond, "condition")) { [18:41:16.424] if (!is.null(pattern)) { [18:41:16.424] computeRestarts <- base::computeRestarts [18:41:16.424] grepl <- base::grepl [18:41:16.424] restarts <- computeRestarts(cond) [18:41:16.424] for (restart in restarts) { [18:41:16.424] name <- restart$name [18:41:16.424] if (is.null(name)) [18:41:16.424] next [18:41:16.424] if (!grepl(pattern, name)) [18:41:16.424] next [18:41:16.424] invokeRestart(restart) [18:41:16.424] muffled <- TRUE [18:41:16.424] break [18:41:16.424] } [18:41:16.424] } [18:41:16.424] } [18:41:16.424] invisible(muffled) [18:41:16.424] } [18:41:16.424] muffleCondition(cond, pattern = "^muffle") [18:41:16.424] } [18:41:16.424] } [18:41:16.424] } [18:41:16.424] })) [18:41:16.424] }, error = function(ex) { [18:41:16.424] base::structure(base::list(value = NULL, visible = NULL, [18:41:16.424] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:16.424] ...future.rng), started = ...future.startTime, [18:41:16.424] finished = Sys.time(), session_uuid = NA_character_, [18:41:16.424] version = "1.8"), class = "FutureResult") [18:41:16.424] }, finally = { [18:41:16.424] if (!identical(...future.workdir, getwd())) [18:41:16.424] setwd(...future.workdir) [18:41:16.424] { [18:41:16.424] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:16.424] ...future.oldOptions$nwarnings <- NULL [18:41:16.424] } [18:41:16.424] base::options(...future.oldOptions) [18:41:16.424] if (.Platform$OS.type == "windows") { [18:41:16.424] old_names <- names(...future.oldEnvVars) [18:41:16.424] envs <- base::Sys.getenv() [18:41:16.424] names <- names(envs) [18:41:16.424] common <- intersect(names, old_names) [18:41:16.424] added <- setdiff(names, old_names) [18:41:16.424] removed <- setdiff(old_names, names) [18:41:16.424] changed <- common[...future.oldEnvVars[common] != [18:41:16.424] envs[common]] [18:41:16.424] NAMES <- toupper(changed) [18:41:16.424] args <- list() [18:41:16.424] for (kk in seq_along(NAMES)) { [18:41:16.424] name <- changed[[kk]] [18:41:16.424] NAME <- NAMES[[kk]] [18:41:16.424] if (name != NAME && is.element(NAME, old_names)) [18:41:16.424] next [18:41:16.424] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:16.424] } [18:41:16.424] NAMES <- toupper(added) [18:41:16.424] for (kk in seq_along(NAMES)) { [18:41:16.424] name <- added[[kk]] [18:41:16.424] NAME <- NAMES[[kk]] [18:41:16.424] if (name != NAME && is.element(NAME, old_names)) [18:41:16.424] next [18:41:16.424] args[[name]] <- "" [18:41:16.424] } [18:41:16.424] NAMES <- toupper(removed) [18:41:16.424] for (kk in seq_along(NAMES)) { [18:41:16.424] name <- removed[[kk]] [18:41:16.424] NAME <- NAMES[[kk]] [18:41:16.424] if (name != NAME && is.element(NAME, old_names)) [18:41:16.424] next [18:41:16.424] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:16.424] } [18:41:16.424] if (length(args) > 0) [18:41:16.424] base::do.call(base::Sys.setenv, args = args) [18:41:16.424] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:16.424] } [18:41:16.424] else { [18:41:16.424] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:16.424] } [18:41:16.424] { [18:41:16.424] if (base::length(...future.futureOptionsAdded) > [18:41:16.424] 0L) { [18:41:16.424] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:16.424] base::names(opts) <- ...future.futureOptionsAdded [18:41:16.424] base::options(opts) [18:41:16.424] } [18:41:16.424] { [18:41:16.424] { [18:41:16.424] NULL [18:41:16.424] RNGkind("Mersenne-Twister") [18:41:16.424] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:16.424] inherits = FALSE) [18:41:16.424] } [18:41:16.424] options(future.plan = NULL) [18:41:16.424] if (is.na(NA_character_)) [18:41:16.424] Sys.unsetenv("R_FUTURE_PLAN") [18:41:16.424] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:16.424] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:16.424] .init = FALSE) [18:41:16.424] } [18:41:16.424] } [18:41:16.424] } [18:41:16.424] }) [18:41:16.424] if (TRUE) { [18:41:16.424] base::sink(type = "output", split = FALSE) [18:41:16.424] if (TRUE) { [18:41:16.424] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:16.424] } [18:41:16.424] else { [18:41:16.424] ...future.result["stdout"] <- base::list(NULL) [18:41:16.424] } [18:41:16.424] base::close(...future.stdout) [18:41:16.424] ...future.stdout <- NULL [18:41:16.424] } [18:41:16.424] ...future.result$conditions <- ...future.conditions [18:41:16.424] ...future.result$finished <- base::Sys.time() [18:41:16.424] ...future.result [18:41:16.424] } [18:41:16.428] assign_globals() ... [18:41:16.428] List of 5 [18:41:16.428] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:16.428] $ future.call.arguments :List of 1 [18:41:16.428] ..$ length: int 2 [18:41:16.428] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:16.428] $ ...future.elements_ii :List of 1 [18:41:16.428] ..$ c: chr "list" [18:41:16.428] $ ...future.seeds_ii : NULL [18:41:16.428] $ ...future.globals.maxSize: NULL [18:41:16.428] - attr(*, "where")=List of 5 [18:41:16.428] ..$ ...future.FUN : [18:41:16.428] ..$ future.call.arguments : [18:41:16.428] ..$ ...future.elements_ii : [18:41:16.428] ..$ ...future.seeds_ii : [18:41:16.428] ..$ ...future.globals.maxSize: [18:41:16.428] - attr(*, "resolved")= logi FALSE [18:41:16.428] - attr(*, "total_size")= num 4406 [18:41:16.428] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:16.428] - attr(*, "already-done")= logi TRUE [18:41:16.435] - copied '...future.FUN' to environment [18:41:16.435] - copied 'future.call.arguments' to environment [18:41:16.435] - copied '...future.elements_ii' to environment [18:41:16.436] - copied '...future.seeds_ii' to environment [18:41:16.436] - copied '...future.globals.maxSize' to environment [18:41:16.436] assign_globals() ... done [18:41:16.436] plan(): Setting new future strategy stack: [18:41:16.436] List of future strategies: [18:41:16.436] 1. sequential: [18:41:16.436] - args: function (..., envir = parent.frame(), workers = "") [18:41:16.436] - tweaked: FALSE [18:41:16.436] - call: NULL [18:41:16.437] plan(): nbrOfWorkers() = 1 [18:41:16.438] plan(): Setting new future strategy stack: [18:41:16.438] List of future strategies: [18:41:16.438] 1. sequential: [18:41:16.438] - args: function (..., envir = parent.frame(), workers = "") [18:41:16.438] - tweaked: FALSE [18:41:16.438] - call: plan(strategy) [18:41:16.439] plan(): nbrOfWorkers() = 1 [18:41:16.439] SequentialFuture started (and completed) [18:41:16.440] - Launch lazy future ... done [18:41:16.440] run() for 'SequentialFuture' ... done [18:41:16.440] Created future: [18:41:16.440] SequentialFuture: [18:41:16.440] Label: 'future_lapply-4' [18:41:16.440] Expression: [18:41:16.440] { [18:41:16.440] do.call(function(...) { [18:41:16.440] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.440] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:16.440] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.440] on.exit(options(oopts), add = TRUE) [18:41:16.440] } [18:41:16.440] { [18:41:16.440] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:16.440] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.440] ...future.FUN(...future.X_jj, ...) [18:41:16.440] }) [18:41:16.440] } [18:41:16.440] }, args = future.call.arguments) [18:41:16.440] } [18:41:16.440] Lazy evaluation: FALSE [18:41:16.440] Asynchronous evaluation: FALSE [18:41:16.440] Local evaluation: TRUE [18:41:16.440] Environment: R_GlobalEnv [18:41:16.440] Capture standard output: TRUE [18:41:16.440] Capture condition classes: 'condition' (excluding 'nothing') [18:41:16.440] Globals: 5 objects totaling 755 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 93 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:16.440] Packages: [18:41:16.440] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:16.440] Resolved: TRUE [18:41:16.440] Value: 47 bytes of class 'list' [18:41:16.440] Early signaling: FALSE [18:41:16.440] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:16.440] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:16.441] Chunk #4 of 4 ... DONE [18:41:16.441] Launching 4 futures (chunks) ... DONE [18:41:16.441] Resolving 4 futures (chunks) ... [18:41:16.442] resolve() on list ... [18:41:16.442] recursive: 0 [18:41:16.442] length: 4 [18:41:16.442] [18:41:16.442] resolved() for 'SequentialFuture' ... [18:41:16.442] - state: 'finished' [18:41:16.443] - run: TRUE [18:41:16.443] - result: 'FutureResult' [18:41:16.443] resolved() for 'SequentialFuture' ... done [18:41:16.443] Future #1 [18:41:16.443] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:16.444] - nx: 4 [18:41:16.444] - relay: TRUE [18:41:16.444] - stdout: TRUE [18:41:16.444] - signal: TRUE [18:41:16.444] - resignal: FALSE [18:41:16.444] - force: TRUE [18:41:16.444] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [18:41:16.445] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:41:16.445] - until=1 [18:41:16.445] - relaying element #1 [18:41:16.445] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:16.445] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:16.445] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:16.446] length: 3 (resolved future 1) [18:41:16.446] resolved() for 'SequentialFuture' ... [18:41:16.446] - state: 'finished' [18:41:16.446] - run: TRUE [18:41:16.446] - result: 'FutureResult' [18:41:16.447] resolved() for 'SequentialFuture' ... done [18:41:16.447] Future #2 [18:41:16.447] signalConditionsASAP(SequentialFuture, pos=2) ... [18:41:16.447] - nx: 4 [18:41:16.447] - relay: TRUE [18:41:16.447] - stdout: TRUE [18:41:16.448] - signal: TRUE [18:41:16.448] - resignal: FALSE [18:41:16.448] - force: TRUE [18:41:16.448] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:16.448] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:16.448] - until=2 [18:41:16.448] - relaying element #2 [18:41:16.449] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:16.449] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:16.449] signalConditionsASAP(SequentialFuture, pos=2) ... done [18:41:16.449] length: 2 (resolved future 2) [18:41:16.449] resolved() for 'SequentialFuture' ... [18:41:16.450] - state: 'finished' [18:41:16.450] - run: TRUE [18:41:16.450] - result: 'FutureResult' [18:41:16.450] resolved() for 'SequentialFuture' ... done [18:41:16.450] Future #3 [18:41:16.450] signalConditionsASAP(SequentialFuture, pos=3) ... [18:41:16.451] - nx: 4 [18:41:16.451] - relay: TRUE [18:41:16.451] - stdout: TRUE [18:41:16.451] - signal: TRUE [18:41:16.451] - resignal: FALSE [18:41:16.451] - force: TRUE [18:41:16.452] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:16.452] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:16.452] - until=3 [18:41:16.452] - relaying element #3 [18:41:16.452] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:16.452] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:16.453] signalConditionsASAP(SequentialFuture, pos=3) ... done [18:41:16.453] length: 1 (resolved future 3) [18:41:16.453] resolved() for 'SequentialFuture' ... [18:41:16.453] - state: 'finished' [18:41:16.453] - run: TRUE [18:41:16.453] - result: 'FutureResult' [18:41:16.454] resolved() for 'SequentialFuture' ... done [18:41:16.454] Future #4 [18:41:16.454] signalConditionsASAP(SequentialFuture, pos=4) ... [18:41:16.454] - nx: 4 [18:41:16.454] - relay: TRUE [18:41:16.454] - stdout: TRUE [18:41:16.455] - signal: TRUE [18:41:16.455] - resignal: FALSE [18:41:16.455] - force: TRUE [18:41:16.455] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:16.455] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:16.455] - until=4 [18:41:16.456] - relaying element #4 [18:41:16.456] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:16.456] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:16.456] signalConditionsASAP(SequentialFuture, pos=4) ... done [18:41:16.456] length: 0 (resolved future 4) [18:41:16.456] Relaying remaining futures [18:41:16.457] signalConditionsASAP(NULL, pos=0) ... [18:41:16.457] - nx: 4 [18:41:16.457] - relay: TRUE [18:41:16.457] - stdout: TRUE [18:41:16.457] - signal: TRUE [18:41:16.457] - resignal: FALSE [18:41:16.457] - force: TRUE [18:41:16.458] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:16.458] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [18:41:16.458] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:16.458] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:16.458] signalConditionsASAP(NULL, pos=0) ... done [18:41:16.458] resolve() on list ... DONE [18:41:16.460] - Number of value chunks collected: 4 [18:41:16.460] Resolving 4 futures (chunks) ... DONE [18:41:16.460] Reducing values from 4 chunks ... [18:41:16.460] - Number of values collected after concatenation: 4 [18:41:16.460] - Number of values expected: 4 [18:41:16.460] Reducing values from 4 chunks ... DONE [18:41:16.461] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL - future_lapply(x, FUN = future:::hpaste, ...) ... [18:41:16.463] future_lapply() ... [18:41:16.474] Number of chunks: 1 [18:41:16.474] getGlobalsAndPackagesXApply() ... [18:41:16.474] - future.globals: TRUE [18:41:16.474] getGlobalsAndPackages() ... [18:41:16.475] Searching for globals... [18:41:16.485] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [18:41:16.485] Searching for globals ... DONE [18:41:16.485] Resolving globals: FALSE [18:41:16.486] The total size of the 1 globals is 7.17 KiB (7342 bytes) [18:41:16.487] The total size of the 1 globals exported for future expression ('FUN(collapse = "; ", maxHead = 3L)') is 7.17 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (7.17 KiB of class 'function') [18:41:16.487] - globals: [1] 'FUN' [18:41:16.487] - packages: [1] 'future' [18:41:16.487] getGlobalsAndPackages() ... DONE [18:41:16.487] - globals found/used: [n=1] 'FUN' [18:41:16.488] - needed namespaces: [n=1] 'future' [18:41:16.488] Finding globals ... DONE [18:41:16.488] - use_args: TRUE [18:41:16.488] - Getting '...' globals ... [18:41:16.489] resolve() on list ... [18:41:16.489] recursive: 0 [18:41:16.489] length: 1 [18:41:16.489] elements: '...' [18:41:16.489] length: 0 (resolved future 1) [18:41:16.489] resolve() on list ... DONE [18:41:16.490] - '...' content: [n=2] 'collapse', 'maxHead' [18:41:16.490] List of 1 [18:41:16.490] $ ...:List of 2 [18:41:16.490] ..$ collapse: chr "; " [18:41:16.490] ..$ maxHead : int 3 [18:41:16.490] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:16.490] - attr(*, "where")=List of 1 [18:41:16.490] ..$ ...: [18:41:16.490] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:16.490] - attr(*, "resolved")= logi TRUE [18:41:16.490] - attr(*, "total_size")= num NA [18:41:16.493] - Getting '...' globals ... DONE [18:41:16.493] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:16.494] List of 2 [18:41:16.494] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [18:41:16.494] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [18:41:16.494] $ ... :List of 2 [18:41:16.494] ..$ collapse: chr "; " [18:41:16.494] ..$ maxHead : int 3 [18:41:16.494] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:16.494] - attr(*, "where")=List of 2 [18:41:16.494] ..$ ...future.FUN: [18:41:16.494] ..$ ... : [18:41:16.494] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:16.494] - attr(*, "resolved")= logi FALSE [18:41:16.494] - attr(*, "total_size")= int 20301 [18:41:16.498] Packages to be attached in all futures: [n=1] 'future' [18:41:16.499] getGlobalsAndPackagesXApply() ... DONE [18:41:16.499] Number of futures (= number of chunks): 1 [18:41:16.499] Launching 1 futures (chunks) ... [18:41:16.499] Chunk #1 of 1 ... [18:41:16.499] - Finding globals in 'X' for chunk #1 ... [18:41:16.499] getGlobalsAndPackages() ... [18:41:16.500] Searching for globals... [18:41:16.500] [18:41:16.500] Searching for globals ... DONE [18:41:16.500] - globals: [0] [18:41:16.500] getGlobalsAndPackages() ... DONE [18:41:16.501] + additional globals found: [n=0] [18:41:16.501] + additional namespaces needed: [n=0] [18:41:16.501] - Finding globals in 'X' for chunk #1 ... DONE [18:41:16.501] - seeds: [18:41:16.501] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.501] getGlobalsAndPackages() ... [18:41:16.502] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.502] Resolving globals: FALSE [18:41:16.502] Tweak future expression to call with '...' arguments ... [18:41:16.502] { [18:41:16.502] do.call(function(...) { [18:41:16.502] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.502] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:16.502] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.502] on.exit(options(oopts), add = TRUE) [18:41:16.502] } [18:41:16.502] { [18:41:16.502] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:16.502] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.502] ...future.FUN(...future.X_jj, ...) [18:41:16.502] }) [18:41:16.502] } [18:41:16.502] }, args = future.call.arguments) [18:41:16.502] } [18:41:16.502] Tweak future expression to call with '...' arguments ... DONE [18:41:16.503] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.503] - packages: [1] 'future' [18:41:16.503] getGlobalsAndPackages() ... DONE [18:41:16.504] run() for 'Future' ... [18:41:16.504] - state: 'created' [18:41:16.504] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:16.504] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:16.505] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:16.505] - Field: 'label' [18:41:16.505] - Field: 'local' [18:41:16.505] - Field: 'owner' [18:41:16.505] - Field: 'envir' [18:41:16.505] - Field: 'packages' [18:41:16.506] - Field: 'gc' [18:41:16.506] - Field: 'conditions' [18:41:16.506] - Field: 'expr' [18:41:16.506] - Field: 'uuid' [18:41:16.506] - Field: 'seed' [18:41:16.506] - Field: 'version' [18:41:16.507] - Field: 'result' [18:41:16.507] - Field: 'asynchronous' [18:41:16.507] - Field: 'calls' [18:41:16.507] - Field: 'globals' [18:41:16.507] - Field: 'stdout' [18:41:16.507] - Field: 'earlySignal' [18:41:16.508] - Field: 'lazy' [18:41:16.508] - Field: 'state' [18:41:16.508] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:16.508] - Launch lazy future ... [18:41:16.508] Packages needed by the future expression (n = 1): 'future' [18:41:16.509] Packages needed by future strategies (n = 0): [18:41:16.509] { [18:41:16.509] { [18:41:16.509] { [18:41:16.509] ...future.startTime <- base::Sys.time() [18:41:16.509] { [18:41:16.509] { [18:41:16.509] { [18:41:16.509] { [18:41:16.509] base::local({ [18:41:16.509] has_future <- base::requireNamespace("future", [18:41:16.509] quietly = TRUE) [18:41:16.509] if (has_future) { [18:41:16.509] ns <- base::getNamespace("future") [18:41:16.509] version <- ns[[".package"]][["version"]] [18:41:16.509] if (is.null(version)) [18:41:16.509] version <- utils::packageVersion("future") [18:41:16.509] } [18:41:16.509] else { [18:41:16.509] version <- NULL [18:41:16.509] } [18:41:16.509] if (!has_future || version < "1.8.0") { [18:41:16.509] info <- base::c(r_version = base::gsub("R version ", [18:41:16.509] "", base::R.version$version.string), [18:41:16.509] platform = base::sprintf("%s (%s-bit)", [18:41:16.509] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:16.509] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:16.509] "release", "version")], collapse = " "), [18:41:16.509] hostname = base::Sys.info()[["nodename"]]) [18:41:16.509] info <- base::sprintf("%s: %s", base::names(info), [18:41:16.509] info) [18:41:16.509] info <- base::paste(info, collapse = "; ") [18:41:16.509] if (!has_future) { [18:41:16.509] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:16.509] info) [18:41:16.509] } [18:41:16.509] else { [18:41:16.509] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:16.509] info, version) [18:41:16.509] } [18:41:16.509] base::stop(msg) [18:41:16.509] } [18:41:16.509] }) [18:41:16.509] } [18:41:16.509] base::local({ [18:41:16.509] for (pkg in "future") { [18:41:16.509] base::loadNamespace(pkg) [18:41:16.509] base::library(pkg, character.only = TRUE) [18:41:16.509] } [18:41:16.509] }) [18:41:16.509] } [18:41:16.509] ...future.strategy.old <- future::plan("list") [18:41:16.509] options(future.plan = NULL) [18:41:16.509] Sys.unsetenv("R_FUTURE_PLAN") [18:41:16.509] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:16.509] } [18:41:16.509] ...future.workdir <- getwd() [18:41:16.509] } [18:41:16.509] ...future.oldOptions <- base::as.list(base::.Options) [18:41:16.509] ...future.oldEnvVars <- base::Sys.getenv() [18:41:16.509] } [18:41:16.509] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:16.509] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:16.509] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:16.509] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:16.509] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:16.509] future.stdout.windows.reencode = NULL, width = 80L) [18:41:16.509] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:16.509] base::names(...future.oldOptions)) [18:41:16.509] } [18:41:16.509] if (FALSE) { [18:41:16.509] } [18:41:16.509] else { [18:41:16.509] if (TRUE) { [18:41:16.509] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:16.509] open = "w") [18:41:16.509] } [18:41:16.509] else { [18:41:16.509] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:16.509] windows = "NUL", "/dev/null"), open = "w") [18:41:16.509] } [18:41:16.509] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:16.509] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:16.509] base::sink(type = "output", split = FALSE) [18:41:16.509] base::close(...future.stdout) [18:41:16.509] }, add = TRUE) [18:41:16.509] } [18:41:16.509] ...future.frame <- base::sys.nframe() [18:41:16.509] ...future.conditions <- base::list() [18:41:16.509] ...future.rng <- base::globalenv()$.Random.seed [18:41:16.509] if (FALSE) { [18:41:16.509] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:16.509] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:16.509] } [18:41:16.509] ...future.result <- base::tryCatch({ [18:41:16.509] base::withCallingHandlers({ [18:41:16.509] ...future.value <- base::withVisible(base::local({ [18:41:16.509] do.call(function(...) { [18:41:16.509] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.509] if (!identical(...future.globals.maxSize.org, [18:41:16.509] ...future.globals.maxSize)) { [18:41:16.509] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.509] on.exit(options(oopts), add = TRUE) [18:41:16.509] } [18:41:16.509] { [18:41:16.509] lapply(seq_along(...future.elements_ii), [18:41:16.509] FUN = function(jj) { [18:41:16.509] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.509] ...future.FUN(...future.X_jj, ...) [18:41:16.509] }) [18:41:16.509] } [18:41:16.509] }, args = future.call.arguments) [18:41:16.509] })) [18:41:16.509] future::FutureResult(value = ...future.value$value, [18:41:16.509] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:16.509] ...future.rng), globalenv = if (FALSE) [18:41:16.509] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:16.509] ...future.globalenv.names)) [18:41:16.509] else NULL, started = ...future.startTime, version = "1.8") [18:41:16.509] }, condition = base::local({ [18:41:16.509] c <- base::c [18:41:16.509] inherits <- base::inherits [18:41:16.509] invokeRestart <- base::invokeRestart [18:41:16.509] length <- base::length [18:41:16.509] list <- base::list [18:41:16.509] seq.int <- base::seq.int [18:41:16.509] signalCondition <- base::signalCondition [18:41:16.509] sys.calls <- base::sys.calls [18:41:16.509] `[[` <- base::`[[` [18:41:16.509] `+` <- base::`+` [18:41:16.509] `<<-` <- base::`<<-` [18:41:16.509] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:16.509] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:16.509] 3L)] [18:41:16.509] } [18:41:16.509] function(cond) { [18:41:16.509] is_error <- inherits(cond, "error") [18:41:16.509] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:16.509] NULL) [18:41:16.509] if (is_error) { [18:41:16.509] sessionInformation <- function() { [18:41:16.509] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:16.509] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:16.509] search = base::search(), system = base::Sys.info()) [18:41:16.509] } [18:41:16.509] ...future.conditions[[length(...future.conditions) + [18:41:16.509] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:16.509] cond$call), session = sessionInformation(), [18:41:16.509] timestamp = base::Sys.time(), signaled = 0L) [18:41:16.509] signalCondition(cond) [18:41:16.509] } [18:41:16.509] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:16.509] "immediateCondition"))) { [18:41:16.509] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:16.509] ...future.conditions[[length(...future.conditions) + [18:41:16.509] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:16.509] if (TRUE && !signal) { [18:41:16.509] muffleCondition <- function (cond, pattern = "^muffle") [18:41:16.509] { [18:41:16.509] inherits <- base::inherits [18:41:16.509] invokeRestart <- base::invokeRestart [18:41:16.509] is.null <- base::is.null [18:41:16.509] muffled <- FALSE [18:41:16.509] if (inherits(cond, "message")) { [18:41:16.509] muffled <- grepl(pattern, "muffleMessage") [18:41:16.509] if (muffled) [18:41:16.509] invokeRestart("muffleMessage") [18:41:16.509] } [18:41:16.509] else if (inherits(cond, "warning")) { [18:41:16.509] muffled <- grepl(pattern, "muffleWarning") [18:41:16.509] if (muffled) [18:41:16.509] invokeRestart("muffleWarning") [18:41:16.509] } [18:41:16.509] else if (inherits(cond, "condition")) { [18:41:16.509] if (!is.null(pattern)) { [18:41:16.509] computeRestarts <- base::computeRestarts [18:41:16.509] grepl <- base::grepl [18:41:16.509] restarts <- computeRestarts(cond) [18:41:16.509] for (restart in restarts) { [18:41:16.509] name <- restart$name [18:41:16.509] if (is.null(name)) [18:41:16.509] next [18:41:16.509] if (!grepl(pattern, name)) [18:41:16.509] next [18:41:16.509] invokeRestart(restart) [18:41:16.509] muffled <- TRUE [18:41:16.509] break [18:41:16.509] } [18:41:16.509] } [18:41:16.509] } [18:41:16.509] invisible(muffled) [18:41:16.509] } [18:41:16.509] muffleCondition(cond, pattern = "^muffle") [18:41:16.509] } [18:41:16.509] } [18:41:16.509] else { [18:41:16.509] if (TRUE) { [18:41:16.509] muffleCondition <- function (cond, pattern = "^muffle") [18:41:16.509] { [18:41:16.509] inherits <- base::inherits [18:41:16.509] invokeRestart <- base::invokeRestart [18:41:16.509] is.null <- base::is.null [18:41:16.509] muffled <- FALSE [18:41:16.509] if (inherits(cond, "message")) { [18:41:16.509] muffled <- grepl(pattern, "muffleMessage") [18:41:16.509] if (muffled) [18:41:16.509] invokeRestart("muffleMessage") [18:41:16.509] } [18:41:16.509] else if (inherits(cond, "warning")) { [18:41:16.509] muffled <- grepl(pattern, "muffleWarning") [18:41:16.509] if (muffled) [18:41:16.509] invokeRestart("muffleWarning") [18:41:16.509] } [18:41:16.509] else if (inherits(cond, "condition")) { [18:41:16.509] if (!is.null(pattern)) { [18:41:16.509] computeRestarts <- base::computeRestarts [18:41:16.509] grepl <- base::grepl [18:41:16.509] restarts <- computeRestarts(cond) [18:41:16.509] for (restart in restarts) { [18:41:16.509] name <- restart$name [18:41:16.509] if (is.null(name)) [18:41:16.509] next [18:41:16.509] if (!grepl(pattern, name)) [18:41:16.509] next [18:41:16.509] invokeRestart(restart) [18:41:16.509] muffled <- TRUE [18:41:16.509] break [18:41:16.509] } [18:41:16.509] } [18:41:16.509] } [18:41:16.509] invisible(muffled) [18:41:16.509] } [18:41:16.509] muffleCondition(cond, pattern = "^muffle") [18:41:16.509] } [18:41:16.509] } [18:41:16.509] } [18:41:16.509] })) [18:41:16.509] }, error = function(ex) { [18:41:16.509] base::structure(base::list(value = NULL, visible = NULL, [18:41:16.509] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:16.509] ...future.rng), started = ...future.startTime, [18:41:16.509] finished = Sys.time(), session_uuid = NA_character_, [18:41:16.509] version = "1.8"), class = "FutureResult") [18:41:16.509] }, finally = { [18:41:16.509] if (!identical(...future.workdir, getwd())) [18:41:16.509] setwd(...future.workdir) [18:41:16.509] { [18:41:16.509] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:16.509] ...future.oldOptions$nwarnings <- NULL [18:41:16.509] } [18:41:16.509] base::options(...future.oldOptions) [18:41:16.509] if (.Platform$OS.type == "windows") { [18:41:16.509] old_names <- names(...future.oldEnvVars) [18:41:16.509] envs <- base::Sys.getenv() [18:41:16.509] names <- names(envs) [18:41:16.509] common <- intersect(names, old_names) [18:41:16.509] added <- setdiff(names, old_names) [18:41:16.509] removed <- setdiff(old_names, names) [18:41:16.509] changed <- common[...future.oldEnvVars[common] != [18:41:16.509] envs[common]] [18:41:16.509] NAMES <- toupper(changed) [18:41:16.509] args <- list() [18:41:16.509] for (kk in seq_along(NAMES)) { [18:41:16.509] name <- changed[[kk]] [18:41:16.509] NAME <- NAMES[[kk]] [18:41:16.509] if (name != NAME && is.element(NAME, old_names)) [18:41:16.509] next [18:41:16.509] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:16.509] } [18:41:16.509] NAMES <- toupper(added) [18:41:16.509] for (kk in seq_along(NAMES)) { [18:41:16.509] name <- added[[kk]] [18:41:16.509] NAME <- NAMES[[kk]] [18:41:16.509] if (name != NAME && is.element(NAME, old_names)) [18:41:16.509] next [18:41:16.509] args[[name]] <- "" [18:41:16.509] } [18:41:16.509] NAMES <- toupper(removed) [18:41:16.509] for (kk in seq_along(NAMES)) { [18:41:16.509] name <- removed[[kk]] [18:41:16.509] NAME <- NAMES[[kk]] [18:41:16.509] if (name != NAME && is.element(NAME, old_names)) [18:41:16.509] next [18:41:16.509] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:16.509] } [18:41:16.509] if (length(args) > 0) [18:41:16.509] base::do.call(base::Sys.setenv, args = args) [18:41:16.509] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:16.509] } [18:41:16.509] else { [18:41:16.509] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:16.509] } [18:41:16.509] { [18:41:16.509] if (base::length(...future.futureOptionsAdded) > [18:41:16.509] 0L) { [18:41:16.509] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:16.509] base::names(opts) <- ...future.futureOptionsAdded [18:41:16.509] base::options(opts) [18:41:16.509] } [18:41:16.509] { [18:41:16.509] { [18:41:16.509] NULL [18:41:16.509] RNGkind("Mersenne-Twister") [18:41:16.509] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:16.509] inherits = FALSE) [18:41:16.509] } [18:41:16.509] options(future.plan = NULL) [18:41:16.509] if (is.na(NA_character_)) [18:41:16.509] Sys.unsetenv("R_FUTURE_PLAN") [18:41:16.509] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:16.509] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:16.509] .init = FALSE) [18:41:16.509] } [18:41:16.509] } [18:41:16.509] } [18:41:16.509] }) [18:41:16.509] if (TRUE) { [18:41:16.509] base::sink(type = "output", split = FALSE) [18:41:16.509] if (TRUE) { [18:41:16.509] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:16.509] } [18:41:16.509] else { [18:41:16.509] ...future.result["stdout"] <- base::list(NULL) [18:41:16.509] } [18:41:16.509] base::close(...future.stdout) [18:41:16.509] ...future.stdout <- NULL [18:41:16.509] } [18:41:16.509] ...future.result$conditions <- ...future.conditions [18:41:16.509] ...future.result$finished <- base::Sys.time() [18:41:16.509] ...future.result [18:41:16.509] } [18:41:16.513] assign_globals() ... [18:41:16.513] List of 5 [18:41:16.513] $ ...future.FUN :function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [18:41:16.513] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [18:41:16.513] $ future.call.arguments :List of 2 [18:41:16.513] ..$ collapse: chr "; " [18:41:16.513] ..$ maxHead : int 3 [18:41:16.513] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:16.513] $ ...future.elements_ii :List of 1 [18:41:16.513] ..$ a: Named chr [1:101] "hello" "1" "2" "3" ... [18:41:16.513] .. ..- attr(*, "names")= chr [1:101] "" "b1" "b2" "b3" ... [18:41:16.513] $ ...future.seeds_ii : NULL [18:41:16.513] $ ...future.globals.maxSize: NULL [18:41:16.513] - attr(*, "where")=List of 5 [18:41:16.513] ..$ ...future.FUN : [18:41:16.513] ..$ future.call.arguments : [18:41:16.513] ..$ ...future.elements_ii : [18:41:16.513] ..$ ...future.seeds_ii : [18:41:16.513] ..$ ...future.globals.maxSize: [18:41:16.513] - attr(*, "resolved")= logi FALSE [18:41:16.513] - attr(*, "total_size")= num 20301 [18:41:16.513] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:16.513] - attr(*, "already-done")= logi TRUE [18:41:16.520] - copied '...future.FUN' to environment [18:41:16.520] - copied 'future.call.arguments' to environment [18:41:16.520] - copied '...future.elements_ii' to environment [18:41:16.520] - copied '...future.seeds_ii' to environment [18:41:16.521] - copied '...future.globals.maxSize' to environment [18:41:16.521] assign_globals() ... done [18:41:16.521] plan(): Setting new future strategy stack: [18:41:16.522] List of future strategies: [18:41:16.522] 1. sequential: [18:41:16.522] - args: function (..., envir = parent.frame(), workers = "") [18:41:16.522] - tweaked: FALSE [18:41:16.522] - call: NULL [18:41:16.523] plan(): nbrOfWorkers() = 1 [18:41:16.524] plan(): Setting new future strategy stack: [18:41:16.524] List of future strategies: [18:41:16.524] 1. sequential: [18:41:16.524] - args: function (..., envir = parent.frame(), workers = "") [18:41:16.524] - tweaked: FALSE [18:41:16.524] - call: plan(strategy) [18:41:16.525] plan(): nbrOfWorkers() = 1 [18:41:16.525] SequentialFuture started (and completed) [18:41:16.526] - Launch lazy future ... done [18:41:16.526] run() for 'SequentialFuture' ... done [18:41:16.526] Created future: [18:41:16.526] SequentialFuture: [18:41:16.526] Label: 'future_lapply-1' [18:41:16.526] Expression: [18:41:16.526] { [18:41:16.526] do.call(function(...) { [18:41:16.526] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.526] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:16.526] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.526] on.exit(options(oopts), add = TRUE) [18:41:16.526] } [18:41:16.526] { [18:41:16.526] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:16.526] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.526] ...future.FUN(...future.X_jj, ...) [18:41:16.526] }) [18:41:16.526] } [18:41:16.526] }, args = future.call.arguments) [18:41:16.526] } [18:41:16.526] Lazy evaluation: FALSE [18:41:16.526] Asynchronous evaluation: FALSE [18:41:16.526] Local evaluation: TRUE [18:41:16.526] Environment: R_GlobalEnv [18:41:16.526] Capture standard output: TRUE [18:41:16.526] Capture condition classes: 'condition' (excluding 'nothing') [18:41:16.526] Globals: 5 objects totaling 9.56 KiB (function '...future.FUN' of 7.17 KiB, DotDotDotList 'future.call.arguments' of 187 bytes, list '...future.elements_ii' of 2.15 KiB, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:16.526] Packages: 1 packages ('future') [18:41:16.526] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:16.526] Resolved: TRUE [18:41:16.526] Value: 68 bytes of class 'list' [18:41:16.526] Early signaling: FALSE [18:41:16.526] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:16.526] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:16.527] Chunk #1 of 1 ... DONE [18:41:16.527] Launching 1 futures (chunks) ... DONE [18:41:16.527] Resolving 1 futures (chunks) ... [18:41:16.528] resolve() on list ... [18:41:16.528] recursive: 0 [18:41:16.528] length: 1 [18:41:16.528] [18:41:16.528] resolved() for 'SequentialFuture' ... [18:41:16.528] - state: 'finished' [18:41:16.529] - run: TRUE [18:41:16.529] - result: 'FutureResult' [18:41:16.529] resolved() for 'SequentialFuture' ... done [18:41:16.529] Future #1 [18:41:16.529] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:16.529] - nx: 1 [18:41:16.530] - relay: TRUE [18:41:16.530] - stdout: TRUE [18:41:16.530] - signal: TRUE [18:41:16.530] - resignal: FALSE [18:41:16.530] - force: TRUE [18:41:16.530] - relayed: [n=1] FALSE [18:41:16.530] - queued futures: [n=1] FALSE [18:41:16.531] - until=1 [18:41:16.531] - relaying element #1 [18:41:16.531] - relayed: [n=1] TRUE [18:41:16.531] - queued futures: [n=1] TRUE [18:41:16.531] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:16.532] length: 0 (resolved future 1) [18:41:16.532] Relaying remaining futures [18:41:16.532] signalConditionsASAP(NULL, pos=0) ... [18:41:16.532] - nx: 1 [18:41:16.532] - relay: TRUE [18:41:16.532] - stdout: TRUE [18:41:16.532] - signal: TRUE [18:41:16.533] - resignal: FALSE [18:41:16.533] - force: TRUE [18:41:16.533] - relayed: [n=1] TRUE [18:41:16.533] - queued futures: [n=1] TRUE - flush all [18:41:16.533] - relayed: [n=1] TRUE [18:41:16.533] - queued futures: [n=1] TRUE [18:41:16.534] signalConditionsASAP(NULL, pos=0) ... done [18:41:16.534] resolve() on list ... DONE [18:41:16.534] - Number of value chunks collected: 1 [18:41:16.534] Resolving 1 futures (chunks) ... DONE [18:41:16.534] Reducing values from 1 chunks ... [18:41:16.534] - Number of values collected after concatenation: 1 [18:41:16.535] - Number of values expected: 1 [18:41:16.535] Reducing values from 1 chunks ... DONE [18:41:16.535] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [18:41:16.536] future_lapply() ... [18:41:16.537] Number of chunks: 2 [18:41:16.537] getGlobalsAndPackagesXApply() ... [18:41:16.537] - future.globals: TRUE [18:41:16.537] getGlobalsAndPackages() ... [18:41:16.538] Searching for globals... [18:41:16.539] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [18:41:16.539] Searching for globals ... DONE [18:41:16.539] Resolving globals: FALSE [18:41:16.540] The total size of the 1 globals is 911 bytes (911 bytes) [18:41:16.540] The total size of the 1 globals exported for future expression ('FUN()') is 911 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (911 bytes of class 'function') [18:41:16.540] - globals: [1] 'FUN' [18:41:16.541] - packages: [1] 'listenv' [18:41:16.541] getGlobalsAndPackages() ... DONE [18:41:16.541] - globals found/used: [n=1] 'FUN' [18:41:16.541] - needed namespaces: [n=1] 'listenv' [18:41:16.541] Finding globals ... DONE [18:41:16.541] - use_args: TRUE [18:41:16.542] - Getting '...' globals ... [18:41:16.542] resolve() on list ... [18:41:16.542] recursive: 0 [18:41:16.542] length: 1 [18:41:16.542] elements: '...' [18:41:16.543] length: 0 (resolved future 1) [18:41:16.543] resolve() on list ... DONE [18:41:16.543] - '...' content: [n=0] [18:41:16.543] List of 1 [18:41:16.543] $ ...: list() [18:41:16.543] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:16.543] - attr(*, "where")=List of 1 [18:41:16.543] ..$ ...: [18:41:16.543] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:16.543] - attr(*, "resolved")= logi TRUE [18:41:16.543] - attr(*, "total_size")= num NA [18:41:16.547] - Getting '...' globals ... DONE [18:41:16.547] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:16.547] List of 2 [18:41:16.547] $ ...future.FUN:function (x, ...) [18:41:16.547] $ ... : list() [18:41:16.547] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:16.547] - attr(*, "where")=List of 2 [18:41:16.547] ..$ ...future.FUN: [18:41:16.547] ..$ ... : [18:41:16.547] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:16.547] - attr(*, "resolved")= logi FALSE [18:41:16.547] - attr(*, "total_size")= int 8145 [18:41:16.551] Packages to be attached in all futures: [n=1] 'listenv' [18:41:16.551] getGlobalsAndPackagesXApply() ... DONE [18:41:16.551] Number of futures (= number of chunks): 2 [18:41:16.551] Launching 2 futures (chunks) ... [18:41:16.551] Chunk #1 of 2 ... [18:41:16.551] - Finding globals in 'X' for chunk #1 ... [18:41:16.552] getGlobalsAndPackages() ... [18:41:16.552] Searching for globals... [18:41:16.552] [18:41:16.552] Searching for globals ... DONE [18:41:16.553] - globals: [0] [18:41:16.553] getGlobalsAndPackages() ... DONE [18:41:16.553] + additional globals found: [n=0] [18:41:16.553] + additional namespaces needed: [n=0] [18:41:16.553] - Finding globals in 'X' for chunk #1 ... DONE [18:41:16.553] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:16.553] - seeds: [18:41:16.554] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.554] getGlobalsAndPackages() ... [18:41:16.554] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.554] Resolving globals: FALSE [18:41:16.554] Tweak future expression to call with '...' arguments ... [18:41:16.554] { [18:41:16.554] do.call(function(...) { [18:41:16.554] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.554] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:16.554] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.554] on.exit(options(oopts), add = TRUE) [18:41:16.554] } [18:41:16.554] { [18:41:16.554] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:16.554] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.554] ...future.FUN(...future.X_jj, ...) [18:41:16.554] }) [18:41:16.554] } [18:41:16.554] }, args = future.call.arguments) [18:41:16.554] } [18:41:16.555] Tweak future expression to call with '...' arguments ... DONE [18:41:16.555] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.555] - packages: [1] 'listenv' [18:41:16.556] getGlobalsAndPackages() ... DONE [18:41:16.556] run() for 'Future' ... [18:41:16.556] - state: 'created' [18:41:16.556] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:16.557] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:16.557] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:16.557] - Field: 'label' [18:41:16.557] - Field: 'local' [18:41:16.557] - Field: 'owner' [18:41:16.557] - Field: 'envir' [18:41:16.558] - Field: 'packages' [18:41:16.558] - Field: 'gc' [18:41:16.558] - Field: 'conditions' [18:41:16.558] - Field: 'expr' [18:41:16.558] - Field: 'uuid' [18:41:16.558] - Field: 'seed' [18:41:16.559] - Field: 'version' [18:41:16.559] - Field: 'result' [18:41:16.559] - Field: 'asynchronous' [18:41:16.559] - Field: 'calls' [18:41:16.559] - Field: 'globals' [18:41:16.559] - Field: 'stdout' [18:41:16.560] - Field: 'earlySignal' [18:41:16.560] - Field: 'lazy' [18:41:16.560] - Field: 'state' [18:41:16.560] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:16.560] - Launch lazy future ... [18:41:16.560] Packages needed by the future expression (n = 1): 'listenv' [18:41:16.561] Packages needed by future strategies (n = 0): [18:41:16.561] { [18:41:16.561] { [18:41:16.561] { [18:41:16.561] ...future.startTime <- base::Sys.time() [18:41:16.561] { [18:41:16.561] { [18:41:16.561] { [18:41:16.561] { [18:41:16.561] base::local({ [18:41:16.561] has_future <- base::requireNamespace("future", [18:41:16.561] quietly = TRUE) [18:41:16.561] if (has_future) { [18:41:16.561] ns <- base::getNamespace("future") [18:41:16.561] version <- ns[[".package"]][["version"]] [18:41:16.561] if (is.null(version)) [18:41:16.561] version <- utils::packageVersion("future") [18:41:16.561] } [18:41:16.561] else { [18:41:16.561] version <- NULL [18:41:16.561] } [18:41:16.561] if (!has_future || version < "1.8.0") { [18:41:16.561] info <- base::c(r_version = base::gsub("R version ", [18:41:16.561] "", base::R.version$version.string), [18:41:16.561] platform = base::sprintf("%s (%s-bit)", [18:41:16.561] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:16.561] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:16.561] "release", "version")], collapse = " "), [18:41:16.561] hostname = base::Sys.info()[["nodename"]]) [18:41:16.561] info <- base::sprintf("%s: %s", base::names(info), [18:41:16.561] info) [18:41:16.561] info <- base::paste(info, collapse = "; ") [18:41:16.561] if (!has_future) { [18:41:16.561] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:16.561] info) [18:41:16.561] } [18:41:16.561] else { [18:41:16.561] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:16.561] info, version) [18:41:16.561] } [18:41:16.561] base::stop(msg) [18:41:16.561] } [18:41:16.561] }) [18:41:16.561] } [18:41:16.561] base::local({ [18:41:16.561] for (pkg in "listenv") { [18:41:16.561] base::loadNamespace(pkg) [18:41:16.561] base::library(pkg, character.only = TRUE) [18:41:16.561] } [18:41:16.561] }) [18:41:16.561] } [18:41:16.561] ...future.strategy.old <- future::plan("list") [18:41:16.561] options(future.plan = NULL) [18:41:16.561] Sys.unsetenv("R_FUTURE_PLAN") [18:41:16.561] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:16.561] } [18:41:16.561] ...future.workdir <- getwd() [18:41:16.561] } [18:41:16.561] ...future.oldOptions <- base::as.list(base::.Options) [18:41:16.561] ...future.oldEnvVars <- base::Sys.getenv() [18:41:16.561] } [18:41:16.561] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:16.561] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:16.561] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:16.561] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:16.561] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:16.561] future.stdout.windows.reencode = NULL, width = 80L) [18:41:16.561] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:16.561] base::names(...future.oldOptions)) [18:41:16.561] } [18:41:16.561] if (FALSE) { [18:41:16.561] } [18:41:16.561] else { [18:41:16.561] if (TRUE) { [18:41:16.561] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:16.561] open = "w") [18:41:16.561] } [18:41:16.561] else { [18:41:16.561] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:16.561] windows = "NUL", "/dev/null"), open = "w") [18:41:16.561] } [18:41:16.561] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:16.561] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:16.561] base::sink(type = "output", split = FALSE) [18:41:16.561] base::close(...future.stdout) [18:41:16.561] }, add = TRUE) [18:41:16.561] } [18:41:16.561] ...future.frame <- base::sys.nframe() [18:41:16.561] ...future.conditions <- base::list() [18:41:16.561] ...future.rng <- base::globalenv()$.Random.seed [18:41:16.561] if (FALSE) { [18:41:16.561] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:16.561] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:16.561] } [18:41:16.561] ...future.result <- base::tryCatch({ [18:41:16.561] base::withCallingHandlers({ [18:41:16.561] ...future.value <- base::withVisible(base::local({ [18:41:16.561] do.call(function(...) { [18:41:16.561] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.561] if (!identical(...future.globals.maxSize.org, [18:41:16.561] ...future.globals.maxSize)) { [18:41:16.561] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.561] on.exit(options(oopts), add = TRUE) [18:41:16.561] } [18:41:16.561] { [18:41:16.561] lapply(seq_along(...future.elements_ii), [18:41:16.561] FUN = function(jj) { [18:41:16.561] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.561] ...future.FUN(...future.X_jj, ...) [18:41:16.561] }) [18:41:16.561] } [18:41:16.561] }, args = future.call.arguments) [18:41:16.561] })) [18:41:16.561] future::FutureResult(value = ...future.value$value, [18:41:16.561] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:16.561] ...future.rng), globalenv = if (FALSE) [18:41:16.561] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:16.561] ...future.globalenv.names)) [18:41:16.561] else NULL, started = ...future.startTime, version = "1.8") [18:41:16.561] }, condition = base::local({ [18:41:16.561] c <- base::c [18:41:16.561] inherits <- base::inherits [18:41:16.561] invokeRestart <- base::invokeRestart [18:41:16.561] length <- base::length [18:41:16.561] list <- base::list [18:41:16.561] seq.int <- base::seq.int [18:41:16.561] signalCondition <- base::signalCondition [18:41:16.561] sys.calls <- base::sys.calls [18:41:16.561] `[[` <- base::`[[` [18:41:16.561] `+` <- base::`+` [18:41:16.561] `<<-` <- base::`<<-` [18:41:16.561] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:16.561] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:16.561] 3L)] [18:41:16.561] } [18:41:16.561] function(cond) { [18:41:16.561] is_error <- inherits(cond, "error") [18:41:16.561] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:16.561] NULL) [18:41:16.561] if (is_error) { [18:41:16.561] sessionInformation <- function() { [18:41:16.561] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:16.561] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:16.561] search = base::search(), system = base::Sys.info()) [18:41:16.561] } [18:41:16.561] ...future.conditions[[length(...future.conditions) + [18:41:16.561] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:16.561] cond$call), session = sessionInformation(), [18:41:16.561] timestamp = base::Sys.time(), signaled = 0L) [18:41:16.561] signalCondition(cond) [18:41:16.561] } [18:41:16.561] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:16.561] "immediateCondition"))) { [18:41:16.561] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:16.561] ...future.conditions[[length(...future.conditions) + [18:41:16.561] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:16.561] if (TRUE && !signal) { [18:41:16.561] muffleCondition <- function (cond, pattern = "^muffle") [18:41:16.561] { [18:41:16.561] inherits <- base::inherits [18:41:16.561] invokeRestart <- base::invokeRestart [18:41:16.561] is.null <- base::is.null [18:41:16.561] muffled <- FALSE [18:41:16.561] if (inherits(cond, "message")) { [18:41:16.561] muffled <- grepl(pattern, "muffleMessage") [18:41:16.561] if (muffled) [18:41:16.561] invokeRestart("muffleMessage") [18:41:16.561] } [18:41:16.561] else if (inherits(cond, "warning")) { [18:41:16.561] muffled <- grepl(pattern, "muffleWarning") [18:41:16.561] if (muffled) [18:41:16.561] invokeRestart("muffleWarning") [18:41:16.561] } [18:41:16.561] else if (inherits(cond, "condition")) { [18:41:16.561] if (!is.null(pattern)) { [18:41:16.561] computeRestarts <- base::computeRestarts [18:41:16.561] grepl <- base::grepl [18:41:16.561] restarts <- computeRestarts(cond) [18:41:16.561] for (restart in restarts) { [18:41:16.561] name <- restart$name [18:41:16.561] if (is.null(name)) [18:41:16.561] next [18:41:16.561] if (!grepl(pattern, name)) [18:41:16.561] next [18:41:16.561] invokeRestart(restart) [18:41:16.561] muffled <- TRUE [18:41:16.561] break [18:41:16.561] } [18:41:16.561] } [18:41:16.561] } [18:41:16.561] invisible(muffled) [18:41:16.561] } [18:41:16.561] muffleCondition(cond, pattern = "^muffle") [18:41:16.561] } [18:41:16.561] } [18:41:16.561] else { [18:41:16.561] if (TRUE) { [18:41:16.561] muffleCondition <- function (cond, pattern = "^muffle") [18:41:16.561] { [18:41:16.561] inherits <- base::inherits [18:41:16.561] invokeRestart <- base::invokeRestart [18:41:16.561] is.null <- base::is.null [18:41:16.561] muffled <- FALSE [18:41:16.561] if (inherits(cond, "message")) { [18:41:16.561] muffled <- grepl(pattern, "muffleMessage") [18:41:16.561] if (muffled) [18:41:16.561] invokeRestart("muffleMessage") [18:41:16.561] } [18:41:16.561] else if (inherits(cond, "warning")) { [18:41:16.561] muffled <- grepl(pattern, "muffleWarning") [18:41:16.561] if (muffled) [18:41:16.561] invokeRestart("muffleWarning") [18:41:16.561] } [18:41:16.561] else if (inherits(cond, "condition")) { [18:41:16.561] if (!is.null(pattern)) { [18:41:16.561] computeRestarts <- base::computeRestarts [18:41:16.561] grepl <- base::grepl [18:41:16.561] restarts <- computeRestarts(cond) [18:41:16.561] for (restart in restarts) { [18:41:16.561] name <- restart$name [18:41:16.561] if (is.null(name)) [18:41:16.561] next [18:41:16.561] if (!grepl(pattern, name)) [18:41:16.561] next [18:41:16.561] invokeRestart(restart) [18:41:16.561] muffled <- TRUE [18:41:16.561] break [18:41:16.561] } [18:41:16.561] } [18:41:16.561] } [18:41:16.561] invisible(muffled) [18:41:16.561] } [18:41:16.561] muffleCondition(cond, pattern = "^muffle") [18:41:16.561] } [18:41:16.561] } [18:41:16.561] } [18:41:16.561] })) [18:41:16.561] }, error = function(ex) { [18:41:16.561] base::structure(base::list(value = NULL, visible = NULL, [18:41:16.561] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:16.561] ...future.rng), started = ...future.startTime, [18:41:16.561] finished = Sys.time(), session_uuid = NA_character_, [18:41:16.561] version = "1.8"), class = "FutureResult") [18:41:16.561] }, finally = { [18:41:16.561] if (!identical(...future.workdir, getwd())) [18:41:16.561] setwd(...future.workdir) [18:41:16.561] { [18:41:16.561] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:16.561] ...future.oldOptions$nwarnings <- NULL [18:41:16.561] } [18:41:16.561] base::options(...future.oldOptions) [18:41:16.561] if (.Platform$OS.type == "windows") { [18:41:16.561] old_names <- names(...future.oldEnvVars) [18:41:16.561] envs <- base::Sys.getenv() [18:41:16.561] names <- names(envs) [18:41:16.561] common <- intersect(names, old_names) [18:41:16.561] added <- setdiff(names, old_names) [18:41:16.561] removed <- setdiff(old_names, names) [18:41:16.561] changed <- common[...future.oldEnvVars[common] != [18:41:16.561] envs[common]] [18:41:16.561] NAMES <- toupper(changed) [18:41:16.561] args <- list() [18:41:16.561] for (kk in seq_along(NAMES)) { [18:41:16.561] name <- changed[[kk]] [18:41:16.561] NAME <- NAMES[[kk]] [18:41:16.561] if (name != NAME && is.element(NAME, old_names)) [18:41:16.561] next [18:41:16.561] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:16.561] } [18:41:16.561] NAMES <- toupper(added) [18:41:16.561] for (kk in seq_along(NAMES)) { [18:41:16.561] name <- added[[kk]] [18:41:16.561] NAME <- NAMES[[kk]] [18:41:16.561] if (name != NAME && is.element(NAME, old_names)) [18:41:16.561] next [18:41:16.561] args[[name]] <- "" [18:41:16.561] } [18:41:16.561] NAMES <- toupper(removed) [18:41:16.561] for (kk in seq_along(NAMES)) { [18:41:16.561] name <- removed[[kk]] [18:41:16.561] NAME <- NAMES[[kk]] [18:41:16.561] if (name != NAME && is.element(NAME, old_names)) [18:41:16.561] next [18:41:16.561] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:16.561] } [18:41:16.561] if (length(args) > 0) [18:41:16.561] base::do.call(base::Sys.setenv, args = args) [18:41:16.561] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:16.561] } [18:41:16.561] else { [18:41:16.561] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:16.561] } [18:41:16.561] { [18:41:16.561] if (base::length(...future.futureOptionsAdded) > [18:41:16.561] 0L) { [18:41:16.561] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:16.561] base::names(opts) <- ...future.futureOptionsAdded [18:41:16.561] base::options(opts) [18:41:16.561] } [18:41:16.561] { [18:41:16.561] { [18:41:16.561] NULL [18:41:16.561] RNGkind("Mersenne-Twister") [18:41:16.561] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:16.561] inherits = FALSE) [18:41:16.561] } [18:41:16.561] options(future.plan = NULL) [18:41:16.561] if (is.na(NA_character_)) [18:41:16.561] Sys.unsetenv("R_FUTURE_PLAN") [18:41:16.561] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:16.561] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:16.561] .init = FALSE) [18:41:16.561] } [18:41:16.561] } [18:41:16.561] } [18:41:16.561] }) [18:41:16.561] if (TRUE) { [18:41:16.561] base::sink(type = "output", split = FALSE) [18:41:16.561] if (TRUE) { [18:41:16.561] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:16.561] } [18:41:16.561] else { [18:41:16.561] ...future.result["stdout"] <- base::list(NULL) [18:41:16.561] } [18:41:16.561] base::close(...future.stdout) [18:41:16.561] ...future.stdout <- NULL [18:41:16.561] } [18:41:16.561] ...future.result$conditions <- ...future.conditions [18:41:16.561] ...future.result$finished <- base::Sys.time() [18:41:16.561] ...future.result [18:41:16.561] } [18:41:16.565] assign_globals() ... [18:41:16.565] List of 5 [18:41:16.565] $ ...future.FUN :function (x, ...) [18:41:16.565] $ future.call.arguments : list() [18:41:16.565] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:16.565] $ ...future.elements_ii :List of 1 [18:41:16.565] ..$ a:Classes 'listenv', 'environment' [18:41:16.565] $ ...future.seeds_ii : NULL [18:41:16.565] $ ...future.globals.maxSize: NULL [18:41:16.565] - attr(*, "where")=List of 5 [18:41:16.565] ..$ ...future.FUN : [18:41:16.565] ..$ future.call.arguments : [18:41:16.565] ..$ ...future.elements_ii : [18:41:16.565] ..$ ...future.seeds_ii : [18:41:16.565] ..$ ...future.globals.maxSize: [18:41:16.565] - attr(*, "resolved")= logi FALSE [18:41:16.565] - attr(*, "total_size")= num 8145 [18:41:16.565] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:16.565] - attr(*, "already-done")= logi TRUE [18:41:16.594] - copied '...future.FUN' to environment [18:41:16.594] - copied 'future.call.arguments' to environment [18:41:16.594] - copied '...future.elements_ii' to environment [18:41:16.595] - copied '...future.seeds_ii' to environment [18:41:16.595] - copied '...future.globals.maxSize' to environment [18:41:16.595] assign_globals() ... done [18:41:16.596] plan(): Setting new future strategy stack: [18:41:16.596] List of future strategies: [18:41:16.596] 1. sequential: [18:41:16.596] - args: function (..., envir = parent.frame(), workers = "") [18:41:16.596] - tweaked: FALSE [18:41:16.596] - call: NULL [18:41:16.597] plan(): nbrOfWorkers() = 1 [18:41:16.598] plan(): Setting new future strategy stack: [18:41:16.598] List of future strategies: [18:41:16.598] 1. sequential: [18:41:16.598] - args: function (..., envir = parent.frame(), workers = "") [18:41:16.598] - tweaked: FALSE [18:41:16.598] - call: plan(strategy) [18:41:16.598] plan(): nbrOfWorkers() = 1 [18:41:16.599] SequentialFuture started (and completed) [18:41:16.599] - Launch lazy future ... done [18:41:16.599] run() for 'SequentialFuture' ... done [18:41:16.599] Created future: [18:41:16.599] SequentialFuture: [18:41:16.599] Label: 'future_lapply-1' [18:41:16.599] Expression: [18:41:16.599] { [18:41:16.599] do.call(function(...) { [18:41:16.599] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.599] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:16.599] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.599] on.exit(options(oopts), add = TRUE) [18:41:16.599] } [18:41:16.599] { [18:41:16.599] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:16.599] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.599] ...future.FUN(...future.X_jj, ...) [18:41:16.599] }) [18:41:16.599] } [18:41:16.599] }, args = future.call.arguments) [18:41:16.599] } [18:41:16.599] Lazy evaluation: FALSE [18:41:16.599] Asynchronous evaluation: FALSE [18:41:16.599] Local evaluation: TRUE [18:41:16.599] Environment: R_GlobalEnv [18:41:16.599] Capture standard output: TRUE [18:41:16.599] Capture condition classes: 'condition' (excluding 'nothing') [18:41:16.599] Globals: 5 objects totaling 1.59 KiB (function '...future.FUN' of 911 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 569 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:16.599] Packages: 1 packages ('listenv') [18:41:16.599] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:16.599] Resolved: TRUE [18:41:16.599] Value: 90 bytes of class 'list' [18:41:16.599] Early signaling: FALSE [18:41:16.599] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:16.599] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:16.600] Chunk #1 of 2 ... DONE [18:41:16.600] Chunk #2 of 2 ... [18:41:16.601] - Finding globals in 'X' for chunk #2 ... [18:41:16.601] getGlobalsAndPackages() ... [18:41:16.601] Searching for globals... [18:41:16.601] [18:41:16.601] Searching for globals ... DONE [18:41:16.602] - globals: [0] [18:41:16.602] getGlobalsAndPackages() ... DONE [18:41:16.602] + additional globals found: [n=0] [18:41:16.602] + additional namespaces needed: [n=0] [18:41:16.602] - Finding globals in 'X' for chunk #2 ... DONE [18:41:16.602] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:16.602] - seeds: [18:41:16.603] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.603] getGlobalsAndPackages() ... [18:41:16.603] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.603] Resolving globals: FALSE [18:41:16.603] Tweak future expression to call with '...' arguments ... [18:41:16.603] { [18:41:16.603] do.call(function(...) { [18:41:16.603] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.603] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:16.603] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.603] on.exit(options(oopts), add = TRUE) [18:41:16.603] } [18:41:16.603] { [18:41:16.603] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:16.603] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.603] ...future.FUN(...future.X_jj, ...) [18:41:16.603] }) [18:41:16.603] } [18:41:16.603] }, args = future.call.arguments) [18:41:16.603] } [18:41:16.604] Tweak future expression to call with '...' arguments ... DONE [18:41:16.604] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.604] - packages: [1] 'listenv' [18:41:16.605] getGlobalsAndPackages() ... DONE [18:41:16.605] run() for 'Future' ... [18:41:16.605] - state: 'created' [18:41:16.605] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:16.606] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:16.606] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:16.606] - Field: 'label' [18:41:16.606] - Field: 'local' [18:41:16.606] - Field: 'owner' [18:41:16.606] - Field: 'envir' [18:41:16.607] - Field: 'packages' [18:41:16.607] - Field: 'gc' [18:41:16.607] - Field: 'conditions' [18:41:16.607] - Field: 'expr' [18:41:16.607] - Field: 'uuid' [18:41:16.607] - Field: 'seed' [18:41:16.607] - Field: 'version' [18:41:16.608] - Field: 'result' [18:41:16.608] - Field: 'asynchronous' [18:41:16.608] - Field: 'calls' [18:41:16.608] - Field: 'globals' [18:41:16.608] - Field: 'stdout' [18:41:16.608] - Field: 'earlySignal' [18:41:16.608] - Field: 'lazy' [18:41:16.609] - Field: 'state' [18:41:16.609] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:16.609] - Launch lazy future ... [18:41:16.609] Packages needed by the future expression (n = 1): 'listenv' [18:41:16.609] Packages needed by future strategies (n = 0): [18:41:16.610] { [18:41:16.610] { [18:41:16.610] { [18:41:16.610] ...future.startTime <- base::Sys.time() [18:41:16.610] { [18:41:16.610] { [18:41:16.610] { [18:41:16.610] { [18:41:16.610] base::local({ [18:41:16.610] has_future <- base::requireNamespace("future", [18:41:16.610] quietly = TRUE) [18:41:16.610] if (has_future) { [18:41:16.610] ns <- base::getNamespace("future") [18:41:16.610] version <- ns[[".package"]][["version"]] [18:41:16.610] if (is.null(version)) [18:41:16.610] version <- utils::packageVersion("future") [18:41:16.610] } [18:41:16.610] else { [18:41:16.610] version <- NULL [18:41:16.610] } [18:41:16.610] if (!has_future || version < "1.8.0") { [18:41:16.610] info <- base::c(r_version = base::gsub("R version ", [18:41:16.610] "", base::R.version$version.string), [18:41:16.610] platform = base::sprintf("%s (%s-bit)", [18:41:16.610] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:16.610] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:16.610] "release", "version")], collapse = " "), [18:41:16.610] hostname = base::Sys.info()[["nodename"]]) [18:41:16.610] info <- base::sprintf("%s: %s", base::names(info), [18:41:16.610] info) [18:41:16.610] info <- base::paste(info, collapse = "; ") [18:41:16.610] if (!has_future) { [18:41:16.610] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:16.610] info) [18:41:16.610] } [18:41:16.610] else { [18:41:16.610] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:16.610] info, version) [18:41:16.610] } [18:41:16.610] base::stop(msg) [18:41:16.610] } [18:41:16.610] }) [18:41:16.610] } [18:41:16.610] base::local({ [18:41:16.610] for (pkg in "listenv") { [18:41:16.610] base::loadNamespace(pkg) [18:41:16.610] base::library(pkg, character.only = TRUE) [18:41:16.610] } [18:41:16.610] }) [18:41:16.610] } [18:41:16.610] ...future.strategy.old <- future::plan("list") [18:41:16.610] options(future.plan = NULL) [18:41:16.610] Sys.unsetenv("R_FUTURE_PLAN") [18:41:16.610] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:16.610] } [18:41:16.610] ...future.workdir <- getwd() [18:41:16.610] } [18:41:16.610] ...future.oldOptions <- base::as.list(base::.Options) [18:41:16.610] ...future.oldEnvVars <- base::Sys.getenv() [18:41:16.610] } [18:41:16.610] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:16.610] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:16.610] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:16.610] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:16.610] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:16.610] future.stdout.windows.reencode = NULL, width = 80L) [18:41:16.610] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:16.610] base::names(...future.oldOptions)) [18:41:16.610] } [18:41:16.610] if (FALSE) { [18:41:16.610] } [18:41:16.610] else { [18:41:16.610] if (TRUE) { [18:41:16.610] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:16.610] open = "w") [18:41:16.610] } [18:41:16.610] else { [18:41:16.610] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:16.610] windows = "NUL", "/dev/null"), open = "w") [18:41:16.610] } [18:41:16.610] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:16.610] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:16.610] base::sink(type = "output", split = FALSE) [18:41:16.610] base::close(...future.stdout) [18:41:16.610] }, add = TRUE) [18:41:16.610] } [18:41:16.610] ...future.frame <- base::sys.nframe() [18:41:16.610] ...future.conditions <- base::list() [18:41:16.610] ...future.rng <- base::globalenv()$.Random.seed [18:41:16.610] if (FALSE) { [18:41:16.610] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:16.610] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:16.610] } [18:41:16.610] ...future.result <- base::tryCatch({ [18:41:16.610] base::withCallingHandlers({ [18:41:16.610] ...future.value <- base::withVisible(base::local({ [18:41:16.610] do.call(function(...) { [18:41:16.610] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.610] if (!identical(...future.globals.maxSize.org, [18:41:16.610] ...future.globals.maxSize)) { [18:41:16.610] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.610] on.exit(options(oopts), add = TRUE) [18:41:16.610] } [18:41:16.610] { [18:41:16.610] lapply(seq_along(...future.elements_ii), [18:41:16.610] FUN = function(jj) { [18:41:16.610] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.610] ...future.FUN(...future.X_jj, ...) [18:41:16.610] }) [18:41:16.610] } [18:41:16.610] }, args = future.call.arguments) [18:41:16.610] })) [18:41:16.610] future::FutureResult(value = ...future.value$value, [18:41:16.610] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:16.610] ...future.rng), globalenv = if (FALSE) [18:41:16.610] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:16.610] ...future.globalenv.names)) [18:41:16.610] else NULL, started = ...future.startTime, version = "1.8") [18:41:16.610] }, condition = base::local({ [18:41:16.610] c <- base::c [18:41:16.610] inherits <- base::inherits [18:41:16.610] invokeRestart <- base::invokeRestart [18:41:16.610] length <- base::length [18:41:16.610] list <- base::list [18:41:16.610] seq.int <- base::seq.int [18:41:16.610] signalCondition <- base::signalCondition [18:41:16.610] sys.calls <- base::sys.calls [18:41:16.610] `[[` <- base::`[[` [18:41:16.610] `+` <- base::`+` [18:41:16.610] `<<-` <- base::`<<-` [18:41:16.610] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:16.610] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:16.610] 3L)] [18:41:16.610] } [18:41:16.610] function(cond) { [18:41:16.610] is_error <- inherits(cond, "error") [18:41:16.610] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:16.610] NULL) [18:41:16.610] if (is_error) { [18:41:16.610] sessionInformation <- function() { [18:41:16.610] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:16.610] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:16.610] search = base::search(), system = base::Sys.info()) [18:41:16.610] } [18:41:16.610] ...future.conditions[[length(...future.conditions) + [18:41:16.610] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:16.610] cond$call), session = sessionInformation(), [18:41:16.610] timestamp = base::Sys.time(), signaled = 0L) [18:41:16.610] signalCondition(cond) [18:41:16.610] } [18:41:16.610] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:16.610] "immediateCondition"))) { [18:41:16.610] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:16.610] ...future.conditions[[length(...future.conditions) + [18:41:16.610] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:16.610] if (TRUE && !signal) { [18:41:16.610] muffleCondition <- function (cond, pattern = "^muffle") [18:41:16.610] { [18:41:16.610] inherits <- base::inherits [18:41:16.610] invokeRestart <- base::invokeRestart [18:41:16.610] is.null <- base::is.null [18:41:16.610] muffled <- FALSE [18:41:16.610] if (inherits(cond, "message")) { [18:41:16.610] muffled <- grepl(pattern, "muffleMessage") [18:41:16.610] if (muffled) [18:41:16.610] invokeRestart("muffleMessage") [18:41:16.610] } [18:41:16.610] else if (inherits(cond, "warning")) { [18:41:16.610] muffled <- grepl(pattern, "muffleWarning") [18:41:16.610] if (muffled) [18:41:16.610] invokeRestart("muffleWarning") [18:41:16.610] } [18:41:16.610] else if (inherits(cond, "condition")) { [18:41:16.610] if (!is.null(pattern)) { [18:41:16.610] computeRestarts <- base::computeRestarts [18:41:16.610] grepl <- base::grepl [18:41:16.610] restarts <- computeRestarts(cond) [18:41:16.610] for (restart in restarts) { [18:41:16.610] name <- restart$name [18:41:16.610] if (is.null(name)) [18:41:16.610] next [18:41:16.610] if (!grepl(pattern, name)) [18:41:16.610] next [18:41:16.610] invokeRestart(restart) [18:41:16.610] muffled <- TRUE [18:41:16.610] break [18:41:16.610] } [18:41:16.610] } [18:41:16.610] } [18:41:16.610] invisible(muffled) [18:41:16.610] } [18:41:16.610] muffleCondition(cond, pattern = "^muffle") [18:41:16.610] } [18:41:16.610] } [18:41:16.610] else { [18:41:16.610] if (TRUE) { [18:41:16.610] muffleCondition <- function (cond, pattern = "^muffle") [18:41:16.610] { [18:41:16.610] inherits <- base::inherits [18:41:16.610] invokeRestart <- base::invokeRestart [18:41:16.610] is.null <- base::is.null [18:41:16.610] muffled <- FALSE [18:41:16.610] if (inherits(cond, "message")) { [18:41:16.610] muffled <- grepl(pattern, "muffleMessage") [18:41:16.610] if (muffled) [18:41:16.610] invokeRestart("muffleMessage") [18:41:16.610] } [18:41:16.610] else if (inherits(cond, "warning")) { [18:41:16.610] muffled <- grepl(pattern, "muffleWarning") [18:41:16.610] if (muffled) [18:41:16.610] invokeRestart("muffleWarning") [18:41:16.610] } [18:41:16.610] else if (inherits(cond, "condition")) { [18:41:16.610] if (!is.null(pattern)) { [18:41:16.610] computeRestarts <- base::computeRestarts [18:41:16.610] grepl <- base::grepl [18:41:16.610] restarts <- computeRestarts(cond) [18:41:16.610] for (restart in restarts) { [18:41:16.610] name <- restart$name [18:41:16.610] if (is.null(name)) [18:41:16.610] next [18:41:16.610] if (!grepl(pattern, name)) [18:41:16.610] next [18:41:16.610] invokeRestart(restart) [18:41:16.610] muffled <- TRUE [18:41:16.610] break [18:41:16.610] } [18:41:16.610] } [18:41:16.610] } [18:41:16.610] invisible(muffled) [18:41:16.610] } [18:41:16.610] muffleCondition(cond, pattern = "^muffle") [18:41:16.610] } [18:41:16.610] } [18:41:16.610] } [18:41:16.610] })) [18:41:16.610] }, error = function(ex) { [18:41:16.610] base::structure(base::list(value = NULL, visible = NULL, [18:41:16.610] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:16.610] ...future.rng), started = ...future.startTime, [18:41:16.610] finished = Sys.time(), session_uuid = NA_character_, [18:41:16.610] version = "1.8"), class = "FutureResult") [18:41:16.610] }, finally = { [18:41:16.610] if (!identical(...future.workdir, getwd())) [18:41:16.610] setwd(...future.workdir) [18:41:16.610] { [18:41:16.610] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:16.610] ...future.oldOptions$nwarnings <- NULL [18:41:16.610] } [18:41:16.610] base::options(...future.oldOptions) [18:41:16.610] if (.Platform$OS.type == "windows") { [18:41:16.610] old_names <- names(...future.oldEnvVars) [18:41:16.610] envs <- base::Sys.getenv() [18:41:16.610] names <- names(envs) [18:41:16.610] common <- intersect(names, old_names) [18:41:16.610] added <- setdiff(names, old_names) [18:41:16.610] removed <- setdiff(old_names, names) [18:41:16.610] changed <- common[...future.oldEnvVars[common] != [18:41:16.610] envs[common]] [18:41:16.610] NAMES <- toupper(changed) [18:41:16.610] args <- list() [18:41:16.610] for (kk in seq_along(NAMES)) { [18:41:16.610] name <- changed[[kk]] [18:41:16.610] NAME <- NAMES[[kk]] [18:41:16.610] if (name != NAME && is.element(NAME, old_names)) [18:41:16.610] next [18:41:16.610] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:16.610] } [18:41:16.610] NAMES <- toupper(added) [18:41:16.610] for (kk in seq_along(NAMES)) { [18:41:16.610] name <- added[[kk]] [18:41:16.610] NAME <- NAMES[[kk]] [18:41:16.610] if (name != NAME && is.element(NAME, old_names)) [18:41:16.610] next [18:41:16.610] args[[name]] <- "" [18:41:16.610] } [18:41:16.610] NAMES <- toupper(removed) [18:41:16.610] for (kk in seq_along(NAMES)) { [18:41:16.610] name <- removed[[kk]] [18:41:16.610] NAME <- NAMES[[kk]] [18:41:16.610] if (name != NAME && is.element(NAME, old_names)) [18:41:16.610] next [18:41:16.610] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:16.610] } [18:41:16.610] if (length(args) > 0) [18:41:16.610] base::do.call(base::Sys.setenv, args = args) [18:41:16.610] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:16.610] } [18:41:16.610] else { [18:41:16.610] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:16.610] } [18:41:16.610] { [18:41:16.610] if (base::length(...future.futureOptionsAdded) > [18:41:16.610] 0L) { [18:41:16.610] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:16.610] base::names(opts) <- ...future.futureOptionsAdded [18:41:16.610] base::options(opts) [18:41:16.610] } [18:41:16.610] { [18:41:16.610] { [18:41:16.610] NULL [18:41:16.610] RNGkind("Mersenne-Twister") [18:41:16.610] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:16.610] inherits = FALSE) [18:41:16.610] } [18:41:16.610] options(future.plan = NULL) [18:41:16.610] if (is.na(NA_character_)) [18:41:16.610] Sys.unsetenv("R_FUTURE_PLAN") [18:41:16.610] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:16.610] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:16.610] .init = FALSE) [18:41:16.610] } [18:41:16.610] } [18:41:16.610] } [18:41:16.610] }) [18:41:16.610] if (TRUE) { [18:41:16.610] base::sink(type = "output", split = FALSE) [18:41:16.610] if (TRUE) { [18:41:16.610] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:16.610] } [18:41:16.610] else { [18:41:16.610] ...future.result["stdout"] <- base::list(NULL) [18:41:16.610] } [18:41:16.610] base::close(...future.stdout) [18:41:16.610] ...future.stdout <- NULL [18:41:16.610] } [18:41:16.610] ...future.result$conditions <- ...future.conditions [18:41:16.610] ...future.result$finished <- base::Sys.time() [18:41:16.610] ...future.result [18:41:16.610] } [18:41:16.613] assign_globals() ... [18:41:16.613] List of 5 [18:41:16.613] $ ...future.FUN :function (x, ...) [18:41:16.613] $ future.call.arguments : list() [18:41:16.613] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:16.613] $ ...future.elements_ii :List of 1 [18:41:16.613] ..$ b:Classes 'listenv', 'environment' [18:41:16.613] $ ...future.seeds_ii : NULL [18:41:16.613] $ ...future.globals.maxSize: NULL [18:41:16.613] - attr(*, "where")=List of 5 [18:41:16.613] ..$ ...future.FUN : [18:41:16.613] ..$ future.call.arguments : [18:41:16.613] ..$ ...future.elements_ii : [18:41:16.613] ..$ ...future.seeds_ii : [18:41:16.613] ..$ ...future.globals.maxSize: [18:41:16.613] - attr(*, "resolved")= logi FALSE [18:41:16.613] - attr(*, "total_size")= num 8145 [18:41:16.613] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:16.613] - attr(*, "already-done")= logi TRUE [18:41:16.618] - copied '...future.FUN' to environment [18:41:16.619] - copied 'future.call.arguments' to environment [18:41:16.619] - copied '...future.elements_ii' to environment [18:41:16.619] - copied '...future.seeds_ii' to environment [18:41:16.619] - copied '...future.globals.maxSize' to environment [18:41:16.619] assign_globals() ... done [18:41:16.620] plan(): Setting new future strategy stack: [18:41:16.620] List of future strategies: [18:41:16.620] 1. sequential: [18:41:16.620] - args: function (..., envir = parent.frame(), workers = "") [18:41:16.620] - tweaked: FALSE [18:41:16.620] - call: NULL [18:41:16.620] plan(): nbrOfWorkers() = 1 [18:41:16.622] plan(): Setting new future strategy stack: [18:41:16.622] List of future strategies: [18:41:16.622] 1. sequential: [18:41:16.622] - args: function (..., envir = parent.frame(), workers = "") [18:41:16.622] - tweaked: FALSE [18:41:16.622] - call: plan(strategy) [18:41:16.622] plan(): nbrOfWorkers() = 1 [18:41:16.623] SequentialFuture started (and completed) [18:41:16.623] - Launch lazy future ... done [18:41:16.623] run() for 'SequentialFuture' ... done [18:41:16.623] Created future: [18:41:16.623] SequentialFuture: [18:41:16.623] Label: 'future_lapply-2' [18:41:16.623] Expression: [18:41:16.623] { [18:41:16.623] do.call(function(...) { [18:41:16.623] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.623] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:16.623] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.623] on.exit(options(oopts), add = TRUE) [18:41:16.623] } [18:41:16.623] { [18:41:16.623] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:16.623] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.623] ...future.FUN(...future.X_jj, ...) [18:41:16.623] }) [18:41:16.623] } [18:41:16.623] }, args = future.call.arguments) [18:41:16.623] } [18:41:16.623] Lazy evaluation: FALSE [18:41:16.623] Asynchronous evaluation: FALSE [18:41:16.623] Local evaluation: TRUE [18:41:16.623] Environment: R_GlobalEnv [18:41:16.623] Capture standard output: TRUE [18:41:16.623] Capture condition classes: 'condition' (excluding 'nothing') [18:41:16.623] Globals: 5 objects totaling 3.71 KiB (function '...future.FUN' of 911 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 2.67 KiB, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:16.623] Packages: 1 packages ('listenv') [18:41:16.623] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:16.623] Resolved: TRUE [18:41:16.623] Value: 108 bytes of class 'list' [18:41:16.623] Early signaling: FALSE [18:41:16.623] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:16.623] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:16.624] Chunk #2 of 2 ... DONE [18:41:16.625] Launching 2 futures (chunks) ... DONE [18:41:16.625] Resolving 2 futures (chunks) ... [18:41:16.625] resolve() on list ... [18:41:16.625] recursive: 0 [18:41:16.625] length: 2 [18:41:16.625] [18:41:16.625] resolved() for 'SequentialFuture' ... [18:41:16.626] - state: 'finished' [18:41:16.626] - run: TRUE [18:41:16.626] - result: 'FutureResult' [18:41:16.626] resolved() for 'SequentialFuture' ... done [18:41:16.626] Future #1 [18:41:16.627] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:16.627] - nx: 2 [18:41:16.627] - relay: TRUE [18:41:16.627] - stdout: TRUE [18:41:16.627] - signal: TRUE [18:41:16.627] - resignal: FALSE [18:41:16.628] - force: TRUE [18:41:16.628] - relayed: [n=2] FALSE, FALSE [18:41:16.628] - queued futures: [n=2] FALSE, FALSE [18:41:16.628] - until=1 [18:41:16.628] - relaying element #1 [18:41:16.629] - relayed: [n=2] TRUE, FALSE [18:41:16.629] - queued futures: [n=2] TRUE, FALSE [18:41:16.629] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:16.629] length: 1 (resolved future 1) [18:41:16.629] resolved() for 'SequentialFuture' ... [18:41:16.629] - state: 'finished' [18:41:16.630] - run: TRUE [18:41:16.630] - result: 'FutureResult' [18:41:16.630] resolved() for 'SequentialFuture' ... done [18:41:16.630] Future #2 [18:41:16.630] signalConditionsASAP(SequentialFuture, pos=2) ... [18:41:16.631] - nx: 2 [18:41:16.631] - relay: TRUE [18:41:16.631] - stdout: TRUE [18:41:16.631] - signal: TRUE [18:41:16.631] - resignal: FALSE [18:41:16.631] - force: TRUE [18:41:16.632] - relayed: [n=2] TRUE, FALSE [18:41:16.632] - queued futures: [n=2] TRUE, FALSE [18:41:16.632] - until=2 [18:41:16.632] - relaying element #2 [18:41:16.632] - relayed: [n=2] TRUE, TRUE [18:41:16.632] - queued futures: [n=2] TRUE, TRUE [18:41:16.633] signalConditionsASAP(SequentialFuture, pos=2) ... done [18:41:16.633] length: 0 (resolved future 2) [18:41:16.633] Relaying remaining futures [18:41:16.633] signalConditionsASAP(NULL, pos=0) ... [18:41:16.633] - nx: 2 [18:41:16.633] - relay: TRUE [18:41:16.634] - stdout: TRUE [18:41:16.634] - signal: TRUE [18:41:16.634] - resignal: FALSE [18:41:16.634] - force: TRUE [18:41:16.634] - relayed: [n=2] TRUE, TRUE [18:41:16.634] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:16.635] - relayed: [n=2] TRUE, TRUE [18:41:16.635] - queued futures: [n=2] TRUE, TRUE [18:41:16.635] signalConditionsASAP(NULL, pos=0) ... done [18:41:16.635] resolve() on list ... DONE [18:41:16.635] - Number of value chunks collected: 2 [18:41:16.636] Resolving 2 futures (chunks) ... DONE [18:41:16.636] Reducing values from 2 chunks ... [18:41:16.636] - Number of values collected after concatenation: 2 [18:41:16.636] - Number of values expected: 2 [18:41:16.636] Reducing values from 2 chunks ... DONE [18:41:16.636] future_lapply() ... DONE List of 1 $ y:List of 2 ..$ a: Named chr "A" .. ..- attr(*, "names")= chr "A" ..$ b: Named chr [1:2] "A" "B" .. ..- attr(*, "names")= chr [1:2] "A" "B" - future_lapply(x, FUN = vector, ...) ... [18:41:16.638] future_lapply() ... [18:41:16.639] Number of chunks: 1 [18:41:16.639] getGlobalsAndPackagesXApply() ... [18:41:16.640] - future.globals: TRUE [18:41:16.640] getGlobalsAndPackages() ... [18:41:16.640] Searching for globals... [18:41:16.641] - globals found: [2] 'FUN', '.Internal' [18:41:16.641] Searching for globals ... DONE [18:41:16.642] Resolving globals: FALSE [18:41:16.642] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:16.643] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:16.643] - globals: [1] 'FUN' [18:41:16.643] [18:41:16.643] getGlobalsAndPackages() ... DONE [18:41:16.643] - globals found/used: [n=1] 'FUN' [18:41:16.644] - needed namespaces: [n=0] [18:41:16.644] Finding globals ... DONE [18:41:16.644] - use_args: TRUE [18:41:16.644] - Getting '...' globals ... [18:41:16.645] resolve() on list ... [18:41:16.645] recursive: 0 [18:41:16.645] length: 1 [18:41:16.645] elements: '...' [18:41:16.645] length: 0 (resolved future 1) [18:41:16.645] resolve() on list ... DONE [18:41:16.645] - '...' content: [n=1] 'length' [18:41:16.646] List of 1 [18:41:16.646] $ ...:List of 1 [18:41:16.646] ..$ length: int 2 [18:41:16.646] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:16.646] - attr(*, "where")=List of 1 [18:41:16.646] ..$ ...: [18:41:16.646] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:16.646] - attr(*, "resolved")= logi TRUE [18:41:16.646] - attr(*, "total_size")= num NA [18:41:16.649] - Getting '...' globals ... DONE [18:41:16.649] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:16.649] List of 2 [18:41:16.649] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:16.649] $ ... :List of 1 [18:41:16.649] ..$ length: int 2 [18:41:16.649] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:16.649] - attr(*, "where")=List of 2 [18:41:16.649] ..$ ...future.FUN: [18:41:16.649] ..$ ... : [18:41:16.649] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:16.649] - attr(*, "resolved")= logi FALSE [18:41:16.649] - attr(*, "total_size")= int 4288 [18:41:16.653] Packages to be attached in all futures: [n=0] [18:41:16.653] getGlobalsAndPackagesXApply() ... DONE [18:41:16.654] Number of futures (= number of chunks): 1 [18:41:16.654] Launching 1 futures (chunks) ... [18:41:16.654] Chunk #1 of 1 ... [18:41:16.654] - Finding globals in 'X' for chunk #1 ... [18:41:16.654] getGlobalsAndPackages() ... [18:41:16.654] Searching for globals... [18:41:16.655] [18:41:16.655] Searching for globals ... DONE [18:41:16.655] - globals: [0] [18:41:16.655] getGlobalsAndPackages() ... DONE [18:41:16.655] + additional globals found: [n=0] [18:41:16.656] + additional namespaces needed: [n=0] [18:41:16.656] - Finding globals in 'X' for chunk #1 ... DONE [18:41:16.656] - seeds: [18:41:16.656] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.656] getGlobalsAndPackages() ... [18:41:16.656] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.657] Resolving globals: FALSE [18:41:16.657] Tweak future expression to call with '...' arguments ... [18:41:16.657] { [18:41:16.657] do.call(function(...) { [18:41:16.657] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.657] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:16.657] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.657] on.exit(options(oopts), add = TRUE) [18:41:16.657] } [18:41:16.657] { [18:41:16.657] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:16.657] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.657] ...future.FUN(...future.X_jj, ...) [18:41:16.657] }) [18:41:16.657] } [18:41:16.657] }, args = future.call.arguments) [18:41:16.657] } [18:41:16.657] Tweak future expression to call with '...' arguments ... DONE [18:41:16.658] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.658] [18:41:16.658] getGlobalsAndPackages() ... DONE [18:41:16.658] run() for 'Future' ... [18:41:16.659] - state: 'created' [18:41:16.659] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:16.659] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:16.660] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:16.660] - Field: 'label' [18:41:16.660] - Field: 'local' [18:41:16.660] - Field: 'owner' [18:41:16.661] - Field: 'envir' [18:41:16.661] - Field: 'packages' [18:41:16.661] - Field: 'gc' [18:41:16.661] - Field: 'conditions' [18:41:16.661] - Field: 'expr' [18:41:16.661] - Field: 'uuid' [18:41:16.662] - Field: 'seed' [18:41:16.662] - Field: 'version' [18:41:16.662] - Field: 'result' [18:41:16.662] - Field: 'asynchronous' [18:41:16.662] - Field: 'calls' [18:41:16.662] - Field: 'globals' [18:41:16.663] - Field: 'stdout' [18:41:16.663] - Field: 'earlySignal' [18:41:16.663] - Field: 'lazy' [18:41:16.663] - Field: 'state' [18:41:16.663] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:16.664] - Launch lazy future ... [18:41:16.664] Packages needed by the future expression (n = 0): [18:41:16.664] Packages needed by future strategies (n = 0): [18:41:16.665] { [18:41:16.665] { [18:41:16.665] { [18:41:16.665] ...future.startTime <- base::Sys.time() [18:41:16.665] { [18:41:16.665] { [18:41:16.665] { [18:41:16.665] base::local({ [18:41:16.665] has_future <- base::requireNamespace("future", [18:41:16.665] quietly = TRUE) [18:41:16.665] if (has_future) { [18:41:16.665] ns <- base::getNamespace("future") [18:41:16.665] version <- ns[[".package"]][["version"]] [18:41:16.665] if (is.null(version)) [18:41:16.665] version <- utils::packageVersion("future") [18:41:16.665] } [18:41:16.665] else { [18:41:16.665] version <- NULL [18:41:16.665] } [18:41:16.665] if (!has_future || version < "1.8.0") { [18:41:16.665] info <- base::c(r_version = base::gsub("R version ", [18:41:16.665] "", base::R.version$version.string), [18:41:16.665] platform = base::sprintf("%s (%s-bit)", [18:41:16.665] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:16.665] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:16.665] "release", "version")], collapse = " "), [18:41:16.665] hostname = base::Sys.info()[["nodename"]]) [18:41:16.665] info <- base::sprintf("%s: %s", base::names(info), [18:41:16.665] info) [18:41:16.665] info <- base::paste(info, collapse = "; ") [18:41:16.665] if (!has_future) { [18:41:16.665] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:16.665] info) [18:41:16.665] } [18:41:16.665] else { [18:41:16.665] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:16.665] info, version) [18:41:16.665] } [18:41:16.665] base::stop(msg) [18:41:16.665] } [18:41:16.665] }) [18:41:16.665] } [18:41:16.665] ...future.strategy.old <- future::plan("list") [18:41:16.665] options(future.plan = NULL) [18:41:16.665] Sys.unsetenv("R_FUTURE_PLAN") [18:41:16.665] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:16.665] } [18:41:16.665] ...future.workdir <- getwd() [18:41:16.665] } [18:41:16.665] ...future.oldOptions <- base::as.list(base::.Options) [18:41:16.665] ...future.oldEnvVars <- base::Sys.getenv() [18:41:16.665] } [18:41:16.665] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:16.665] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:16.665] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:16.665] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:16.665] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:16.665] future.stdout.windows.reencode = NULL, width = 80L) [18:41:16.665] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:16.665] base::names(...future.oldOptions)) [18:41:16.665] } [18:41:16.665] if (FALSE) { [18:41:16.665] } [18:41:16.665] else { [18:41:16.665] if (TRUE) { [18:41:16.665] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:16.665] open = "w") [18:41:16.665] } [18:41:16.665] else { [18:41:16.665] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:16.665] windows = "NUL", "/dev/null"), open = "w") [18:41:16.665] } [18:41:16.665] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:16.665] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:16.665] base::sink(type = "output", split = FALSE) [18:41:16.665] base::close(...future.stdout) [18:41:16.665] }, add = TRUE) [18:41:16.665] } [18:41:16.665] ...future.frame <- base::sys.nframe() [18:41:16.665] ...future.conditions <- base::list() [18:41:16.665] ...future.rng <- base::globalenv()$.Random.seed [18:41:16.665] if (FALSE) { [18:41:16.665] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:16.665] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:16.665] } [18:41:16.665] ...future.result <- base::tryCatch({ [18:41:16.665] base::withCallingHandlers({ [18:41:16.665] ...future.value <- base::withVisible(base::local({ [18:41:16.665] do.call(function(...) { [18:41:16.665] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.665] if (!identical(...future.globals.maxSize.org, [18:41:16.665] ...future.globals.maxSize)) { [18:41:16.665] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.665] on.exit(options(oopts), add = TRUE) [18:41:16.665] } [18:41:16.665] { [18:41:16.665] lapply(seq_along(...future.elements_ii), [18:41:16.665] FUN = function(jj) { [18:41:16.665] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.665] ...future.FUN(...future.X_jj, ...) [18:41:16.665] }) [18:41:16.665] } [18:41:16.665] }, args = future.call.arguments) [18:41:16.665] })) [18:41:16.665] future::FutureResult(value = ...future.value$value, [18:41:16.665] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:16.665] ...future.rng), globalenv = if (FALSE) [18:41:16.665] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:16.665] ...future.globalenv.names)) [18:41:16.665] else NULL, started = ...future.startTime, version = "1.8") [18:41:16.665] }, condition = base::local({ [18:41:16.665] c <- base::c [18:41:16.665] inherits <- base::inherits [18:41:16.665] invokeRestart <- base::invokeRestart [18:41:16.665] length <- base::length [18:41:16.665] list <- base::list [18:41:16.665] seq.int <- base::seq.int [18:41:16.665] signalCondition <- base::signalCondition [18:41:16.665] sys.calls <- base::sys.calls [18:41:16.665] `[[` <- base::`[[` [18:41:16.665] `+` <- base::`+` [18:41:16.665] `<<-` <- base::`<<-` [18:41:16.665] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:16.665] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:16.665] 3L)] [18:41:16.665] } [18:41:16.665] function(cond) { [18:41:16.665] is_error <- inherits(cond, "error") [18:41:16.665] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:16.665] NULL) [18:41:16.665] if (is_error) { [18:41:16.665] sessionInformation <- function() { [18:41:16.665] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:16.665] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:16.665] search = base::search(), system = base::Sys.info()) [18:41:16.665] } [18:41:16.665] ...future.conditions[[length(...future.conditions) + [18:41:16.665] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:16.665] cond$call), session = sessionInformation(), [18:41:16.665] timestamp = base::Sys.time(), signaled = 0L) [18:41:16.665] signalCondition(cond) [18:41:16.665] } [18:41:16.665] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:16.665] "immediateCondition"))) { [18:41:16.665] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:16.665] ...future.conditions[[length(...future.conditions) + [18:41:16.665] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:16.665] if (TRUE && !signal) { [18:41:16.665] muffleCondition <- function (cond, pattern = "^muffle") [18:41:16.665] { [18:41:16.665] inherits <- base::inherits [18:41:16.665] invokeRestart <- base::invokeRestart [18:41:16.665] is.null <- base::is.null [18:41:16.665] muffled <- FALSE [18:41:16.665] if (inherits(cond, "message")) { [18:41:16.665] muffled <- grepl(pattern, "muffleMessage") [18:41:16.665] if (muffled) [18:41:16.665] invokeRestart("muffleMessage") [18:41:16.665] } [18:41:16.665] else if (inherits(cond, "warning")) { [18:41:16.665] muffled <- grepl(pattern, "muffleWarning") [18:41:16.665] if (muffled) [18:41:16.665] invokeRestart("muffleWarning") [18:41:16.665] } [18:41:16.665] else if (inherits(cond, "condition")) { [18:41:16.665] if (!is.null(pattern)) { [18:41:16.665] computeRestarts <- base::computeRestarts [18:41:16.665] grepl <- base::grepl [18:41:16.665] restarts <- computeRestarts(cond) [18:41:16.665] for (restart in restarts) { [18:41:16.665] name <- restart$name [18:41:16.665] if (is.null(name)) [18:41:16.665] next [18:41:16.665] if (!grepl(pattern, name)) [18:41:16.665] next [18:41:16.665] invokeRestart(restart) [18:41:16.665] muffled <- TRUE [18:41:16.665] break [18:41:16.665] } [18:41:16.665] } [18:41:16.665] } [18:41:16.665] invisible(muffled) [18:41:16.665] } [18:41:16.665] muffleCondition(cond, pattern = "^muffle") [18:41:16.665] } [18:41:16.665] } [18:41:16.665] else { [18:41:16.665] if (TRUE) { [18:41:16.665] muffleCondition <- function (cond, pattern = "^muffle") [18:41:16.665] { [18:41:16.665] inherits <- base::inherits [18:41:16.665] invokeRestart <- base::invokeRestart [18:41:16.665] is.null <- base::is.null [18:41:16.665] muffled <- FALSE [18:41:16.665] if (inherits(cond, "message")) { [18:41:16.665] muffled <- grepl(pattern, "muffleMessage") [18:41:16.665] if (muffled) [18:41:16.665] invokeRestart("muffleMessage") [18:41:16.665] } [18:41:16.665] else if (inherits(cond, "warning")) { [18:41:16.665] muffled <- grepl(pattern, "muffleWarning") [18:41:16.665] if (muffled) [18:41:16.665] invokeRestart("muffleWarning") [18:41:16.665] } [18:41:16.665] else if (inherits(cond, "condition")) { [18:41:16.665] if (!is.null(pattern)) { [18:41:16.665] computeRestarts <- base::computeRestarts [18:41:16.665] grepl <- base::grepl [18:41:16.665] restarts <- computeRestarts(cond) [18:41:16.665] for (restart in restarts) { [18:41:16.665] name <- restart$name [18:41:16.665] if (is.null(name)) [18:41:16.665] next [18:41:16.665] if (!grepl(pattern, name)) [18:41:16.665] next [18:41:16.665] invokeRestart(restart) [18:41:16.665] muffled <- TRUE [18:41:16.665] break [18:41:16.665] } [18:41:16.665] } [18:41:16.665] } [18:41:16.665] invisible(muffled) [18:41:16.665] } [18:41:16.665] muffleCondition(cond, pattern = "^muffle") [18:41:16.665] } [18:41:16.665] } [18:41:16.665] } [18:41:16.665] })) [18:41:16.665] }, error = function(ex) { [18:41:16.665] base::structure(base::list(value = NULL, visible = NULL, [18:41:16.665] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:16.665] ...future.rng), started = ...future.startTime, [18:41:16.665] finished = Sys.time(), session_uuid = NA_character_, [18:41:16.665] version = "1.8"), class = "FutureResult") [18:41:16.665] }, finally = { [18:41:16.665] if (!identical(...future.workdir, getwd())) [18:41:16.665] setwd(...future.workdir) [18:41:16.665] { [18:41:16.665] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:16.665] ...future.oldOptions$nwarnings <- NULL [18:41:16.665] } [18:41:16.665] base::options(...future.oldOptions) [18:41:16.665] if (.Platform$OS.type == "windows") { [18:41:16.665] old_names <- names(...future.oldEnvVars) [18:41:16.665] envs <- base::Sys.getenv() [18:41:16.665] names <- names(envs) [18:41:16.665] common <- intersect(names, old_names) [18:41:16.665] added <- setdiff(names, old_names) [18:41:16.665] removed <- setdiff(old_names, names) [18:41:16.665] changed <- common[...future.oldEnvVars[common] != [18:41:16.665] envs[common]] [18:41:16.665] NAMES <- toupper(changed) [18:41:16.665] args <- list() [18:41:16.665] for (kk in seq_along(NAMES)) { [18:41:16.665] name <- changed[[kk]] [18:41:16.665] NAME <- NAMES[[kk]] [18:41:16.665] if (name != NAME && is.element(NAME, old_names)) [18:41:16.665] next [18:41:16.665] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:16.665] } [18:41:16.665] NAMES <- toupper(added) [18:41:16.665] for (kk in seq_along(NAMES)) { [18:41:16.665] name <- added[[kk]] [18:41:16.665] NAME <- NAMES[[kk]] [18:41:16.665] if (name != NAME && is.element(NAME, old_names)) [18:41:16.665] next [18:41:16.665] args[[name]] <- "" [18:41:16.665] } [18:41:16.665] NAMES <- toupper(removed) [18:41:16.665] for (kk in seq_along(NAMES)) { [18:41:16.665] name <- removed[[kk]] [18:41:16.665] NAME <- NAMES[[kk]] [18:41:16.665] if (name != NAME && is.element(NAME, old_names)) [18:41:16.665] next [18:41:16.665] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:16.665] } [18:41:16.665] if (length(args) > 0) [18:41:16.665] base::do.call(base::Sys.setenv, args = args) [18:41:16.665] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:16.665] } [18:41:16.665] else { [18:41:16.665] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:16.665] } [18:41:16.665] { [18:41:16.665] if (base::length(...future.futureOptionsAdded) > [18:41:16.665] 0L) { [18:41:16.665] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:16.665] base::names(opts) <- ...future.futureOptionsAdded [18:41:16.665] base::options(opts) [18:41:16.665] } [18:41:16.665] { [18:41:16.665] { [18:41:16.665] NULL [18:41:16.665] RNGkind("Mersenne-Twister") [18:41:16.665] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:16.665] inherits = FALSE) [18:41:16.665] } [18:41:16.665] options(future.plan = NULL) [18:41:16.665] if (is.na(NA_character_)) [18:41:16.665] Sys.unsetenv("R_FUTURE_PLAN") [18:41:16.665] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:16.665] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:16.665] .init = FALSE) [18:41:16.665] } [18:41:16.665] } [18:41:16.665] } [18:41:16.665] }) [18:41:16.665] if (TRUE) { [18:41:16.665] base::sink(type = "output", split = FALSE) [18:41:16.665] if (TRUE) { [18:41:16.665] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:16.665] } [18:41:16.665] else { [18:41:16.665] ...future.result["stdout"] <- base::list(NULL) [18:41:16.665] } [18:41:16.665] base::close(...future.stdout) [18:41:16.665] ...future.stdout <- NULL [18:41:16.665] } [18:41:16.665] ...future.result$conditions <- ...future.conditions [18:41:16.665] ...future.result$finished <- base::Sys.time() [18:41:16.665] ...future.result [18:41:16.665] } [18:41:16.668] assign_globals() ... [18:41:16.668] List of 5 [18:41:16.668] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:16.668] $ future.call.arguments :List of 1 [18:41:16.668] ..$ length: int 2 [18:41:16.668] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:16.668] $ ...future.elements_ii :List of 4 [18:41:16.668] ..$ a: chr "integer" [18:41:16.668] ..$ b: chr "numeric" [18:41:16.668] ..$ c: chr "character" [18:41:16.668] ..$ c: chr "list" [18:41:16.668] $ ...future.seeds_ii : NULL [18:41:16.668] $ ...future.globals.maxSize: NULL [18:41:16.668] - attr(*, "where")=List of 5 [18:41:16.668] ..$ ...future.FUN : [18:41:16.668] ..$ future.call.arguments : [18:41:16.668] ..$ ...future.elements_ii : [18:41:16.668] ..$ ...future.seeds_ii : [18:41:16.668] ..$ ...future.globals.maxSize: [18:41:16.668] - attr(*, "resolved")= logi FALSE [18:41:16.668] - attr(*, "total_size")= num 4288 [18:41:16.668] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:16.668] - attr(*, "already-done")= logi TRUE [18:41:16.676] - copied '...future.FUN' to environment [18:41:16.677] - copied 'future.call.arguments' to environment [18:41:16.677] - copied '...future.elements_ii' to environment [18:41:16.677] - copied '...future.seeds_ii' to environment [18:41:16.677] - copied '...future.globals.maxSize' to environment [18:41:16.677] assign_globals() ... done [18:41:16.678] plan(): Setting new future strategy stack: [18:41:16.678] List of future strategies: [18:41:16.678] 1. sequential: [18:41:16.678] - args: function (..., envir = parent.frame(), workers = "") [18:41:16.678] - tweaked: FALSE [18:41:16.678] - call: NULL [18:41:16.679] plan(): nbrOfWorkers() = 1 [18:41:16.680] plan(): Setting new future strategy stack: [18:41:16.680] List of future strategies: [18:41:16.680] 1. sequential: [18:41:16.680] - args: function (..., envir = parent.frame(), workers = "") [18:41:16.680] - tweaked: FALSE [18:41:16.680] - call: plan(strategy) [18:41:16.681] plan(): nbrOfWorkers() = 1 [18:41:16.681] SequentialFuture started (and completed) [18:41:16.681] - Launch lazy future ... done [18:41:16.682] run() for 'SequentialFuture' ... done [18:41:16.682] Created future: [18:41:16.682] SequentialFuture: [18:41:16.682] Label: 'future_lapply-1' [18:41:16.682] Expression: [18:41:16.682] { [18:41:16.682] do.call(function(...) { [18:41:16.682] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.682] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:16.682] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.682] on.exit(options(oopts), add = TRUE) [18:41:16.682] } [18:41:16.682] { [18:41:16.682] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:16.682] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.682] ...future.FUN(...future.X_jj, ...) [18:41:16.682] }) [18:41:16.682] } [18:41:16.682] }, args = future.call.arguments) [18:41:16.682] } [18:41:16.682] Lazy evaluation: FALSE [18:41:16.682] Asynchronous evaluation: FALSE [18:41:16.682] Local evaluation: TRUE [18:41:16.682] Environment: R_GlobalEnv [18:41:16.682] Capture standard output: TRUE [18:41:16.682] Capture condition classes: 'condition' (excluding 'nothing') [18:41:16.682] Globals: 5 objects totaling 853 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 191 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:16.682] Packages: [18:41:16.682] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:16.682] Resolved: TRUE [18:41:16.682] Value: 111 bytes of class 'list' [18:41:16.682] Early signaling: FALSE [18:41:16.682] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:16.682] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:16.683] Chunk #1 of 1 ... DONE [18:41:16.683] Launching 1 futures (chunks) ... DONE [18:41:16.683] Resolving 1 futures (chunks) ... [18:41:16.684] resolve() on list ... [18:41:16.684] recursive: 0 [18:41:16.684] length: 1 [18:41:16.684] [18:41:16.684] resolved() for 'SequentialFuture' ... [18:41:16.685] - state: 'finished' [18:41:16.685] - run: TRUE [18:41:16.685] - result: 'FutureResult' [18:41:16.685] resolved() for 'SequentialFuture' ... done [18:41:16.685] Future #1 [18:41:16.686] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:16.686] - nx: 1 [18:41:16.686] - relay: TRUE [18:41:16.686] - stdout: TRUE [18:41:16.686] - signal: TRUE [18:41:16.686] - resignal: FALSE [18:41:16.687] - force: TRUE [18:41:16.687] - relayed: [n=1] FALSE [18:41:16.687] - queued futures: [n=1] FALSE [18:41:16.687] - until=1 [18:41:16.687] - relaying element #1 [18:41:16.688] - relayed: [n=1] TRUE [18:41:16.688] - queued futures: [n=1] TRUE [18:41:16.688] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:16.688] length: 0 (resolved future 1) [18:41:16.688] Relaying remaining futures [18:41:16.688] signalConditionsASAP(NULL, pos=0) ... [18:41:16.689] - nx: 1 [18:41:16.689] - relay: TRUE [18:41:16.689] - stdout: TRUE [18:41:16.689] - signal: TRUE [18:41:16.690] - resignal: FALSE [18:41:16.690] - force: TRUE [18:41:16.690] - relayed: [n=1] TRUE [18:41:16.690] - queued futures: [n=1] TRUE - flush all [18:41:16.690] - relayed: [n=1] TRUE [18:41:16.691] - queued futures: [n=1] TRUE [18:41:16.691] signalConditionsASAP(NULL, pos=0) ... done [18:41:16.691] resolve() on list ... DONE [18:41:16.691] - Number of value chunks collected: 1 [18:41:16.691] Resolving 1 futures (chunks) ... DONE [18:41:16.692] Reducing values from 1 chunks ... [18:41:16.692] - Number of values collected after concatenation: 4 [18:41:16.692] - Number of values expected: 4 [18:41:16.692] Reducing values from 1 chunks ... DONE [18:41:16.692] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL [18:41:16.695] future_lapply() ... [18:41:16.696] Number of chunks: 1 [18:41:16.696] getGlobalsAndPackagesXApply() ... [18:41:16.697] - future.globals: TRUE [18:41:16.697] getGlobalsAndPackages() ... [18:41:16.697] Searching for globals... [18:41:16.699] - globals found: [2] 'FUN', '.Internal' [18:41:16.699] Searching for globals ... DONE [18:41:16.699] Resolving globals: FALSE [18:41:16.700] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:16.700] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:16.700] - globals: [1] 'FUN' [18:41:16.700] [18:41:16.701] getGlobalsAndPackages() ... DONE [18:41:16.701] - globals found/used: [n=1] 'FUN' [18:41:16.701] - needed namespaces: [n=0] [18:41:16.701] Finding globals ... DONE [18:41:16.701] - use_args: TRUE [18:41:16.702] - Getting '...' globals ... [18:41:16.702] resolve() on list ... [18:41:16.702] recursive: 0 [18:41:16.702] length: 1 [18:41:16.703] elements: '...' [18:41:16.703] length: 0 (resolved future 1) [18:41:16.703] resolve() on list ... DONE [18:41:16.703] - '...' content: [n=1] 'length' [18:41:16.703] List of 1 [18:41:16.703] $ ...:List of 1 [18:41:16.703] ..$ length: int 2 [18:41:16.703] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:16.703] - attr(*, "where")=List of 1 [18:41:16.703] ..$ ...: [18:41:16.703] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:16.703] - attr(*, "resolved")= logi TRUE [18:41:16.703] - attr(*, "total_size")= num NA [18:41:16.707] - Getting '...' globals ... DONE [18:41:16.708] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:16.708] List of 2 [18:41:16.708] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:16.708] $ ... :List of 1 [18:41:16.708] ..$ length: int 2 [18:41:16.708] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:16.708] - attr(*, "where")=List of 2 [18:41:16.708] ..$ ...future.FUN: [18:41:16.708] ..$ ... : [18:41:16.708] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:16.708] - attr(*, "resolved")= logi FALSE [18:41:16.708] - attr(*, "total_size")= int 4324 [18:41:16.714] Packages to be attached in all futures: [n=0] [18:41:16.714] getGlobalsAndPackagesXApply() ... DONE [18:41:16.714] Number of futures (= number of chunks): 1 [18:41:16.715] Launching 1 futures (chunks) ... [18:41:16.715] Chunk #1 of 1 ... [18:41:16.715] - Finding globals in 'X' for chunk #1 ... [18:41:16.715] getGlobalsAndPackages() ... [18:41:16.715] Searching for globals... [18:41:16.716] [18:41:16.716] Searching for globals ... DONE [18:41:16.716] - globals: [0] [18:41:16.716] getGlobalsAndPackages() ... DONE [18:41:16.716] + additional globals found: [n=0] [18:41:16.716] + additional namespaces needed: [n=0] [18:41:16.717] - Finding globals in 'X' for chunk #1 ... DONE [18:41:16.717] - seeds: [18:41:16.717] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.717] getGlobalsAndPackages() ... [18:41:16.717] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.717] Resolving globals: FALSE [18:41:16.718] Tweak future expression to call with '...' arguments ... [18:41:16.718] { [18:41:16.718] do.call(function(...) { [18:41:16.718] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.718] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:16.718] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.718] on.exit(options(oopts), add = TRUE) [18:41:16.718] } [18:41:16.718] { [18:41:16.718] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:16.718] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.718] ...future.FUN(...future.X_jj, ...) [18:41:16.718] }) [18:41:16.718] } [18:41:16.718] }, args = future.call.arguments) [18:41:16.718] } [18:41:16.718] Tweak future expression to call with '...' arguments ... DONE [18:41:16.719] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.719] [18:41:16.719] getGlobalsAndPackages() ... DONE [18:41:16.719] run() for 'Future' ... [18:41:16.720] - state: 'created' [18:41:16.720] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:16.720] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:16.720] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:16.721] - Field: 'label' [18:41:16.721] - Field: 'local' [18:41:16.721] - Field: 'owner' [18:41:16.721] - Field: 'envir' [18:41:16.721] - Field: 'packages' [18:41:16.721] - Field: 'gc' [18:41:16.722] - Field: 'conditions' [18:41:16.722] - Field: 'expr' [18:41:16.722] - Field: 'uuid' [18:41:16.722] - Field: 'seed' [18:41:16.722] - Field: 'version' [18:41:16.722] - Field: 'result' [18:41:16.723] - Field: 'asynchronous' [18:41:16.723] - Field: 'calls' [18:41:16.723] - Field: 'globals' [18:41:16.723] - Field: 'stdout' [18:41:16.723] - Field: 'earlySignal' [18:41:16.723] - Field: 'lazy' [18:41:16.724] - Field: 'state' [18:41:16.724] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:16.724] - Launch lazy future ... [18:41:16.724] Packages needed by the future expression (n = 0): [18:41:16.724] Packages needed by future strategies (n = 0): [18:41:16.725] { [18:41:16.725] { [18:41:16.725] { [18:41:16.725] ...future.startTime <- base::Sys.time() [18:41:16.725] { [18:41:16.725] { [18:41:16.725] { [18:41:16.725] base::local({ [18:41:16.725] has_future <- base::requireNamespace("future", [18:41:16.725] quietly = TRUE) [18:41:16.725] if (has_future) { [18:41:16.725] ns <- base::getNamespace("future") [18:41:16.725] version <- ns[[".package"]][["version"]] [18:41:16.725] if (is.null(version)) [18:41:16.725] version <- utils::packageVersion("future") [18:41:16.725] } [18:41:16.725] else { [18:41:16.725] version <- NULL [18:41:16.725] } [18:41:16.725] if (!has_future || version < "1.8.0") { [18:41:16.725] info <- base::c(r_version = base::gsub("R version ", [18:41:16.725] "", base::R.version$version.string), [18:41:16.725] platform = base::sprintf("%s (%s-bit)", [18:41:16.725] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:16.725] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:16.725] "release", "version")], collapse = " "), [18:41:16.725] hostname = base::Sys.info()[["nodename"]]) [18:41:16.725] info <- base::sprintf("%s: %s", base::names(info), [18:41:16.725] info) [18:41:16.725] info <- base::paste(info, collapse = "; ") [18:41:16.725] if (!has_future) { [18:41:16.725] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:16.725] info) [18:41:16.725] } [18:41:16.725] else { [18:41:16.725] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:16.725] info, version) [18:41:16.725] } [18:41:16.725] base::stop(msg) [18:41:16.725] } [18:41:16.725] }) [18:41:16.725] } [18:41:16.725] ...future.strategy.old <- future::plan("list") [18:41:16.725] options(future.plan = NULL) [18:41:16.725] Sys.unsetenv("R_FUTURE_PLAN") [18:41:16.725] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:16.725] } [18:41:16.725] ...future.workdir <- getwd() [18:41:16.725] } [18:41:16.725] ...future.oldOptions <- base::as.list(base::.Options) [18:41:16.725] ...future.oldEnvVars <- base::Sys.getenv() [18:41:16.725] } [18:41:16.725] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:16.725] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:16.725] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:16.725] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:16.725] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:16.725] future.stdout.windows.reencode = NULL, width = 80L) [18:41:16.725] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:16.725] base::names(...future.oldOptions)) [18:41:16.725] } [18:41:16.725] if (FALSE) { [18:41:16.725] } [18:41:16.725] else { [18:41:16.725] if (TRUE) { [18:41:16.725] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:16.725] open = "w") [18:41:16.725] } [18:41:16.725] else { [18:41:16.725] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:16.725] windows = "NUL", "/dev/null"), open = "w") [18:41:16.725] } [18:41:16.725] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:16.725] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:16.725] base::sink(type = "output", split = FALSE) [18:41:16.725] base::close(...future.stdout) [18:41:16.725] }, add = TRUE) [18:41:16.725] } [18:41:16.725] ...future.frame <- base::sys.nframe() [18:41:16.725] ...future.conditions <- base::list() [18:41:16.725] ...future.rng <- base::globalenv()$.Random.seed [18:41:16.725] if (FALSE) { [18:41:16.725] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:16.725] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:16.725] } [18:41:16.725] ...future.result <- base::tryCatch({ [18:41:16.725] base::withCallingHandlers({ [18:41:16.725] ...future.value <- base::withVisible(base::local({ [18:41:16.725] do.call(function(...) { [18:41:16.725] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.725] if (!identical(...future.globals.maxSize.org, [18:41:16.725] ...future.globals.maxSize)) { [18:41:16.725] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.725] on.exit(options(oopts), add = TRUE) [18:41:16.725] } [18:41:16.725] { [18:41:16.725] lapply(seq_along(...future.elements_ii), [18:41:16.725] FUN = function(jj) { [18:41:16.725] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.725] ...future.FUN(...future.X_jj, ...) [18:41:16.725] }) [18:41:16.725] } [18:41:16.725] }, args = future.call.arguments) [18:41:16.725] })) [18:41:16.725] future::FutureResult(value = ...future.value$value, [18:41:16.725] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:16.725] ...future.rng), globalenv = if (FALSE) [18:41:16.725] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:16.725] ...future.globalenv.names)) [18:41:16.725] else NULL, started = ...future.startTime, version = "1.8") [18:41:16.725] }, condition = base::local({ [18:41:16.725] c <- base::c [18:41:16.725] inherits <- base::inherits [18:41:16.725] invokeRestart <- base::invokeRestart [18:41:16.725] length <- base::length [18:41:16.725] list <- base::list [18:41:16.725] seq.int <- base::seq.int [18:41:16.725] signalCondition <- base::signalCondition [18:41:16.725] sys.calls <- base::sys.calls [18:41:16.725] `[[` <- base::`[[` [18:41:16.725] `+` <- base::`+` [18:41:16.725] `<<-` <- base::`<<-` [18:41:16.725] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:16.725] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:16.725] 3L)] [18:41:16.725] } [18:41:16.725] function(cond) { [18:41:16.725] is_error <- inherits(cond, "error") [18:41:16.725] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:16.725] NULL) [18:41:16.725] if (is_error) { [18:41:16.725] sessionInformation <- function() { [18:41:16.725] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:16.725] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:16.725] search = base::search(), system = base::Sys.info()) [18:41:16.725] } [18:41:16.725] ...future.conditions[[length(...future.conditions) + [18:41:16.725] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:16.725] cond$call), session = sessionInformation(), [18:41:16.725] timestamp = base::Sys.time(), signaled = 0L) [18:41:16.725] signalCondition(cond) [18:41:16.725] } [18:41:16.725] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:16.725] "immediateCondition"))) { [18:41:16.725] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:16.725] ...future.conditions[[length(...future.conditions) + [18:41:16.725] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:16.725] if (TRUE && !signal) { [18:41:16.725] muffleCondition <- function (cond, pattern = "^muffle") [18:41:16.725] { [18:41:16.725] inherits <- base::inherits [18:41:16.725] invokeRestart <- base::invokeRestart [18:41:16.725] is.null <- base::is.null [18:41:16.725] muffled <- FALSE [18:41:16.725] if (inherits(cond, "message")) { [18:41:16.725] muffled <- grepl(pattern, "muffleMessage") [18:41:16.725] if (muffled) [18:41:16.725] invokeRestart("muffleMessage") [18:41:16.725] } [18:41:16.725] else if (inherits(cond, "warning")) { [18:41:16.725] muffled <- grepl(pattern, "muffleWarning") [18:41:16.725] if (muffled) [18:41:16.725] invokeRestart("muffleWarning") [18:41:16.725] } [18:41:16.725] else if (inherits(cond, "condition")) { [18:41:16.725] if (!is.null(pattern)) { [18:41:16.725] computeRestarts <- base::computeRestarts [18:41:16.725] grepl <- base::grepl [18:41:16.725] restarts <- computeRestarts(cond) [18:41:16.725] for (restart in restarts) { [18:41:16.725] name <- restart$name [18:41:16.725] if (is.null(name)) [18:41:16.725] next [18:41:16.725] if (!grepl(pattern, name)) [18:41:16.725] next [18:41:16.725] invokeRestart(restart) [18:41:16.725] muffled <- TRUE [18:41:16.725] break [18:41:16.725] } [18:41:16.725] } [18:41:16.725] } [18:41:16.725] invisible(muffled) [18:41:16.725] } [18:41:16.725] muffleCondition(cond, pattern = "^muffle") [18:41:16.725] } [18:41:16.725] } [18:41:16.725] else { [18:41:16.725] if (TRUE) { [18:41:16.725] muffleCondition <- function (cond, pattern = "^muffle") [18:41:16.725] { [18:41:16.725] inherits <- base::inherits [18:41:16.725] invokeRestart <- base::invokeRestart [18:41:16.725] is.null <- base::is.null [18:41:16.725] muffled <- FALSE [18:41:16.725] if (inherits(cond, "message")) { [18:41:16.725] muffled <- grepl(pattern, "muffleMessage") [18:41:16.725] if (muffled) [18:41:16.725] invokeRestart("muffleMessage") [18:41:16.725] } [18:41:16.725] else if (inherits(cond, "warning")) { [18:41:16.725] muffled <- grepl(pattern, "muffleWarning") [18:41:16.725] if (muffled) [18:41:16.725] invokeRestart("muffleWarning") [18:41:16.725] } [18:41:16.725] else if (inherits(cond, "condition")) { [18:41:16.725] if (!is.null(pattern)) { [18:41:16.725] computeRestarts <- base::computeRestarts [18:41:16.725] grepl <- base::grepl [18:41:16.725] restarts <- computeRestarts(cond) [18:41:16.725] for (restart in restarts) { [18:41:16.725] name <- restart$name [18:41:16.725] if (is.null(name)) [18:41:16.725] next [18:41:16.725] if (!grepl(pattern, name)) [18:41:16.725] next [18:41:16.725] invokeRestart(restart) [18:41:16.725] muffled <- TRUE [18:41:16.725] break [18:41:16.725] } [18:41:16.725] } [18:41:16.725] } [18:41:16.725] invisible(muffled) [18:41:16.725] } [18:41:16.725] muffleCondition(cond, pattern = "^muffle") [18:41:16.725] } [18:41:16.725] } [18:41:16.725] } [18:41:16.725] })) [18:41:16.725] }, error = function(ex) { [18:41:16.725] base::structure(base::list(value = NULL, visible = NULL, [18:41:16.725] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:16.725] ...future.rng), started = ...future.startTime, [18:41:16.725] finished = Sys.time(), session_uuid = NA_character_, [18:41:16.725] version = "1.8"), class = "FutureResult") [18:41:16.725] }, finally = { [18:41:16.725] if (!identical(...future.workdir, getwd())) [18:41:16.725] setwd(...future.workdir) [18:41:16.725] { [18:41:16.725] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:16.725] ...future.oldOptions$nwarnings <- NULL [18:41:16.725] } [18:41:16.725] base::options(...future.oldOptions) [18:41:16.725] if (.Platform$OS.type == "windows") { [18:41:16.725] old_names <- names(...future.oldEnvVars) [18:41:16.725] envs <- base::Sys.getenv() [18:41:16.725] names <- names(envs) [18:41:16.725] common <- intersect(names, old_names) [18:41:16.725] added <- setdiff(names, old_names) [18:41:16.725] removed <- setdiff(old_names, names) [18:41:16.725] changed <- common[...future.oldEnvVars[common] != [18:41:16.725] envs[common]] [18:41:16.725] NAMES <- toupper(changed) [18:41:16.725] args <- list() [18:41:16.725] for (kk in seq_along(NAMES)) { [18:41:16.725] name <- changed[[kk]] [18:41:16.725] NAME <- NAMES[[kk]] [18:41:16.725] if (name != NAME && is.element(NAME, old_names)) [18:41:16.725] next [18:41:16.725] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:16.725] } [18:41:16.725] NAMES <- toupper(added) [18:41:16.725] for (kk in seq_along(NAMES)) { [18:41:16.725] name <- added[[kk]] [18:41:16.725] NAME <- NAMES[[kk]] [18:41:16.725] if (name != NAME && is.element(NAME, old_names)) [18:41:16.725] next [18:41:16.725] args[[name]] <- "" [18:41:16.725] } [18:41:16.725] NAMES <- toupper(removed) [18:41:16.725] for (kk in seq_along(NAMES)) { [18:41:16.725] name <- removed[[kk]] [18:41:16.725] NAME <- NAMES[[kk]] [18:41:16.725] if (name != NAME && is.element(NAME, old_names)) [18:41:16.725] next [18:41:16.725] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:16.725] } [18:41:16.725] if (length(args) > 0) [18:41:16.725] base::do.call(base::Sys.setenv, args = args) [18:41:16.725] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:16.725] } [18:41:16.725] else { [18:41:16.725] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:16.725] } [18:41:16.725] { [18:41:16.725] if (base::length(...future.futureOptionsAdded) > [18:41:16.725] 0L) { [18:41:16.725] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:16.725] base::names(opts) <- ...future.futureOptionsAdded [18:41:16.725] base::options(opts) [18:41:16.725] } [18:41:16.725] { [18:41:16.725] { [18:41:16.725] NULL [18:41:16.725] RNGkind("Mersenne-Twister") [18:41:16.725] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:16.725] inherits = FALSE) [18:41:16.725] } [18:41:16.725] options(future.plan = NULL) [18:41:16.725] if (is.na(NA_character_)) [18:41:16.725] Sys.unsetenv("R_FUTURE_PLAN") [18:41:16.725] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:16.725] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:16.725] .init = FALSE) [18:41:16.725] } [18:41:16.725] } [18:41:16.725] } [18:41:16.725] }) [18:41:16.725] if (TRUE) { [18:41:16.725] base::sink(type = "output", split = FALSE) [18:41:16.725] if (TRUE) { [18:41:16.725] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:16.725] } [18:41:16.725] else { [18:41:16.725] ...future.result["stdout"] <- base::list(NULL) [18:41:16.725] } [18:41:16.725] base::close(...future.stdout) [18:41:16.725] ...future.stdout <- NULL [18:41:16.725] } [18:41:16.725] ...future.result$conditions <- ...future.conditions [18:41:16.725] ...future.result$finished <- base::Sys.time() [18:41:16.725] ...future.result [18:41:16.725] } [18:41:16.729] assign_globals() ... [18:41:16.729] List of 5 [18:41:16.729] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:16.729] $ future.call.arguments :List of 1 [18:41:16.729] ..$ length: int 2 [18:41:16.729] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:16.729] $ ...future.elements_ii :List of 4 [18:41:16.729] ..$ a: chr "integer" [18:41:16.729] ..$ b: chr "numeric" [18:41:16.729] ..$ c: chr "character" [18:41:16.729] ..$ c: chr "list" [18:41:16.729] $ ...future.seeds_ii : NULL [18:41:16.729] $ ...future.globals.maxSize: NULL [18:41:16.729] - attr(*, "where")=List of 5 [18:41:16.729] ..$ ...future.FUN : [18:41:16.729] ..$ future.call.arguments : [18:41:16.729] ..$ ...future.elements_ii : [18:41:16.729] ..$ ...future.seeds_ii : [18:41:16.729] ..$ ...future.globals.maxSize: [18:41:16.729] - attr(*, "resolved")= logi FALSE [18:41:16.729] - attr(*, "total_size")= num 4324 [18:41:16.729] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:16.729] - attr(*, "already-done")= logi TRUE [18:41:16.736] - copied '...future.FUN' to environment [18:41:16.736] - copied 'future.call.arguments' to environment [18:41:16.736] - copied '...future.elements_ii' to environment [18:41:16.737] - copied '...future.seeds_ii' to environment [18:41:16.737] - copied '...future.globals.maxSize' to environment [18:41:16.737] assign_globals() ... done [18:41:16.737] plan(): Setting new future strategy stack: [18:41:16.737] List of future strategies: [18:41:16.737] 1. sequential: [18:41:16.737] - args: function (..., envir = parent.frame(), workers = "") [18:41:16.737] - tweaked: FALSE [18:41:16.737] - call: NULL [18:41:16.738] plan(): nbrOfWorkers() = 1 [18:41:16.739] plan(): Setting new future strategy stack: [18:41:16.739] List of future strategies: [18:41:16.739] 1. sequential: [18:41:16.739] - args: function (..., envir = parent.frame(), workers = "") [18:41:16.739] - tweaked: FALSE [18:41:16.739] - call: plan(strategy) [18:41:16.740] plan(): nbrOfWorkers() = 1 [18:41:16.740] SequentialFuture started (and completed) [18:41:16.741] - Launch lazy future ... done [18:41:16.741] run() for 'SequentialFuture' ... done [18:41:16.741] Created future: [18:41:16.741] SequentialFuture: [18:41:16.741] Label: 'future_lapply-1' [18:41:16.741] Expression: [18:41:16.741] { [18:41:16.741] do.call(function(...) { [18:41:16.741] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.741] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:16.741] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.741] on.exit(options(oopts), add = TRUE) [18:41:16.741] } [18:41:16.741] { [18:41:16.741] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:16.741] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.741] ...future.FUN(...future.X_jj, ...) [18:41:16.741] }) [18:41:16.741] } [18:41:16.741] }, args = future.call.arguments) [18:41:16.741] } [18:41:16.741] Lazy evaluation: FALSE [18:41:16.741] Asynchronous evaluation: FALSE [18:41:16.741] Local evaluation: TRUE [18:41:16.741] Environment: R_GlobalEnv [18:41:16.741] Capture standard output: TRUE [18:41:16.741] Capture condition classes: 'condition' (excluding 'nothing') [18:41:16.741] Globals: 5 objects totaling 853 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 191 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:16.741] Packages: [18:41:16.741] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:16.741] Resolved: TRUE [18:41:16.741] Value: 111 bytes of class 'list' [18:41:16.741] Early signaling: FALSE [18:41:16.741] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:16.741] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:16.742] Chunk #1 of 1 ... DONE [18:41:16.742] Launching 1 futures (chunks) ... DONE [18:41:16.743] Resolving 1 futures (chunks) ... [18:41:16.743] resolve() on list ... [18:41:16.743] recursive: 0 [18:41:16.743] length: 1 [18:41:16.743] [18:41:16.743] resolved() for 'SequentialFuture' ... [18:41:16.743] - state: 'finished' [18:41:16.744] - run: TRUE [18:41:16.744] - result: 'FutureResult' [18:41:16.744] resolved() for 'SequentialFuture' ... done [18:41:16.744] Future #1 [18:41:16.744] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:16.745] - nx: 1 [18:41:16.745] - relay: TRUE [18:41:16.745] - stdout: TRUE [18:41:16.745] - signal: TRUE [18:41:16.745] - resignal: FALSE [18:41:16.745] - force: TRUE [18:41:16.745] - relayed: [n=1] FALSE [18:41:16.746] - queued futures: [n=1] FALSE [18:41:16.746] - until=1 [18:41:16.746] - relaying element #1 [18:41:16.746] - relayed: [n=1] TRUE [18:41:16.746] - queued futures: [n=1] TRUE [18:41:16.747] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:16.747] length: 0 (resolved future 1) [18:41:16.747] Relaying remaining futures [18:41:16.747] signalConditionsASAP(NULL, pos=0) ... [18:41:16.747] - nx: 1 [18:41:16.747] - relay: TRUE [18:41:16.747] - stdout: TRUE [18:41:16.748] - signal: TRUE [18:41:16.748] - resignal: FALSE [18:41:16.748] - force: TRUE [18:41:16.748] - relayed: [n=1] TRUE [18:41:16.748] - queued futures: [n=1] TRUE - flush all [18:41:16.748] - relayed: [n=1] TRUE [18:41:16.749] - queued futures: [n=1] TRUE [18:41:16.749] signalConditionsASAP(NULL, pos=0) ... done [18:41:16.749] resolve() on list ... DONE [18:41:16.749] - Number of value chunks collected: 1 [18:41:16.749] Resolving 1 futures (chunks) ... DONE [18:41:16.749] Reducing values from 1 chunks ... [18:41:16.750] - Number of values collected after concatenation: 4 [18:41:16.750] - Number of values expected: 4 [18:41:16.750] Reducing values from 1 chunks ... DONE [18:41:16.750] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL - future_lapply(x, FUN = base::vector, ...) ... [18:41:16.753] future_lapply() ... [18:41:16.754] Number of chunks: 1 [18:41:16.754] getGlobalsAndPackagesXApply() ... [18:41:16.754] - future.globals: TRUE [18:41:16.754] getGlobalsAndPackages() ... [18:41:16.754] Searching for globals... [18:41:16.756] - globals found: [2] 'FUN', '.Internal' [18:41:16.756] Searching for globals ... DONE [18:41:16.756] Resolving globals: FALSE [18:41:16.756] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:16.757] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:16.757] - globals: [1] 'FUN' [18:41:16.757] [18:41:16.757] getGlobalsAndPackages() ... DONE [18:41:16.757] - globals found/used: [n=1] 'FUN' [18:41:16.758] - needed namespaces: [n=0] [18:41:16.758] Finding globals ... DONE [18:41:16.758] - use_args: TRUE [18:41:16.758] - Getting '...' globals ... [18:41:16.759] resolve() on list ... [18:41:16.759] recursive: 0 [18:41:16.759] length: 1 [18:41:16.759] elements: '...' [18:41:16.759] length: 0 (resolved future 1) [18:41:16.759] resolve() on list ... DONE [18:41:16.760] - '...' content: [n=1] 'length' [18:41:16.760] List of 1 [18:41:16.760] $ ...:List of 1 [18:41:16.760] ..$ length: int 2 [18:41:16.760] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:16.760] - attr(*, "where")=List of 1 [18:41:16.760] ..$ ...: [18:41:16.760] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:16.760] - attr(*, "resolved")= logi TRUE [18:41:16.760] - attr(*, "total_size")= num NA [18:41:16.763] - Getting '...' globals ... DONE [18:41:16.763] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:16.763] List of 2 [18:41:16.763] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:16.763] $ ... :List of 1 [18:41:16.763] ..$ length: int 2 [18:41:16.763] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:16.763] - attr(*, "where")=List of 2 [18:41:16.763] ..$ ...future.FUN: [18:41:16.763] ..$ ... : [18:41:16.763] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:16.763] - attr(*, "resolved")= logi FALSE [18:41:16.763] - attr(*, "total_size")= int 4406 [18:41:16.767] Packages to be attached in all futures: [n=0] [18:41:16.767] getGlobalsAndPackagesXApply() ... DONE [18:41:16.768] Number of futures (= number of chunks): 1 [18:41:16.768] Launching 1 futures (chunks) ... [18:41:16.768] Chunk #1 of 1 ... [18:41:16.768] - Finding globals in 'X' for chunk #1 ... [18:41:16.768] getGlobalsAndPackages() ... [18:41:16.768] Searching for globals... [18:41:16.769] [18:41:16.769] Searching for globals ... DONE [18:41:16.769] - globals: [0] [18:41:16.769] getGlobalsAndPackages() ... DONE [18:41:16.769] + additional globals found: [n=0] [18:41:16.770] + additional namespaces needed: [n=0] [18:41:16.770] - Finding globals in 'X' for chunk #1 ... DONE [18:41:16.770] - seeds: [18:41:16.770] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.770] getGlobalsAndPackages() ... [18:41:16.770] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.771] Resolving globals: FALSE [18:41:16.771] Tweak future expression to call with '...' arguments ... [18:41:16.771] { [18:41:16.771] do.call(function(...) { [18:41:16.771] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.771] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:16.771] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.771] on.exit(options(oopts), add = TRUE) [18:41:16.771] } [18:41:16.771] { [18:41:16.771] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:16.771] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.771] ...future.FUN(...future.X_jj, ...) [18:41:16.771] }) [18:41:16.771] } [18:41:16.771] }, args = future.call.arguments) [18:41:16.771] } [18:41:16.771] Tweak future expression to call with '...' arguments ... DONE [18:41:16.772] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.772] [18:41:16.772] getGlobalsAndPackages() ... DONE [18:41:16.773] run() for 'Future' ... [18:41:16.773] - state: 'created' [18:41:16.773] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:16.773] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:16.774] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:16.774] - Field: 'label' [18:41:16.774] - Field: 'local' [18:41:16.774] - Field: 'owner' [18:41:16.774] - Field: 'envir' [18:41:16.775] - Field: 'packages' [18:41:16.775] - Field: 'gc' [18:41:16.775] - Field: 'conditions' [18:41:16.775] - Field: 'expr' [18:41:16.775] - Field: 'uuid' [18:41:16.775] - Field: 'seed' [18:41:16.776] - Field: 'version' [18:41:16.776] - Field: 'result' [18:41:16.776] - Field: 'asynchronous' [18:41:16.776] - Field: 'calls' [18:41:16.776] - Field: 'globals' [18:41:16.776] - Field: 'stdout' [18:41:16.777] - Field: 'earlySignal' [18:41:16.777] - Field: 'lazy' [18:41:16.777] - Field: 'state' [18:41:16.777] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:16.777] - Launch lazy future ... [18:41:16.777] Packages needed by the future expression (n = 0): [18:41:16.778] Packages needed by future strategies (n = 0): [18:41:16.778] { [18:41:16.778] { [18:41:16.778] { [18:41:16.778] ...future.startTime <- base::Sys.time() [18:41:16.778] { [18:41:16.778] { [18:41:16.778] { [18:41:16.778] base::local({ [18:41:16.778] has_future <- base::requireNamespace("future", [18:41:16.778] quietly = TRUE) [18:41:16.778] if (has_future) { [18:41:16.778] ns <- base::getNamespace("future") [18:41:16.778] version <- ns[[".package"]][["version"]] [18:41:16.778] if (is.null(version)) [18:41:16.778] version <- utils::packageVersion("future") [18:41:16.778] } [18:41:16.778] else { [18:41:16.778] version <- NULL [18:41:16.778] } [18:41:16.778] if (!has_future || version < "1.8.0") { [18:41:16.778] info <- base::c(r_version = base::gsub("R version ", [18:41:16.778] "", base::R.version$version.string), [18:41:16.778] platform = base::sprintf("%s (%s-bit)", [18:41:16.778] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:16.778] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:16.778] "release", "version")], collapse = " "), [18:41:16.778] hostname = base::Sys.info()[["nodename"]]) [18:41:16.778] info <- base::sprintf("%s: %s", base::names(info), [18:41:16.778] info) [18:41:16.778] info <- base::paste(info, collapse = "; ") [18:41:16.778] if (!has_future) { [18:41:16.778] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:16.778] info) [18:41:16.778] } [18:41:16.778] else { [18:41:16.778] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:16.778] info, version) [18:41:16.778] } [18:41:16.778] base::stop(msg) [18:41:16.778] } [18:41:16.778] }) [18:41:16.778] } [18:41:16.778] ...future.strategy.old <- future::plan("list") [18:41:16.778] options(future.plan = NULL) [18:41:16.778] Sys.unsetenv("R_FUTURE_PLAN") [18:41:16.778] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:16.778] } [18:41:16.778] ...future.workdir <- getwd() [18:41:16.778] } [18:41:16.778] ...future.oldOptions <- base::as.list(base::.Options) [18:41:16.778] ...future.oldEnvVars <- base::Sys.getenv() [18:41:16.778] } [18:41:16.778] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:16.778] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:16.778] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:16.778] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:16.778] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:16.778] future.stdout.windows.reencode = NULL, width = 80L) [18:41:16.778] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:16.778] base::names(...future.oldOptions)) [18:41:16.778] } [18:41:16.778] if (FALSE) { [18:41:16.778] } [18:41:16.778] else { [18:41:16.778] if (TRUE) { [18:41:16.778] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:16.778] open = "w") [18:41:16.778] } [18:41:16.778] else { [18:41:16.778] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:16.778] windows = "NUL", "/dev/null"), open = "w") [18:41:16.778] } [18:41:16.778] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:16.778] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:16.778] base::sink(type = "output", split = FALSE) [18:41:16.778] base::close(...future.stdout) [18:41:16.778] }, add = TRUE) [18:41:16.778] } [18:41:16.778] ...future.frame <- base::sys.nframe() [18:41:16.778] ...future.conditions <- base::list() [18:41:16.778] ...future.rng <- base::globalenv()$.Random.seed [18:41:16.778] if (FALSE) { [18:41:16.778] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:16.778] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:16.778] } [18:41:16.778] ...future.result <- base::tryCatch({ [18:41:16.778] base::withCallingHandlers({ [18:41:16.778] ...future.value <- base::withVisible(base::local({ [18:41:16.778] do.call(function(...) { [18:41:16.778] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.778] if (!identical(...future.globals.maxSize.org, [18:41:16.778] ...future.globals.maxSize)) { [18:41:16.778] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.778] on.exit(options(oopts), add = TRUE) [18:41:16.778] } [18:41:16.778] { [18:41:16.778] lapply(seq_along(...future.elements_ii), [18:41:16.778] FUN = function(jj) { [18:41:16.778] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.778] ...future.FUN(...future.X_jj, ...) [18:41:16.778] }) [18:41:16.778] } [18:41:16.778] }, args = future.call.arguments) [18:41:16.778] })) [18:41:16.778] future::FutureResult(value = ...future.value$value, [18:41:16.778] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:16.778] ...future.rng), globalenv = if (FALSE) [18:41:16.778] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:16.778] ...future.globalenv.names)) [18:41:16.778] else NULL, started = ...future.startTime, version = "1.8") [18:41:16.778] }, condition = base::local({ [18:41:16.778] c <- base::c [18:41:16.778] inherits <- base::inherits [18:41:16.778] invokeRestart <- base::invokeRestart [18:41:16.778] length <- base::length [18:41:16.778] list <- base::list [18:41:16.778] seq.int <- base::seq.int [18:41:16.778] signalCondition <- base::signalCondition [18:41:16.778] sys.calls <- base::sys.calls [18:41:16.778] `[[` <- base::`[[` [18:41:16.778] `+` <- base::`+` [18:41:16.778] `<<-` <- base::`<<-` [18:41:16.778] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:16.778] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:16.778] 3L)] [18:41:16.778] } [18:41:16.778] function(cond) { [18:41:16.778] is_error <- inherits(cond, "error") [18:41:16.778] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:16.778] NULL) [18:41:16.778] if (is_error) { [18:41:16.778] sessionInformation <- function() { [18:41:16.778] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:16.778] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:16.778] search = base::search(), system = base::Sys.info()) [18:41:16.778] } [18:41:16.778] ...future.conditions[[length(...future.conditions) + [18:41:16.778] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:16.778] cond$call), session = sessionInformation(), [18:41:16.778] timestamp = base::Sys.time(), signaled = 0L) [18:41:16.778] signalCondition(cond) [18:41:16.778] } [18:41:16.778] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:16.778] "immediateCondition"))) { [18:41:16.778] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:16.778] ...future.conditions[[length(...future.conditions) + [18:41:16.778] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:16.778] if (TRUE && !signal) { [18:41:16.778] muffleCondition <- function (cond, pattern = "^muffle") [18:41:16.778] { [18:41:16.778] inherits <- base::inherits [18:41:16.778] invokeRestart <- base::invokeRestart [18:41:16.778] is.null <- base::is.null [18:41:16.778] muffled <- FALSE [18:41:16.778] if (inherits(cond, "message")) { [18:41:16.778] muffled <- grepl(pattern, "muffleMessage") [18:41:16.778] if (muffled) [18:41:16.778] invokeRestart("muffleMessage") [18:41:16.778] } [18:41:16.778] else if (inherits(cond, "warning")) { [18:41:16.778] muffled <- grepl(pattern, "muffleWarning") [18:41:16.778] if (muffled) [18:41:16.778] invokeRestart("muffleWarning") [18:41:16.778] } [18:41:16.778] else if (inherits(cond, "condition")) { [18:41:16.778] if (!is.null(pattern)) { [18:41:16.778] computeRestarts <- base::computeRestarts [18:41:16.778] grepl <- base::grepl [18:41:16.778] restarts <- computeRestarts(cond) [18:41:16.778] for (restart in restarts) { [18:41:16.778] name <- restart$name [18:41:16.778] if (is.null(name)) [18:41:16.778] next [18:41:16.778] if (!grepl(pattern, name)) [18:41:16.778] next [18:41:16.778] invokeRestart(restart) [18:41:16.778] muffled <- TRUE [18:41:16.778] break [18:41:16.778] } [18:41:16.778] } [18:41:16.778] } [18:41:16.778] invisible(muffled) [18:41:16.778] } [18:41:16.778] muffleCondition(cond, pattern = "^muffle") [18:41:16.778] } [18:41:16.778] } [18:41:16.778] else { [18:41:16.778] if (TRUE) { [18:41:16.778] muffleCondition <- function (cond, pattern = "^muffle") [18:41:16.778] { [18:41:16.778] inherits <- base::inherits [18:41:16.778] invokeRestart <- base::invokeRestart [18:41:16.778] is.null <- base::is.null [18:41:16.778] muffled <- FALSE [18:41:16.778] if (inherits(cond, "message")) { [18:41:16.778] muffled <- grepl(pattern, "muffleMessage") [18:41:16.778] if (muffled) [18:41:16.778] invokeRestart("muffleMessage") [18:41:16.778] } [18:41:16.778] else if (inherits(cond, "warning")) { [18:41:16.778] muffled <- grepl(pattern, "muffleWarning") [18:41:16.778] if (muffled) [18:41:16.778] invokeRestart("muffleWarning") [18:41:16.778] } [18:41:16.778] else if (inherits(cond, "condition")) { [18:41:16.778] if (!is.null(pattern)) { [18:41:16.778] computeRestarts <- base::computeRestarts [18:41:16.778] grepl <- base::grepl [18:41:16.778] restarts <- computeRestarts(cond) [18:41:16.778] for (restart in restarts) { [18:41:16.778] name <- restart$name [18:41:16.778] if (is.null(name)) [18:41:16.778] next [18:41:16.778] if (!grepl(pattern, name)) [18:41:16.778] next [18:41:16.778] invokeRestart(restart) [18:41:16.778] muffled <- TRUE [18:41:16.778] break [18:41:16.778] } [18:41:16.778] } [18:41:16.778] } [18:41:16.778] invisible(muffled) [18:41:16.778] } [18:41:16.778] muffleCondition(cond, pattern = "^muffle") [18:41:16.778] } [18:41:16.778] } [18:41:16.778] } [18:41:16.778] })) [18:41:16.778] }, error = function(ex) { [18:41:16.778] base::structure(base::list(value = NULL, visible = NULL, [18:41:16.778] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:16.778] ...future.rng), started = ...future.startTime, [18:41:16.778] finished = Sys.time(), session_uuid = NA_character_, [18:41:16.778] version = "1.8"), class = "FutureResult") [18:41:16.778] }, finally = { [18:41:16.778] if (!identical(...future.workdir, getwd())) [18:41:16.778] setwd(...future.workdir) [18:41:16.778] { [18:41:16.778] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:16.778] ...future.oldOptions$nwarnings <- NULL [18:41:16.778] } [18:41:16.778] base::options(...future.oldOptions) [18:41:16.778] if (.Platform$OS.type == "windows") { [18:41:16.778] old_names <- names(...future.oldEnvVars) [18:41:16.778] envs <- base::Sys.getenv() [18:41:16.778] names <- names(envs) [18:41:16.778] common <- intersect(names, old_names) [18:41:16.778] added <- setdiff(names, old_names) [18:41:16.778] removed <- setdiff(old_names, names) [18:41:16.778] changed <- common[...future.oldEnvVars[common] != [18:41:16.778] envs[common]] [18:41:16.778] NAMES <- toupper(changed) [18:41:16.778] args <- list() [18:41:16.778] for (kk in seq_along(NAMES)) { [18:41:16.778] name <- changed[[kk]] [18:41:16.778] NAME <- NAMES[[kk]] [18:41:16.778] if (name != NAME && is.element(NAME, old_names)) [18:41:16.778] next [18:41:16.778] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:16.778] } [18:41:16.778] NAMES <- toupper(added) [18:41:16.778] for (kk in seq_along(NAMES)) { [18:41:16.778] name <- added[[kk]] [18:41:16.778] NAME <- NAMES[[kk]] [18:41:16.778] if (name != NAME && is.element(NAME, old_names)) [18:41:16.778] next [18:41:16.778] args[[name]] <- "" [18:41:16.778] } [18:41:16.778] NAMES <- toupper(removed) [18:41:16.778] for (kk in seq_along(NAMES)) { [18:41:16.778] name <- removed[[kk]] [18:41:16.778] NAME <- NAMES[[kk]] [18:41:16.778] if (name != NAME && is.element(NAME, old_names)) [18:41:16.778] next [18:41:16.778] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:16.778] } [18:41:16.778] if (length(args) > 0) [18:41:16.778] base::do.call(base::Sys.setenv, args = args) [18:41:16.778] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:16.778] } [18:41:16.778] else { [18:41:16.778] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:16.778] } [18:41:16.778] { [18:41:16.778] if (base::length(...future.futureOptionsAdded) > [18:41:16.778] 0L) { [18:41:16.778] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:16.778] base::names(opts) <- ...future.futureOptionsAdded [18:41:16.778] base::options(opts) [18:41:16.778] } [18:41:16.778] { [18:41:16.778] { [18:41:16.778] NULL [18:41:16.778] RNGkind("Mersenne-Twister") [18:41:16.778] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:16.778] inherits = FALSE) [18:41:16.778] } [18:41:16.778] options(future.plan = NULL) [18:41:16.778] if (is.na(NA_character_)) [18:41:16.778] Sys.unsetenv("R_FUTURE_PLAN") [18:41:16.778] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:16.778] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:16.778] .init = FALSE) [18:41:16.778] } [18:41:16.778] } [18:41:16.778] } [18:41:16.778] }) [18:41:16.778] if (TRUE) { [18:41:16.778] base::sink(type = "output", split = FALSE) [18:41:16.778] if (TRUE) { [18:41:16.778] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:16.778] } [18:41:16.778] else { [18:41:16.778] ...future.result["stdout"] <- base::list(NULL) [18:41:16.778] } [18:41:16.778] base::close(...future.stdout) [18:41:16.778] ...future.stdout <- NULL [18:41:16.778] } [18:41:16.778] ...future.result$conditions <- ...future.conditions [18:41:16.778] ...future.result$finished <- base::Sys.time() [18:41:16.778] ...future.result [18:41:16.778] } [18:41:16.782] assign_globals() ... [18:41:16.782] List of 5 [18:41:16.782] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:16.782] $ future.call.arguments :List of 1 [18:41:16.782] ..$ length: int 2 [18:41:16.782] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:16.782] $ ...future.elements_ii :List of 4 [18:41:16.782] ..$ a: chr "integer" [18:41:16.782] ..$ b: chr "numeric" [18:41:16.782] ..$ c: chr "character" [18:41:16.782] ..$ c: chr "list" [18:41:16.782] $ ...future.seeds_ii : NULL [18:41:16.782] $ ...future.globals.maxSize: NULL [18:41:16.782] - attr(*, "where")=List of 5 [18:41:16.782] ..$ ...future.FUN : [18:41:16.782] ..$ future.call.arguments : [18:41:16.782] ..$ ...future.elements_ii : [18:41:16.782] ..$ ...future.seeds_ii : [18:41:16.782] ..$ ...future.globals.maxSize: [18:41:16.782] - attr(*, "resolved")= logi FALSE [18:41:16.782] - attr(*, "total_size")= num 4406 [18:41:16.782] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:16.782] - attr(*, "already-done")= logi TRUE [18:41:16.789] - copied '...future.FUN' to environment [18:41:16.789] - copied 'future.call.arguments' to environment [18:41:16.789] - copied '...future.elements_ii' to environment [18:41:16.790] - copied '...future.seeds_ii' to environment [18:41:16.790] - copied '...future.globals.maxSize' to environment [18:41:16.790] assign_globals() ... done [18:41:16.790] plan(): Setting new future strategy stack: [18:41:16.791] List of future strategies: [18:41:16.791] 1. sequential: [18:41:16.791] - args: function (..., envir = parent.frame(), workers = "") [18:41:16.791] - tweaked: FALSE [18:41:16.791] - call: NULL [18:41:16.791] plan(): nbrOfWorkers() = 1 [18:41:16.792] plan(): Setting new future strategy stack: [18:41:16.792] List of future strategies: [18:41:16.792] 1. sequential: [18:41:16.792] - args: function (..., envir = parent.frame(), workers = "") [18:41:16.792] - tweaked: FALSE [18:41:16.792] - call: plan(strategy) [18:41:16.793] plan(): nbrOfWorkers() = 1 [18:41:16.793] SequentialFuture started (and completed) [18:41:16.794] - Launch lazy future ... done [18:41:16.794] run() for 'SequentialFuture' ... done [18:41:16.794] Created future: [18:41:16.794] SequentialFuture: [18:41:16.794] Label: 'future_lapply-1' [18:41:16.794] Expression: [18:41:16.794] { [18:41:16.794] do.call(function(...) { [18:41:16.794] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.794] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:16.794] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.794] on.exit(options(oopts), add = TRUE) [18:41:16.794] } [18:41:16.794] { [18:41:16.794] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:16.794] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.794] ...future.FUN(...future.X_jj, ...) [18:41:16.794] }) [18:41:16.794] } [18:41:16.794] }, args = future.call.arguments) [18:41:16.794] } [18:41:16.794] Lazy evaluation: FALSE [18:41:16.794] Asynchronous evaluation: FALSE [18:41:16.794] Local evaluation: TRUE [18:41:16.794] Environment: R_GlobalEnv [18:41:16.794] Capture standard output: TRUE [18:41:16.794] Capture condition classes: 'condition' (excluding 'nothing') [18:41:16.794] Globals: 5 objects totaling 853 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 191 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:16.794] Packages: [18:41:16.794] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:16.794] Resolved: TRUE [18:41:16.794] Value: 111 bytes of class 'list' [18:41:16.794] Early signaling: FALSE [18:41:16.794] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:16.794] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:16.795] Chunk #1 of 1 ... DONE [18:41:16.795] Launching 1 futures (chunks) ... DONE [18:41:16.796] Resolving 1 futures (chunks) ... [18:41:16.796] resolve() on list ... [18:41:16.796] recursive: 0 [18:41:16.796] length: 1 [18:41:16.796] [18:41:16.796] resolved() for 'SequentialFuture' ... [18:41:16.797] - state: 'finished' [18:41:16.797] - run: TRUE [18:41:16.797] - result: 'FutureResult' [18:41:16.797] resolved() for 'SequentialFuture' ... done [18:41:16.797] Future #1 [18:41:16.797] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:16.798] - nx: 1 [18:41:16.798] - relay: TRUE [18:41:16.798] - stdout: TRUE [18:41:16.798] - signal: TRUE [18:41:16.798] - resignal: FALSE [18:41:16.799] - force: TRUE [18:41:16.799] - relayed: [n=1] FALSE [18:41:16.799] - queued futures: [n=1] FALSE [18:41:16.799] - until=1 [18:41:16.799] - relaying element #1 [18:41:16.799] - relayed: [n=1] TRUE [18:41:16.800] - queued futures: [n=1] TRUE [18:41:16.800] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:16.800] length: 0 (resolved future 1) [18:41:16.800] Relaying remaining futures [18:41:16.800] signalConditionsASAP(NULL, pos=0) ... [18:41:16.800] - nx: 1 [18:41:16.801] - relay: TRUE [18:41:16.801] - stdout: TRUE [18:41:16.801] - signal: TRUE [18:41:16.801] - resignal: FALSE [18:41:16.801] - force: TRUE [18:41:16.801] - relayed: [n=1] TRUE [18:41:16.801] - queued futures: [n=1] TRUE - flush all [18:41:16.802] - relayed: [n=1] TRUE [18:41:16.802] - queued futures: [n=1] TRUE [18:41:16.802] signalConditionsASAP(NULL, pos=0) ... done [18:41:16.802] resolve() on list ... DONE [18:41:16.802] - Number of value chunks collected: 1 [18:41:16.802] Resolving 1 futures (chunks) ... DONE [18:41:16.803] Reducing values from 1 chunks ... [18:41:16.803] - Number of values collected after concatenation: 4 [18:41:16.803] - Number of values expected: 4 [18:41:16.803] Reducing values from 1 chunks ... DONE [18:41:16.803] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL - future_lapply(x, FUN = future:::hpaste, ...) ... [18:41:16.806] future_lapply() ... [18:41:16.814] Number of chunks: 1 [18:41:16.814] getGlobalsAndPackagesXApply() ... [18:41:16.814] - future.globals: TRUE [18:41:16.815] getGlobalsAndPackages() ... [18:41:16.815] Searching for globals... [18:41:16.826] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [18:41:16.826] Searching for globals ... DONE [18:41:16.826] Resolving globals: FALSE [18:41:16.827] The total size of the 1 globals is 7.17 KiB (7342 bytes) [18:41:16.828] The total size of the 1 globals exported for future expression ('FUN(collapse = "; ", maxHead = 3L)') is 7.17 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (7.17 KiB of class 'function') [18:41:16.828] - globals: [1] 'FUN' [18:41:16.828] - packages: [1] 'future' [18:41:16.828] getGlobalsAndPackages() ... DONE [18:41:16.829] - globals found/used: [n=1] 'FUN' [18:41:16.829] - needed namespaces: [n=1] 'future' [18:41:16.829] Finding globals ... DONE [18:41:16.829] - use_args: TRUE [18:41:16.829] - Getting '...' globals ... [18:41:16.830] resolve() on list ... [18:41:16.830] recursive: 0 [18:41:16.830] length: 1 [18:41:16.830] elements: '...' [18:41:16.830] length: 0 (resolved future 1) [18:41:16.830] resolve() on list ... DONE [18:41:16.831] - '...' content: [n=2] 'collapse', 'maxHead' [18:41:16.831] List of 1 [18:41:16.831] $ ...:List of 2 [18:41:16.831] ..$ collapse: chr "; " [18:41:16.831] ..$ maxHead : int 3 [18:41:16.831] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:16.831] - attr(*, "where")=List of 1 [18:41:16.831] ..$ ...: [18:41:16.831] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:16.831] - attr(*, "resolved")= logi TRUE [18:41:16.831] - attr(*, "total_size")= num NA [18:41:16.834] - Getting '...' globals ... DONE [18:41:16.835] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:16.835] List of 2 [18:41:16.835] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [18:41:16.835] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [18:41:16.835] $ ... :List of 2 [18:41:16.835] ..$ collapse: chr "; " [18:41:16.835] ..$ maxHead : int 3 [18:41:16.835] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:16.835] - attr(*, "where")=List of 2 [18:41:16.835] ..$ ...future.FUN: [18:41:16.835] ..$ ... : [18:41:16.835] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:16.835] - attr(*, "resolved")= logi FALSE [18:41:16.835] - attr(*, "total_size")= int 20301 [18:41:16.839] Packages to be attached in all futures: [n=1] 'future' [18:41:16.839] getGlobalsAndPackagesXApply() ... DONE [18:41:16.839] Number of futures (= number of chunks): 1 [18:41:16.839] Launching 1 futures (chunks) ... [18:41:16.840] Chunk #1 of 1 ... [18:41:16.840] - Finding globals in 'X' for chunk #1 ... [18:41:16.840] getGlobalsAndPackages() ... [18:41:16.840] Searching for globals... [18:41:16.840] [18:41:16.841] Searching for globals ... DONE [18:41:16.841] - globals: [0] [18:41:16.841] getGlobalsAndPackages() ... DONE [18:41:16.841] + additional globals found: [n=0] [18:41:16.841] + additional namespaces needed: [n=0] [18:41:16.841] - Finding globals in 'X' for chunk #1 ... DONE [18:41:16.842] - seeds: [18:41:16.842] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.842] getGlobalsAndPackages() ... [18:41:16.842] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.842] Resolving globals: FALSE [18:41:16.842] Tweak future expression to call with '...' arguments ... [18:41:16.843] { [18:41:16.843] do.call(function(...) { [18:41:16.843] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.843] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:16.843] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.843] on.exit(options(oopts), add = TRUE) [18:41:16.843] } [18:41:16.843] { [18:41:16.843] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:16.843] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.843] ...future.FUN(...future.X_jj, ...) [18:41:16.843] }) [18:41:16.843] } [18:41:16.843] }, args = future.call.arguments) [18:41:16.843] } [18:41:16.843] Tweak future expression to call with '...' arguments ... DONE [18:41:16.844] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.844] - packages: [1] 'future' [18:41:16.844] getGlobalsAndPackages() ... DONE [18:41:16.844] run() for 'Future' ... [18:41:16.844] - state: 'created' [18:41:16.845] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:16.845] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:16.845] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:16.846] - Field: 'label' [18:41:16.846] - Field: 'local' [18:41:16.846] - Field: 'owner' [18:41:16.846] - Field: 'envir' [18:41:16.846] - Field: 'packages' [18:41:16.846] - Field: 'gc' [18:41:16.847] - Field: 'conditions' [18:41:16.847] - Field: 'expr' [18:41:16.847] - Field: 'uuid' [18:41:16.847] - Field: 'seed' [18:41:16.847] - Field: 'version' [18:41:16.848] - Field: 'result' [18:41:16.848] - Field: 'asynchronous' [18:41:16.848] - Field: 'calls' [18:41:16.848] - Field: 'globals' [18:41:16.848] - Field: 'stdout' [18:41:16.848] - Field: 'earlySignal' [18:41:16.849] - Field: 'lazy' [18:41:16.849] - Field: 'state' [18:41:16.849] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:16.849] - Launch lazy future ... [18:41:16.849] Packages needed by the future expression (n = 1): 'future' [18:41:16.849] Packages needed by future strategies (n = 0): [18:41:16.850] { [18:41:16.850] { [18:41:16.850] { [18:41:16.850] ...future.startTime <- base::Sys.time() [18:41:16.850] { [18:41:16.850] { [18:41:16.850] { [18:41:16.850] { [18:41:16.850] base::local({ [18:41:16.850] has_future <- base::requireNamespace("future", [18:41:16.850] quietly = TRUE) [18:41:16.850] if (has_future) { [18:41:16.850] ns <- base::getNamespace("future") [18:41:16.850] version <- ns[[".package"]][["version"]] [18:41:16.850] if (is.null(version)) [18:41:16.850] version <- utils::packageVersion("future") [18:41:16.850] } [18:41:16.850] else { [18:41:16.850] version <- NULL [18:41:16.850] } [18:41:16.850] if (!has_future || version < "1.8.0") { [18:41:16.850] info <- base::c(r_version = base::gsub("R version ", [18:41:16.850] "", base::R.version$version.string), [18:41:16.850] platform = base::sprintf("%s (%s-bit)", [18:41:16.850] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:16.850] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:16.850] "release", "version")], collapse = " "), [18:41:16.850] hostname = base::Sys.info()[["nodename"]]) [18:41:16.850] info <- base::sprintf("%s: %s", base::names(info), [18:41:16.850] info) [18:41:16.850] info <- base::paste(info, collapse = "; ") [18:41:16.850] if (!has_future) { [18:41:16.850] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:16.850] info) [18:41:16.850] } [18:41:16.850] else { [18:41:16.850] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:16.850] info, version) [18:41:16.850] } [18:41:16.850] base::stop(msg) [18:41:16.850] } [18:41:16.850] }) [18:41:16.850] } [18:41:16.850] base::local({ [18:41:16.850] for (pkg in "future") { [18:41:16.850] base::loadNamespace(pkg) [18:41:16.850] base::library(pkg, character.only = TRUE) [18:41:16.850] } [18:41:16.850] }) [18:41:16.850] } [18:41:16.850] ...future.strategy.old <- future::plan("list") [18:41:16.850] options(future.plan = NULL) [18:41:16.850] Sys.unsetenv("R_FUTURE_PLAN") [18:41:16.850] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:16.850] } [18:41:16.850] ...future.workdir <- getwd() [18:41:16.850] } [18:41:16.850] ...future.oldOptions <- base::as.list(base::.Options) [18:41:16.850] ...future.oldEnvVars <- base::Sys.getenv() [18:41:16.850] } [18:41:16.850] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:16.850] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:16.850] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:16.850] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:16.850] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:16.850] future.stdout.windows.reencode = NULL, width = 80L) [18:41:16.850] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:16.850] base::names(...future.oldOptions)) [18:41:16.850] } [18:41:16.850] if (FALSE) { [18:41:16.850] } [18:41:16.850] else { [18:41:16.850] if (TRUE) { [18:41:16.850] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:16.850] open = "w") [18:41:16.850] } [18:41:16.850] else { [18:41:16.850] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:16.850] windows = "NUL", "/dev/null"), open = "w") [18:41:16.850] } [18:41:16.850] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:16.850] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:16.850] base::sink(type = "output", split = FALSE) [18:41:16.850] base::close(...future.stdout) [18:41:16.850] }, add = TRUE) [18:41:16.850] } [18:41:16.850] ...future.frame <- base::sys.nframe() [18:41:16.850] ...future.conditions <- base::list() [18:41:16.850] ...future.rng <- base::globalenv()$.Random.seed [18:41:16.850] if (FALSE) { [18:41:16.850] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:16.850] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:16.850] } [18:41:16.850] ...future.result <- base::tryCatch({ [18:41:16.850] base::withCallingHandlers({ [18:41:16.850] ...future.value <- base::withVisible(base::local({ [18:41:16.850] do.call(function(...) { [18:41:16.850] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.850] if (!identical(...future.globals.maxSize.org, [18:41:16.850] ...future.globals.maxSize)) { [18:41:16.850] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.850] on.exit(options(oopts), add = TRUE) [18:41:16.850] } [18:41:16.850] { [18:41:16.850] lapply(seq_along(...future.elements_ii), [18:41:16.850] FUN = function(jj) { [18:41:16.850] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.850] ...future.FUN(...future.X_jj, ...) [18:41:16.850] }) [18:41:16.850] } [18:41:16.850] }, args = future.call.arguments) [18:41:16.850] })) [18:41:16.850] future::FutureResult(value = ...future.value$value, [18:41:16.850] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:16.850] ...future.rng), globalenv = if (FALSE) [18:41:16.850] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:16.850] ...future.globalenv.names)) [18:41:16.850] else NULL, started = ...future.startTime, version = "1.8") [18:41:16.850] }, condition = base::local({ [18:41:16.850] c <- base::c [18:41:16.850] inherits <- base::inherits [18:41:16.850] invokeRestart <- base::invokeRestart [18:41:16.850] length <- base::length [18:41:16.850] list <- base::list [18:41:16.850] seq.int <- base::seq.int [18:41:16.850] signalCondition <- base::signalCondition [18:41:16.850] sys.calls <- base::sys.calls [18:41:16.850] `[[` <- base::`[[` [18:41:16.850] `+` <- base::`+` [18:41:16.850] `<<-` <- base::`<<-` [18:41:16.850] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:16.850] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:16.850] 3L)] [18:41:16.850] } [18:41:16.850] function(cond) { [18:41:16.850] is_error <- inherits(cond, "error") [18:41:16.850] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:16.850] NULL) [18:41:16.850] if (is_error) { [18:41:16.850] sessionInformation <- function() { [18:41:16.850] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:16.850] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:16.850] search = base::search(), system = base::Sys.info()) [18:41:16.850] } [18:41:16.850] ...future.conditions[[length(...future.conditions) + [18:41:16.850] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:16.850] cond$call), session = sessionInformation(), [18:41:16.850] timestamp = base::Sys.time(), signaled = 0L) [18:41:16.850] signalCondition(cond) [18:41:16.850] } [18:41:16.850] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:16.850] "immediateCondition"))) { [18:41:16.850] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:16.850] ...future.conditions[[length(...future.conditions) + [18:41:16.850] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:16.850] if (TRUE && !signal) { [18:41:16.850] muffleCondition <- function (cond, pattern = "^muffle") [18:41:16.850] { [18:41:16.850] inherits <- base::inherits [18:41:16.850] invokeRestart <- base::invokeRestart [18:41:16.850] is.null <- base::is.null [18:41:16.850] muffled <- FALSE [18:41:16.850] if (inherits(cond, "message")) { [18:41:16.850] muffled <- grepl(pattern, "muffleMessage") [18:41:16.850] if (muffled) [18:41:16.850] invokeRestart("muffleMessage") [18:41:16.850] } [18:41:16.850] else if (inherits(cond, "warning")) { [18:41:16.850] muffled <- grepl(pattern, "muffleWarning") [18:41:16.850] if (muffled) [18:41:16.850] invokeRestart("muffleWarning") [18:41:16.850] } [18:41:16.850] else if (inherits(cond, "condition")) { [18:41:16.850] if (!is.null(pattern)) { [18:41:16.850] computeRestarts <- base::computeRestarts [18:41:16.850] grepl <- base::grepl [18:41:16.850] restarts <- computeRestarts(cond) [18:41:16.850] for (restart in restarts) { [18:41:16.850] name <- restart$name [18:41:16.850] if (is.null(name)) [18:41:16.850] next [18:41:16.850] if (!grepl(pattern, name)) [18:41:16.850] next [18:41:16.850] invokeRestart(restart) [18:41:16.850] muffled <- TRUE [18:41:16.850] break [18:41:16.850] } [18:41:16.850] } [18:41:16.850] } [18:41:16.850] invisible(muffled) [18:41:16.850] } [18:41:16.850] muffleCondition(cond, pattern = "^muffle") [18:41:16.850] } [18:41:16.850] } [18:41:16.850] else { [18:41:16.850] if (TRUE) { [18:41:16.850] muffleCondition <- function (cond, pattern = "^muffle") [18:41:16.850] { [18:41:16.850] inherits <- base::inherits [18:41:16.850] invokeRestart <- base::invokeRestart [18:41:16.850] is.null <- base::is.null [18:41:16.850] muffled <- FALSE [18:41:16.850] if (inherits(cond, "message")) { [18:41:16.850] muffled <- grepl(pattern, "muffleMessage") [18:41:16.850] if (muffled) [18:41:16.850] invokeRestart("muffleMessage") [18:41:16.850] } [18:41:16.850] else if (inherits(cond, "warning")) { [18:41:16.850] muffled <- grepl(pattern, "muffleWarning") [18:41:16.850] if (muffled) [18:41:16.850] invokeRestart("muffleWarning") [18:41:16.850] } [18:41:16.850] else if (inherits(cond, "condition")) { [18:41:16.850] if (!is.null(pattern)) { [18:41:16.850] computeRestarts <- base::computeRestarts [18:41:16.850] grepl <- base::grepl [18:41:16.850] restarts <- computeRestarts(cond) [18:41:16.850] for (restart in restarts) { [18:41:16.850] name <- restart$name [18:41:16.850] if (is.null(name)) [18:41:16.850] next [18:41:16.850] if (!grepl(pattern, name)) [18:41:16.850] next [18:41:16.850] invokeRestart(restart) [18:41:16.850] muffled <- TRUE [18:41:16.850] break [18:41:16.850] } [18:41:16.850] } [18:41:16.850] } [18:41:16.850] invisible(muffled) [18:41:16.850] } [18:41:16.850] muffleCondition(cond, pattern = "^muffle") [18:41:16.850] } [18:41:16.850] } [18:41:16.850] } [18:41:16.850] })) [18:41:16.850] }, error = function(ex) { [18:41:16.850] base::structure(base::list(value = NULL, visible = NULL, [18:41:16.850] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:16.850] ...future.rng), started = ...future.startTime, [18:41:16.850] finished = Sys.time(), session_uuid = NA_character_, [18:41:16.850] version = "1.8"), class = "FutureResult") [18:41:16.850] }, finally = { [18:41:16.850] if (!identical(...future.workdir, getwd())) [18:41:16.850] setwd(...future.workdir) [18:41:16.850] { [18:41:16.850] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:16.850] ...future.oldOptions$nwarnings <- NULL [18:41:16.850] } [18:41:16.850] base::options(...future.oldOptions) [18:41:16.850] if (.Platform$OS.type == "windows") { [18:41:16.850] old_names <- names(...future.oldEnvVars) [18:41:16.850] envs <- base::Sys.getenv() [18:41:16.850] names <- names(envs) [18:41:16.850] common <- intersect(names, old_names) [18:41:16.850] added <- setdiff(names, old_names) [18:41:16.850] removed <- setdiff(old_names, names) [18:41:16.850] changed <- common[...future.oldEnvVars[common] != [18:41:16.850] envs[common]] [18:41:16.850] NAMES <- toupper(changed) [18:41:16.850] args <- list() [18:41:16.850] for (kk in seq_along(NAMES)) { [18:41:16.850] name <- changed[[kk]] [18:41:16.850] NAME <- NAMES[[kk]] [18:41:16.850] if (name != NAME && is.element(NAME, old_names)) [18:41:16.850] next [18:41:16.850] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:16.850] } [18:41:16.850] NAMES <- toupper(added) [18:41:16.850] for (kk in seq_along(NAMES)) { [18:41:16.850] name <- added[[kk]] [18:41:16.850] NAME <- NAMES[[kk]] [18:41:16.850] if (name != NAME && is.element(NAME, old_names)) [18:41:16.850] next [18:41:16.850] args[[name]] <- "" [18:41:16.850] } [18:41:16.850] NAMES <- toupper(removed) [18:41:16.850] for (kk in seq_along(NAMES)) { [18:41:16.850] name <- removed[[kk]] [18:41:16.850] NAME <- NAMES[[kk]] [18:41:16.850] if (name != NAME && is.element(NAME, old_names)) [18:41:16.850] next [18:41:16.850] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:16.850] } [18:41:16.850] if (length(args) > 0) [18:41:16.850] base::do.call(base::Sys.setenv, args = args) [18:41:16.850] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:16.850] } [18:41:16.850] else { [18:41:16.850] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:16.850] } [18:41:16.850] { [18:41:16.850] if (base::length(...future.futureOptionsAdded) > [18:41:16.850] 0L) { [18:41:16.850] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:16.850] base::names(opts) <- ...future.futureOptionsAdded [18:41:16.850] base::options(opts) [18:41:16.850] } [18:41:16.850] { [18:41:16.850] { [18:41:16.850] NULL [18:41:16.850] RNGkind("Mersenne-Twister") [18:41:16.850] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:16.850] inherits = FALSE) [18:41:16.850] } [18:41:16.850] options(future.plan = NULL) [18:41:16.850] if (is.na(NA_character_)) [18:41:16.850] Sys.unsetenv("R_FUTURE_PLAN") [18:41:16.850] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:16.850] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:16.850] .init = FALSE) [18:41:16.850] } [18:41:16.850] } [18:41:16.850] } [18:41:16.850] }) [18:41:16.850] if (TRUE) { [18:41:16.850] base::sink(type = "output", split = FALSE) [18:41:16.850] if (TRUE) { [18:41:16.850] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:16.850] } [18:41:16.850] else { [18:41:16.850] ...future.result["stdout"] <- base::list(NULL) [18:41:16.850] } [18:41:16.850] base::close(...future.stdout) [18:41:16.850] ...future.stdout <- NULL [18:41:16.850] } [18:41:16.850] ...future.result$conditions <- ...future.conditions [18:41:16.850] ...future.result$finished <- base::Sys.time() [18:41:16.850] ...future.result [18:41:16.850] } [18:41:16.854] assign_globals() ... [18:41:16.854] List of 5 [18:41:16.854] $ ...future.FUN :function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [18:41:16.854] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [18:41:16.854] $ future.call.arguments :List of 2 [18:41:16.854] ..$ collapse: chr "; " [18:41:16.854] ..$ maxHead : int 3 [18:41:16.854] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:16.854] $ ...future.elements_ii :List of 1 [18:41:16.854] ..$ a: Named chr [1:101] "hello" "1" "2" "3" ... [18:41:16.854] .. ..- attr(*, "names")= chr [1:101] "" "b1" "b2" "b3" ... [18:41:16.854] $ ...future.seeds_ii : NULL [18:41:16.854] $ ...future.globals.maxSize: NULL [18:41:16.854] - attr(*, "where")=List of 5 [18:41:16.854] ..$ ...future.FUN : [18:41:16.854] ..$ future.call.arguments : [18:41:16.854] ..$ ...future.elements_ii : [18:41:16.854] ..$ ...future.seeds_ii : [18:41:16.854] ..$ ...future.globals.maxSize: [18:41:16.854] - attr(*, "resolved")= logi FALSE [18:41:16.854] - attr(*, "total_size")= num 20301 [18:41:16.854] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:16.854] - attr(*, "already-done")= logi TRUE [18:41:16.861] - copied '...future.FUN' to environment [18:41:16.861] - copied 'future.call.arguments' to environment [18:41:16.861] - copied '...future.elements_ii' to environment [18:41:16.862] - copied '...future.seeds_ii' to environment [18:41:16.862] - copied '...future.globals.maxSize' to environment [18:41:16.862] assign_globals() ... done [18:41:16.863] plan(): Setting new future strategy stack: [18:41:16.863] List of future strategies: [18:41:16.863] 1. sequential: [18:41:16.863] - args: function (..., envir = parent.frame(), workers = "") [18:41:16.863] - tweaked: FALSE [18:41:16.863] - call: NULL [18:41:16.863] plan(): nbrOfWorkers() = 1 [18:41:16.865] plan(): Setting new future strategy stack: [18:41:16.865] List of future strategies: [18:41:16.865] 1. sequential: [18:41:16.865] - args: function (..., envir = parent.frame(), workers = "") [18:41:16.865] - tweaked: FALSE [18:41:16.865] - call: plan(strategy) [18:41:16.865] plan(): nbrOfWorkers() = 1 [18:41:16.866] SequentialFuture started (and completed) [18:41:16.866] - Launch lazy future ... done [18:41:16.866] run() for 'SequentialFuture' ... done [18:41:16.866] Created future: [18:41:16.866] SequentialFuture: [18:41:16.866] Label: 'future_lapply-1' [18:41:16.866] Expression: [18:41:16.866] { [18:41:16.866] do.call(function(...) { [18:41:16.866] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.866] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:16.866] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.866] on.exit(options(oopts), add = TRUE) [18:41:16.866] } [18:41:16.866] { [18:41:16.866] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:16.866] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.866] ...future.FUN(...future.X_jj, ...) [18:41:16.866] }) [18:41:16.866] } [18:41:16.866] }, args = future.call.arguments) [18:41:16.866] } [18:41:16.866] Lazy evaluation: FALSE [18:41:16.866] Asynchronous evaluation: FALSE [18:41:16.866] Local evaluation: TRUE [18:41:16.866] Environment: R_GlobalEnv [18:41:16.866] Capture standard output: TRUE [18:41:16.866] Capture condition classes: 'condition' (excluding 'nothing') [18:41:16.866] Globals: 5 objects totaling 9.56 KiB (function '...future.FUN' of 7.17 KiB, DotDotDotList 'future.call.arguments' of 187 bytes, list '...future.elements_ii' of 2.15 KiB, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:16.866] Packages: 1 packages ('future') [18:41:16.866] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:16.866] Resolved: TRUE [18:41:16.866] Value: 68 bytes of class 'list' [18:41:16.866] Early signaling: FALSE [18:41:16.866] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:16.866] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:16.868] Chunk #1 of 1 ... DONE [18:41:16.868] Launching 1 futures (chunks) ... DONE [18:41:16.868] Resolving 1 futures (chunks) ... [18:41:16.868] resolve() on list ... [18:41:16.868] recursive: 0 [18:41:16.868] length: 1 [18:41:16.869] [18:41:16.869] resolved() for 'SequentialFuture' ... [18:41:16.869] - state: 'finished' [18:41:16.869] - run: TRUE [18:41:16.869] - result: 'FutureResult' [18:41:16.869] resolved() for 'SequentialFuture' ... done [18:41:16.870] Future #1 [18:41:16.870] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:16.870] - nx: 1 [18:41:16.870] - relay: TRUE [18:41:16.870] - stdout: TRUE [18:41:16.870] - signal: TRUE [18:41:16.871] - resignal: FALSE [18:41:16.871] - force: TRUE [18:41:16.871] - relayed: [n=1] FALSE [18:41:16.871] - queued futures: [n=1] FALSE [18:41:16.871] - until=1 [18:41:16.871] - relaying element #1 [18:41:16.872] - relayed: [n=1] TRUE [18:41:16.872] - queued futures: [n=1] TRUE [18:41:16.872] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:16.872] length: 0 (resolved future 1) [18:41:16.872] Relaying remaining futures [18:41:16.872] signalConditionsASAP(NULL, pos=0) ... [18:41:16.873] - nx: 1 [18:41:16.873] - relay: TRUE [18:41:16.873] - stdout: TRUE [18:41:16.873] - signal: TRUE [18:41:16.873] - resignal: FALSE [18:41:16.873] - force: TRUE [18:41:16.873] - relayed: [n=1] TRUE [18:41:16.874] - queued futures: [n=1] TRUE - flush all [18:41:16.874] - relayed: [n=1] TRUE [18:41:16.874] - queued futures: [n=1] TRUE [18:41:16.874] signalConditionsASAP(NULL, pos=0) ... done [18:41:16.874] resolve() on list ... DONE [18:41:16.874] - Number of value chunks collected: 1 [18:41:16.875] Resolving 1 futures (chunks) ... DONE [18:41:16.875] Reducing values from 1 chunks ... [18:41:16.875] - Number of values collected after concatenation: 1 [18:41:16.875] - Number of values expected: 1 [18:41:16.875] Reducing values from 1 chunks ... DONE [18:41:16.875] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [18:41:16.877] future_lapply() ... [18:41:16.877] Number of chunks: 1 [18:41:16.877] getGlobalsAndPackagesXApply() ... [18:41:16.878] - future.globals: TRUE [18:41:16.878] getGlobalsAndPackages() ... [18:41:16.878] Searching for globals... [18:41:16.879] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [18:41:16.880] Searching for globals ... DONE [18:41:16.880] Resolving globals: FALSE [18:41:16.880] The total size of the 1 globals is 911 bytes (911 bytes) [18:41:16.881] The total size of the 1 globals exported for future expression ('FUN()') is 911 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (911 bytes of class 'function') [18:41:16.881] - globals: [1] 'FUN' [18:41:16.881] - packages: [1] 'listenv' [18:41:16.881] getGlobalsAndPackages() ... DONE [18:41:16.881] - globals found/used: [n=1] 'FUN' [18:41:16.882] - needed namespaces: [n=1] 'listenv' [18:41:16.882] Finding globals ... DONE [18:41:16.882] - use_args: TRUE [18:41:16.882] - Getting '...' globals ... [18:41:16.882] resolve() on list ... [18:41:16.883] recursive: 0 [18:41:16.883] length: 1 [18:41:16.883] elements: '...' [18:41:16.883] length: 0 (resolved future 1) [18:41:16.883] resolve() on list ... DONE [18:41:16.883] - '...' content: [n=0] [18:41:16.884] List of 1 [18:41:16.884] $ ...: list() [18:41:16.884] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:16.884] - attr(*, "where")=List of 1 [18:41:16.884] ..$ ...: [18:41:16.884] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:16.884] - attr(*, "resolved")= logi TRUE [18:41:16.884] - attr(*, "total_size")= num NA [18:41:16.886] - Getting '...' globals ... DONE [18:41:16.887] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:16.887] List of 2 [18:41:16.887] $ ...future.FUN:function (x, ...) [18:41:16.887] $ ... : list() [18:41:16.887] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:16.887] - attr(*, "where")=List of 2 [18:41:16.887] ..$ ...future.FUN: [18:41:16.887] ..$ ... : [18:41:16.887] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:16.887] - attr(*, "resolved")= logi FALSE [18:41:16.887] - attr(*, "total_size")= int 8145 [18:41:16.890] Packages to be attached in all futures: [n=1] 'listenv' [18:41:16.890] getGlobalsAndPackagesXApply() ... DONE [18:41:16.891] Number of futures (= number of chunks): 1 [18:41:16.891] Launching 1 futures (chunks) ... [18:41:16.891] Chunk #1 of 1 ... [18:41:16.891] - Finding globals in 'X' for chunk #1 ... [18:41:16.891] getGlobalsAndPackages() ... [18:41:16.891] Searching for globals... [18:41:16.892] [18:41:16.892] Searching for globals ... DONE [18:41:16.893] - globals: [0] [18:41:16.893] getGlobalsAndPackages() ... DONE [18:41:16.893] + additional globals found: [n=0] [18:41:16.893] + additional namespaces needed: [n=0] [18:41:16.893] - Finding globals in 'X' for chunk #1 ... DONE [18:41:16.893] - seeds: [18:41:16.893] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.894] getGlobalsAndPackages() ... [18:41:16.894] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.894] Resolving globals: FALSE [18:41:16.894] Tweak future expression to call with '...' arguments ... [18:41:16.894] { [18:41:16.894] do.call(function(...) { [18:41:16.894] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.894] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:16.894] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.894] on.exit(options(oopts), add = TRUE) [18:41:16.894] } [18:41:16.894] { [18:41:16.894] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:16.894] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.894] ...future.FUN(...future.X_jj, ...) [18:41:16.894] }) [18:41:16.894] } [18:41:16.894] }, args = future.call.arguments) [18:41:16.894] } [18:41:16.895] Tweak future expression to call with '...' arguments ... DONE [18:41:16.895] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.896] - packages: [1] 'listenv' [18:41:16.896] getGlobalsAndPackages() ... DONE [18:41:16.896] run() for 'Future' ... [18:41:16.896] - state: 'created' [18:41:16.896] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:16.897] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:16.897] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:16.897] - Field: 'label' [18:41:16.897] - Field: 'local' [18:41:16.898] - Field: 'owner' [18:41:16.898] - Field: 'envir' [18:41:16.898] - Field: 'packages' [18:41:16.898] - Field: 'gc' [18:41:16.898] - Field: 'conditions' [18:41:16.898] - Field: 'expr' [18:41:16.899] - Field: 'uuid' [18:41:16.899] - Field: 'seed' [18:41:16.899] - Field: 'version' [18:41:16.899] - Field: 'result' [18:41:16.899] - Field: 'asynchronous' [18:41:16.899] - Field: 'calls' [18:41:16.900] - Field: 'globals' [18:41:16.900] - Field: 'stdout' [18:41:16.900] - Field: 'earlySignal' [18:41:16.900] - Field: 'lazy' [18:41:16.900] - Field: 'state' [18:41:16.900] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:16.901] - Launch lazy future ... [18:41:16.901] Packages needed by the future expression (n = 1): 'listenv' [18:41:16.901] Packages needed by future strategies (n = 0): [18:41:16.902] { [18:41:16.902] { [18:41:16.902] { [18:41:16.902] ...future.startTime <- base::Sys.time() [18:41:16.902] { [18:41:16.902] { [18:41:16.902] { [18:41:16.902] { [18:41:16.902] base::local({ [18:41:16.902] has_future <- base::requireNamespace("future", [18:41:16.902] quietly = TRUE) [18:41:16.902] if (has_future) { [18:41:16.902] ns <- base::getNamespace("future") [18:41:16.902] version <- ns[[".package"]][["version"]] [18:41:16.902] if (is.null(version)) [18:41:16.902] version <- utils::packageVersion("future") [18:41:16.902] } [18:41:16.902] else { [18:41:16.902] version <- NULL [18:41:16.902] } [18:41:16.902] if (!has_future || version < "1.8.0") { [18:41:16.902] info <- base::c(r_version = base::gsub("R version ", [18:41:16.902] "", base::R.version$version.string), [18:41:16.902] platform = base::sprintf("%s (%s-bit)", [18:41:16.902] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:16.902] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:16.902] "release", "version")], collapse = " "), [18:41:16.902] hostname = base::Sys.info()[["nodename"]]) [18:41:16.902] info <- base::sprintf("%s: %s", base::names(info), [18:41:16.902] info) [18:41:16.902] info <- base::paste(info, collapse = "; ") [18:41:16.902] if (!has_future) { [18:41:16.902] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:16.902] info) [18:41:16.902] } [18:41:16.902] else { [18:41:16.902] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:16.902] info, version) [18:41:16.902] } [18:41:16.902] base::stop(msg) [18:41:16.902] } [18:41:16.902] }) [18:41:16.902] } [18:41:16.902] base::local({ [18:41:16.902] for (pkg in "listenv") { [18:41:16.902] base::loadNamespace(pkg) [18:41:16.902] base::library(pkg, character.only = TRUE) [18:41:16.902] } [18:41:16.902] }) [18:41:16.902] } [18:41:16.902] ...future.strategy.old <- future::plan("list") [18:41:16.902] options(future.plan = NULL) [18:41:16.902] Sys.unsetenv("R_FUTURE_PLAN") [18:41:16.902] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:16.902] } [18:41:16.902] ...future.workdir <- getwd() [18:41:16.902] } [18:41:16.902] ...future.oldOptions <- base::as.list(base::.Options) [18:41:16.902] ...future.oldEnvVars <- base::Sys.getenv() [18:41:16.902] } [18:41:16.902] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:16.902] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:16.902] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:16.902] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:16.902] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:16.902] future.stdout.windows.reencode = NULL, width = 80L) [18:41:16.902] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:16.902] base::names(...future.oldOptions)) [18:41:16.902] } [18:41:16.902] if (FALSE) { [18:41:16.902] } [18:41:16.902] else { [18:41:16.902] if (TRUE) { [18:41:16.902] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:16.902] open = "w") [18:41:16.902] } [18:41:16.902] else { [18:41:16.902] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:16.902] windows = "NUL", "/dev/null"), open = "w") [18:41:16.902] } [18:41:16.902] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:16.902] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:16.902] base::sink(type = "output", split = FALSE) [18:41:16.902] base::close(...future.stdout) [18:41:16.902] }, add = TRUE) [18:41:16.902] } [18:41:16.902] ...future.frame <- base::sys.nframe() [18:41:16.902] ...future.conditions <- base::list() [18:41:16.902] ...future.rng <- base::globalenv()$.Random.seed [18:41:16.902] if (FALSE) { [18:41:16.902] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:16.902] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:16.902] } [18:41:16.902] ...future.result <- base::tryCatch({ [18:41:16.902] base::withCallingHandlers({ [18:41:16.902] ...future.value <- base::withVisible(base::local({ [18:41:16.902] do.call(function(...) { [18:41:16.902] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.902] if (!identical(...future.globals.maxSize.org, [18:41:16.902] ...future.globals.maxSize)) { [18:41:16.902] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.902] on.exit(options(oopts), add = TRUE) [18:41:16.902] } [18:41:16.902] { [18:41:16.902] lapply(seq_along(...future.elements_ii), [18:41:16.902] FUN = function(jj) { [18:41:16.902] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.902] ...future.FUN(...future.X_jj, ...) [18:41:16.902] }) [18:41:16.902] } [18:41:16.902] }, args = future.call.arguments) [18:41:16.902] })) [18:41:16.902] future::FutureResult(value = ...future.value$value, [18:41:16.902] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:16.902] ...future.rng), globalenv = if (FALSE) [18:41:16.902] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:16.902] ...future.globalenv.names)) [18:41:16.902] else NULL, started = ...future.startTime, version = "1.8") [18:41:16.902] }, condition = base::local({ [18:41:16.902] c <- base::c [18:41:16.902] inherits <- base::inherits [18:41:16.902] invokeRestart <- base::invokeRestart [18:41:16.902] length <- base::length [18:41:16.902] list <- base::list [18:41:16.902] seq.int <- base::seq.int [18:41:16.902] signalCondition <- base::signalCondition [18:41:16.902] sys.calls <- base::sys.calls [18:41:16.902] `[[` <- base::`[[` [18:41:16.902] `+` <- base::`+` [18:41:16.902] `<<-` <- base::`<<-` [18:41:16.902] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:16.902] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:16.902] 3L)] [18:41:16.902] } [18:41:16.902] function(cond) { [18:41:16.902] is_error <- inherits(cond, "error") [18:41:16.902] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:16.902] NULL) [18:41:16.902] if (is_error) { [18:41:16.902] sessionInformation <- function() { [18:41:16.902] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:16.902] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:16.902] search = base::search(), system = base::Sys.info()) [18:41:16.902] } [18:41:16.902] ...future.conditions[[length(...future.conditions) + [18:41:16.902] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:16.902] cond$call), session = sessionInformation(), [18:41:16.902] timestamp = base::Sys.time(), signaled = 0L) [18:41:16.902] signalCondition(cond) [18:41:16.902] } [18:41:16.902] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:16.902] "immediateCondition"))) { [18:41:16.902] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:16.902] ...future.conditions[[length(...future.conditions) + [18:41:16.902] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:16.902] if (TRUE && !signal) { [18:41:16.902] muffleCondition <- function (cond, pattern = "^muffle") [18:41:16.902] { [18:41:16.902] inherits <- base::inherits [18:41:16.902] invokeRestart <- base::invokeRestart [18:41:16.902] is.null <- base::is.null [18:41:16.902] muffled <- FALSE [18:41:16.902] if (inherits(cond, "message")) { [18:41:16.902] muffled <- grepl(pattern, "muffleMessage") [18:41:16.902] if (muffled) [18:41:16.902] invokeRestart("muffleMessage") [18:41:16.902] } [18:41:16.902] else if (inherits(cond, "warning")) { [18:41:16.902] muffled <- grepl(pattern, "muffleWarning") [18:41:16.902] if (muffled) [18:41:16.902] invokeRestart("muffleWarning") [18:41:16.902] } [18:41:16.902] else if (inherits(cond, "condition")) { [18:41:16.902] if (!is.null(pattern)) { [18:41:16.902] computeRestarts <- base::computeRestarts [18:41:16.902] grepl <- base::grepl [18:41:16.902] restarts <- computeRestarts(cond) [18:41:16.902] for (restart in restarts) { [18:41:16.902] name <- restart$name [18:41:16.902] if (is.null(name)) [18:41:16.902] next [18:41:16.902] if (!grepl(pattern, name)) [18:41:16.902] next [18:41:16.902] invokeRestart(restart) [18:41:16.902] muffled <- TRUE [18:41:16.902] break [18:41:16.902] } [18:41:16.902] } [18:41:16.902] } [18:41:16.902] invisible(muffled) [18:41:16.902] } [18:41:16.902] muffleCondition(cond, pattern = "^muffle") [18:41:16.902] } [18:41:16.902] } [18:41:16.902] else { [18:41:16.902] if (TRUE) { [18:41:16.902] muffleCondition <- function (cond, pattern = "^muffle") [18:41:16.902] { [18:41:16.902] inherits <- base::inherits [18:41:16.902] invokeRestart <- base::invokeRestart [18:41:16.902] is.null <- base::is.null [18:41:16.902] muffled <- FALSE [18:41:16.902] if (inherits(cond, "message")) { [18:41:16.902] muffled <- grepl(pattern, "muffleMessage") [18:41:16.902] if (muffled) [18:41:16.902] invokeRestart("muffleMessage") [18:41:16.902] } [18:41:16.902] else if (inherits(cond, "warning")) { [18:41:16.902] muffled <- grepl(pattern, "muffleWarning") [18:41:16.902] if (muffled) [18:41:16.902] invokeRestart("muffleWarning") [18:41:16.902] } [18:41:16.902] else if (inherits(cond, "condition")) { [18:41:16.902] if (!is.null(pattern)) { [18:41:16.902] computeRestarts <- base::computeRestarts [18:41:16.902] grepl <- base::grepl [18:41:16.902] restarts <- computeRestarts(cond) [18:41:16.902] for (restart in restarts) { [18:41:16.902] name <- restart$name [18:41:16.902] if (is.null(name)) [18:41:16.902] next [18:41:16.902] if (!grepl(pattern, name)) [18:41:16.902] next [18:41:16.902] invokeRestart(restart) [18:41:16.902] muffled <- TRUE [18:41:16.902] break [18:41:16.902] } [18:41:16.902] } [18:41:16.902] } [18:41:16.902] invisible(muffled) [18:41:16.902] } [18:41:16.902] muffleCondition(cond, pattern = "^muffle") [18:41:16.902] } [18:41:16.902] } [18:41:16.902] } [18:41:16.902] })) [18:41:16.902] }, error = function(ex) { [18:41:16.902] base::structure(base::list(value = NULL, visible = NULL, [18:41:16.902] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:16.902] ...future.rng), started = ...future.startTime, [18:41:16.902] finished = Sys.time(), session_uuid = NA_character_, [18:41:16.902] version = "1.8"), class = "FutureResult") [18:41:16.902] }, finally = { [18:41:16.902] if (!identical(...future.workdir, getwd())) [18:41:16.902] setwd(...future.workdir) [18:41:16.902] { [18:41:16.902] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:16.902] ...future.oldOptions$nwarnings <- NULL [18:41:16.902] } [18:41:16.902] base::options(...future.oldOptions) [18:41:16.902] if (.Platform$OS.type == "windows") { [18:41:16.902] old_names <- names(...future.oldEnvVars) [18:41:16.902] envs <- base::Sys.getenv() [18:41:16.902] names <- names(envs) [18:41:16.902] common <- intersect(names, old_names) [18:41:16.902] added <- setdiff(names, old_names) [18:41:16.902] removed <- setdiff(old_names, names) [18:41:16.902] changed <- common[...future.oldEnvVars[common] != [18:41:16.902] envs[common]] [18:41:16.902] NAMES <- toupper(changed) [18:41:16.902] args <- list() [18:41:16.902] for (kk in seq_along(NAMES)) { [18:41:16.902] name <- changed[[kk]] [18:41:16.902] NAME <- NAMES[[kk]] [18:41:16.902] if (name != NAME && is.element(NAME, old_names)) [18:41:16.902] next [18:41:16.902] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:16.902] } [18:41:16.902] NAMES <- toupper(added) [18:41:16.902] for (kk in seq_along(NAMES)) { [18:41:16.902] name <- added[[kk]] [18:41:16.902] NAME <- NAMES[[kk]] [18:41:16.902] if (name != NAME && is.element(NAME, old_names)) [18:41:16.902] next [18:41:16.902] args[[name]] <- "" [18:41:16.902] } [18:41:16.902] NAMES <- toupper(removed) [18:41:16.902] for (kk in seq_along(NAMES)) { [18:41:16.902] name <- removed[[kk]] [18:41:16.902] NAME <- NAMES[[kk]] [18:41:16.902] if (name != NAME && is.element(NAME, old_names)) [18:41:16.902] next [18:41:16.902] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:16.902] } [18:41:16.902] if (length(args) > 0) [18:41:16.902] base::do.call(base::Sys.setenv, args = args) [18:41:16.902] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:16.902] } [18:41:16.902] else { [18:41:16.902] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:16.902] } [18:41:16.902] { [18:41:16.902] if (base::length(...future.futureOptionsAdded) > [18:41:16.902] 0L) { [18:41:16.902] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:16.902] base::names(opts) <- ...future.futureOptionsAdded [18:41:16.902] base::options(opts) [18:41:16.902] } [18:41:16.902] { [18:41:16.902] { [18:41:16.902] NULL [18:41:16.902] RNGkind("Mersenne-Twister") [18:41:16.902] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:16.902] inherits = FALSE) [18:41:16.902] } [18:41:16.902] options(future.plan = NULL) [18:41:16.902] if (is.na(NA_character_)) [18:41:16.902] Sys.unsetenv("R_FUTURE_PLAN") [18:41:16.902] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:16.902] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:16.902] .init = FALSE) [18:41:16.902] } [18:41:16.902] } [18:41:16.902] } [18:41:16.902] }) [18:41:16.902] if (TRUE) { [18:41:16.902] base::sink(type = "output", split = FALSE) [18:41:16.902] if (TRUE) { [18:41:16.902] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:16.902] } [18:41:16.902] else { [18:41:16.902] ...future.result["stdout"] <- base::list(NULL) [18:41:16.902] } [18:41:16.902] base::close(...future.stdout) [18:41:16.902] ...future.stdout <- NULL [18:41:16.902] } [18:41:16.902] ...future.result$conditions <- ...future.conditions [18:41:16.902] ...future.result$finished <- base::Sys.time() [18:41:16.902] ...future.result [18:41:16.902] } [18:41:16.906] assign_globals() ... [18:41:16.906] List of 5 [18:41:16.906] $ ...future.FUN :function (x, ...) [18:41:16.906] $ future.call.arguments : list() [18:41:16.906] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:16.906] $ ...future.elements_ii :List of 2 [18:41:16.906] ..$ a:Classes 'listenv', 'environment' [18:41:16.906] ..$ b:Classes 'listenv', 'environment' [18:41:16.906] $ ...future.seeds_ii : NULL [18:41:16.906] $ ...future.globals.maxSize: NULL [18:41:16.906] - attr(*, "where")=List of 5 [18:41:16.906] ..$ ...future.FUN : [18:41:16.906] ..$ future.call.arguments : [18:41:16.906] ..$ ...future.elements_ii : [18:41:16.906] ..$ ...future.seeds_ii : [18:41:16.906] ..$ ...future.globals.maxSize: [18:41:16.906] - attr(*, "resolved")= logi FALSE [18:41:16.906] - attr(*, "total_size")= num 8145 [18:41:16.906] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:16.906] - attr(*, "already-done")= logi TRUE [18:41:16.912] - copied '...future.FUN' to environment [18:41:16.912] - copied 'future.call.arguments' to environment [18:41:16.912] - copied '...future.elements_ii' to environment [18:41:16.912] - copied '...future.seeds_ii' to environment [18:41:16.912] - copied '...future.globals.maxSize' to environment [18:41:16.912] assign_globals() ... done [18:41:16.913] plan(): Setting new future strategy stack: [18:41:16.913] List of future strategies: [18:41:16.913] 1. sequential: [18:41:16.913] - args: function (..., envir = parent.frame(), workers = "") [18:41:16.913] - tweaked: FALSE [18:41:16.913] - call: NULL [18:41:16.914] plan(): nbrOfWorkers() = 1 [18:41:16.915] plan(): Setting new future strategy stack: [18:41:16.915] List of future strategies: [18:41:16.915] 1. sequential: [18:41:16.915] - args: function (..., envir = parent.frame(), workers = "") [18:41:16.915] - tweaked: FALSE [18:41:16.915] - call: plan(strategy) [18:41:16.916] plan(): nbrOfWorkers() = 1 [18:41:16.916] SequentialFuture started (and completed) [18:41:16.916] - Launch lazy future ... done [18:41:16.917] run() for 'SequentialFuture' ... done [18:41:16.917] Created future: [18:41:16.917] SequentialFuture: [18:41:16.917] Label: 'future_lapply-1' [18:41:16.917] Expression: [18:41:16.917] { [18:41:16.917] do.call(function(...) { [18:41:16.917] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.917] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:16.917] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.917] on.exit(options(oopts), add = TRUE) [18:41:16.917] } [18:41:16.917] { [18:41:16.917] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:16.917] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.917] ...future.FUN(...future.X_jj, ...) [18:41:16.917] }) [18:41:16.917] } [18:41:16.917] }, args = future.call.arguments) [18:41:16.917] } [18:41:16.917] Lazy evaluation: FALSE [18:41:16.917] Asynchronous evaluation: FALSE [18:41:16.917] Local evaluation: TRUE [18:41:16.917] Environment: R_GlobalEnv [18:41:16.917] Capture standard output: TRUE [18:41:16.917] Capture condition classes: 'condition' (excluding 'nothing') [18:41:16.917] Globals: 5 objects totaling 4.14 KiB (function '...future.FUN' of 911 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 3.10 KiB, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:16.917] Packages: 1 packages ('listenv') [18:41:16.917] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:16.917] Resolved: TRUE [18:41:16.917] Value: 154 bytes of class 'list' [18:41:16.917] Early signaling: FALSE [18:41:16.917] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:16.917] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:16.918] Chunk #1 of 1 ... DONE [18:41:16.918] Launching 1 futures (chunks) ... DONE [18:41:16.918] Resolving 1 futures (chunks) ... [18:41:16.919] resolve() on list ... [18:41:16.919] recursive: 0 [18:41:16.919] length: 1 [18:41:16.919] [18:41:16.919] resolved() for 'SequentialFuture' ... [18:41:16.919] - state: 'finished' [18:41:16.920] - run: TRUE [18:41:16.920] - result: 'FutureResult' [18:41:16.920] resolved() for 'SequentialFuture' ... done [18:41:16.920] Future #1 [18:41:16.920] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:16.921] - nx: 1 [18:41:16.921] - relay: TRUE [18:41:16.921] - stdout: TRUE [18:41:16.921] - signal: TRUE [18:41:16.921] - resignal: FALSE [18:41:16.921] - force: TRUE [18:41:16.921] - relayed: [n=1] FALSE [18:41:16.922] - queued futures: [n=1] FALSE [18:41:16.922] - until=1 [18:41:16.922] - relaying element #1 [18:41:16.922] - relayed: [n=1] TRUE [18:41:16.922] - queued futures: [n=1] TRUE [18:41:16.923] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:16.923] length: 0 (resolved future 1) [18:41:16.923] Relaying remaining futures [18:41:16.923] signalConditionsASAP(NULL, pos=0) ... [18:41:16.923] - nx: 1 [18:41:16.923] - relay: TRUE [18:41:16.924] - stdout: TRUE [18:41:16.924] - signal: TRUE [18:41:16.924] - resignal: FALSE [18:41:16.924] - force: TRUE [18:41:16.924] - relayed: [n=1] TRUE [18:41:16.924] - queued futures: [n=1] TRUE - flush all [18:41:16.924] - relayed: [n=1] TRUE [18:41:16.925] - queued futures: [n=1] TRUE [18:41:16.925] signalConditionsASAP(NULL, pos=0) ... done [18:41:16.925] resolve() on list ... DONE [18:41:16.925] - Number of value chunks collected: 1 [18:41:16.925] Resolving 1 futures (chunks) ... DONE [18:41:16.926] Reducing values from 1 chunks ... [18:41:16.926] - Number of values collected after concatenation: 2 [18:41:16.926] - Number of values expected: 2 [18:41:16.926] Reducing values from 1 chunks ... DONE [18:41:16.926] future_lapply() ... DONE List of 1 $ y:List of 2 ..$ a: Named chr "A" .. ..- attr(*, "names")= chr "A" ..$ b: Named chr [1:2] "A" "B" .. ..- attr(*, "names")= chr [1:2] "A" "B" - future_lapply(x, FUN = vector, ...) ... [18:41:16.928] future_lapply() ... [18:41:16.929] Number of chunks: 1 [18:41:16.929] Index remapping (attribute 'ordering'): [n = 4] 3, 1, 4, 2 [18:41:16.929] getGlobalsAndPackagesXApply() ... [18:41:16.930] - future.globals: TRUE [18:41:16.930] getGlobalsAndPackages() ... [18:41:16.930] Searching for globals... [18:41:16.931] - globals found: [2] 'FUN', '.Internal' [18:41:16.931] Searching for globals ... DONE [18:41:16.932] Resolving globals: FALSE [18:41:16.932] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:16.933] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:16.933] - globals: [1] 'FUN' [18:41:16.933] [18:41:16.933] getGlobalsAndPackages() ... DONE [18:41:16.933] - globals found/used: [n=1] 'FUN' [18:41:16.935] - needed namespaces: [n=0] [18:41:16.935] Finding globals ... DONE [18:41:16.935] - use_args: TRUE [18:41:16.936] - Getting '...' globals ... [18:41:16.936] resolve() on list ... [18:41:16.936] recursive: 0 [18:41:16.936] length: 1 [18:41:16.936] elements: '...' [18:41:16.937] length: 0 (resolved future 1) [18:41:16.937] resolve() on list ... DONE [18:41:16.937] - '...' content: [n=1] 'length' [18:41:16.937] List of 1 [18:41:16.937] $ ...:List of 1 [18:41:16.937] ..$ length: int 2 [18:41:16.937] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:16.937] - attr(*, "where")=List of 1 [18:41:16.937] ..$ ...: [18:41:16.937] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:16.937] - attr(*, "resolved")= logi TRUE [18:41:16.937] - attr(*, "total_size")= num NA [18:41:16.941] - Getting '...' globals ... DONE [18:41:16.941] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:16.941] List of 2 [18:41:16.941] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:16.941] $ ... :List of 1 [18:41:16.941] ..$ length: int 2 [18:41:16.941] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:16.941] - attr(*, "where")=List of 2 [18:41:16.941] ..$ ...future.FUN: [18:41:16.941] ..$ ... : [18:41:16.941] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:16.941] - attr(*, "resolved")= logi FALSE [18:41:16.941] - attr(*, "total_size")= int 4338 [18:41:16.945] Packages to be attached in all futures: [n=0] [18:41:16.945] getGlobalsAndPackagesXApply() ... DONE [18:41:16.945] Number of futures (= number of chunks): 1 [18:41:16.945] Launching 1 futures (chunks) ... [18:41:16.946] Chunk #1 of 1 ... [18:41:16.946] - Finding globals in 'X' for chunk #1 ... [18:41:16.946] getGlobalsAndPackages() ... [18:41:16.946] Searching for globals... [18:41:16.946] [18:41:16.947] Searching for globals ... DONE [18:41:16.947] - globals: [0] [18:41:16.947] getGlobalsAndPackages() ... DONE [18:41:16.947] + additional globals found: [n=0] [18:41:16.947] + additional namespaces needed: [n=0] [18:41:16.947] - Finding globals in 'X' for chunk #1 ... DONE [18:41:16.947] - seeds: [18:41:16.948] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.948] getGlobalsAndPackages() ... [18:41:16.948] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.948] Resolving globals: FALSE [18:41:16.948] Tweak future expression to call with '...' arguments ... [18:41:16.948] { [18:41:16.948] do.call(function(...) { [18:41:16.948] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.948] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:16.948] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.948] on.exit(options(oopts), add = TRUE) [18:41:16.948] } [18:41:16.948] { [18:41:16.948] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:16.948] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.948] ...future.FUN(...future.X_jj, ...) [18:41:16.948] }) [18:41:16.948] } [18:41:16.948] }, args = future.call.arguments) [18:41:16.948] } [18:41:16.949] Tweak future expression to call with '...' arguments ... DONE [18:41:16.949] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:16.950] [18:41:16.950] getGlobalsAndPackages() ... DONE [18:41:16.950] run() for 'Future' ... [18:41:16.950] - state: 'created' [18:41:16.950] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:16.951] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:16.951] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:16.951] - Field: 'label' [18:41:16.951] - Field: 'local' [18:41:16.952] - Field: 'owner' [18:41:16.952] - Field: 'envir' [18:41:16.952] - Field: 'packages' [18:41:16.952] - Field: 'gc' [18:41:16.952] - Field: 'conditions' [18:41:16.952] - Field: 'expr' [18:41:16.953] - Field: 'uuid' [18:41:16.953] - Field: 'seed' [18:41:16.953] - Field: 'version' [18:41:16.953] - Field: 'result' [18:41:16.953] - Field: 'asynchronous' [18:41:16.953] - Field: 'calls' [18:41:16.954] - Field: 'globals' [18:41:16.954] - Field: 'stdout' [18:41:16.954] - Field: 'earlySignal' [18:41:16.954] - Field: 'lazy' [18:41:16.954] - Field: 'state' [18:41:16.954] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:16.955] - Launch lazy future ... [18:41:16.955] Packages needed by the future expression (n = 0): [18:41:16.955] Packages needed by future strategies (n = 0): [18:41:16.956] { [18:41:16.956] { [18:41:16.956] { [18:41:16.956] ...future.startTime <- base::Sys.time() [18:41:16.956] { [18:41:16.956] { [18:41:16.956] { [18:41:16.956] base::local({ [18:41:16.956] has_future <- base::requireNamespace("future", [18:41:16.956] quietly = TRUE) [18:41:16.956] if (has_future) { [18:41:16.956] ns <- base::getNamespace("future") [18:41:16.956] version <- ns[[".package"]][["version"]] [18:41:16.956] if (is.null(version)) [18:41:16.956] version <- utils::packageVersion("future") [18:41:16.956] } [18:41:16.956] else { [18:41:16.956] version <- NULL [18:41:16.956] } [18:41:16.956] if (!has_future || version < "1.8.0") { [18:41:16.956] info <- base::c(r_version = base::gsub("R version ", [18:41:16.956] "", base::R.version$version.string), [18:41:16.956] platform = base::sprintf("%s (%s-bit)", [18:41:16.956] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:16.956] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:16.956] "release", "version")], collapse = " "), [18:41:16.956] hostname = base::Sys.info()[["nodename"]]) [18:41:16.956] info <- base::sprintf("%s: %s", base::names(info), [18:41:16.956] info) [18:41:16.956] info <- base::paste(info, collapse = "; ") [18:41:16.956] if (!has_future) { [18:41:16.956] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:16.956] info) [18:41:16.956] } [18:41:16.956] else { [18:41:16.956] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:16.956] info, version) [18:41:16.956] } [18:41:16.956] base::stop(msg) [18:41:16.956] } [18:41:16.956] }) [18:41:16.956] } [18:41:16.956] ...future.strategy.old <- future::plan("list") [18:41:16.956] options(future.plan = NULL) [18:41:16.956] Sys.unsetenv("R_FUTURE_PLAN") [18:41:16.956] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:16.956] } [18:41:16.956] ...future.workdir <- getwd() [18:41:16.956] } [18:41:16.956] ...future.oldOptions <- base::as.list(base::.Options) [18:41:16.956] ...future.oldEnvVars <- base::Sys.getenv() [18:41:16.956] } [18:41:16.956] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:16.956] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:16.956] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:16.956] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:16.956] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:16.956] future.stdout.windows.reencode = NULL, width = 80L) [18:41:16.956] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:16.956] base::names(...future.oldOptions)) [18:41:16.956] } [18:41:16.956] if (FALSE) { [18:41:16.956] } [18:41:16.956] else { [18:41:16.956] if (TRUE) { [18:41:16.956] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:16.956] open = "w") [18:41:16.956] } [18:41:16.956] else { [18:41:16.956] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:16.956] windows = "NUL", "/dev/null"), open = "w") [18:41:16.956] } [18:41:16.956] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:16.956] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:16.956] base::sink(type = "output", split = FALSE) [18:41:16.956] base::close(...future.stdout) [18:41:16.956] }, add = TRUE) [18:41:16.956] } [18:41:16.956] ...future.frame <- base::sys.nframe() [18:41:16.956] ...future.conditions <- base::list() [18:41:16.956] ...future.rng <- base::globalenv()$.Random.seed [18:41:16.956] if (FALSE) { [18:41:16.956] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:16.956] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:16.956] } [18:41:16.956] ...future.result <- base::tryCatch({ [18:41:16.956] base::withCallingHandlers({ [18:41:16.956] ...future.value <- base::withVisible(base::local({ [18:41:16.956] do.call(function(...) { [18:41:16.956] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.956] if (!identical(...future.globals.maxSize.org, [18:41:16.956] ...future.globals.maxSize)) { [18:41:16.956] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.956] on.exit(options(oopts), add = TRUE) [18:41:16.956] } [18:41:16.956] { [18:41:16.956] lapply(seq_along(...future.elements_ii), [18:41:16.956] FUN = function(jj) { [18:41:16.956] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.956] ...future.FUN(...future.X_jj, ...) [18:41:16.956] }) [18:41:16.956] } [18:41:16.956] }, args = future.call.arguments) [18:41:16.956] })) [18:41:16.956] future::FutureResult(value = ...future.value$value, [18:41:16.956] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:16.956] ...future.rng), globalenv = if (FALSE) [18:41:16.956] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:16.956] ...future.globalenv.names)) [18:41:16.956] else NULL, started = ...future.startTime, version = "1.8") [18:41:16.956] }, condition = base::local({ [18:41:16.956] c <- base::c [18:41:16.956] inherits <- base::inherits [18:41:16.956] invokeRestart <- base::invokeRestart [18:41:16.956] length <- base::length [18:41:16.956] list <- base::list [18:41:16.956] seq.int <- base::seq.int [18:41:16.956] signalCondition <- base::signalCondition [18:41:16.956] sys.calls <- base::sys.calls [18:41:16.956] `[[` <- base::`[[` [18:41:16.956] `+` <- base::`+` [18:41:16.956] `<<-` <- base::`<<-` [18:41:16.956] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:16.956] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:16.956] 3L)] [18:41:16.956] } [18:41:16.956] function(cond) { [18:41:16.956] is_error <- inherits(cond, "error") [18:41:16.956] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:16.956] NULL) [18:41:16.956] if (is_error) { [18:41:16.956] sessionInformation <- function() { [18:41:16.956] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:16.956] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:16.956] search = base::search(), system = base::Sys.info()) [18:41:16.956] } [18:41:16.956] ...future.conditions[[length(...future.conditions) + [18:41:16.956] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:16.956] cond$call), session = sessionInformation(), [18:41:16.956] timestamp = base::Sys.time(), signaled = 0L) [18:41:16.956] signalCondition(cond) [18:41:16.956] } [18:41:16.956] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:16.956] "immediateCondition"))) { [18:41:16.956] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:16.956] ...future.conditions[[length(...future.conditions) + [18:41:16.956] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:16.956] if (TRUE && !signal) { [18:41:16.956] muffleCondition <- function (cond, pattern = "^muffle") [18:41:16.956] { [18:41:16.956] inherits <- base::inherits [18:41:16.956] invokeRestart <- base::invokeRestart [18:41:16.956] is.null <- base::is.null [18:41:16.956] muffled <- FALSE [18:41:16.956] if (inherits(cond, "message")) { [18:41:16.956] muffled <- grepl(pattern, "muffleMessage") [18:41:16.956] if (muffled) [18:41:16.956] invokeRestart("muffleMessage") [18:41:16.956] } [18:41:16.956] else if (inherits(cond, "warning")) { [18:41:16.956] muffled <- grepl(pattern, "muffleWarning") [18:41:16.956] if (muffled) [18:41:16.956] invokeRestart("muffleWarning") [18:41:16.956] } [18:41:16.956] else if (inherits(cond, "condition")) { [18:41:16.956] if (!is.null(pattern)) { [18:41:16.956] computeRestarts <- base::computeRestarts [18:41:16.956] grepl <- base::grepl [18:41:16.956] restarts <- computeRestarts(cond) [18:41:16.956] for (restart in restarts) { [18:41:16.956] name <- restart$name [18:41:16.956] if (is.null(name)) [18:41:16.956] next [18:41:16.956] if (!grepl(pattern, name)) [18:41:16.956] next [18:41:16.956] invokeRestart(restart) [18:41:16.956] muffled <- TRUE [18:41:16.956] break [18:41:16.956] } [18:41:16.956] } [18:41:16.956] } [18:41:16.956] invisible(muffled) [18:41:16.956] } [18:41:16.956] muffleCondition(cond, pattern = "^muffle") [18:41:16.956] } [18:41:16.956] } [18:41:16.956] else { [18:41:16.956] if (TRUE) { [18:41:16.956] muffleCondition <- function (cond, pattern = "^muffle") [18:41:16.956] { [18:41:16.956] inherits <- base::inherits [18:41:16.956] invokeRestart <- base::invokeRestart [18:41:16.956] is.null <- base::is.null [18:41:16.956] muffled <- FALSE [18:41:16.956] if (inherits(cond, "message")) { [18:41:16.956] muffled <- grepl(pattern, "muffleMessage") [18:41:16.956] if (muffled) [18:41:16.956] invokeRestart("muffleMessage") [18:41:16.956] } [18:41:16.956] else if (inherits(cond, "warning")) { [18:41:16.956] muffled <- grepl(pattern, "muffleWarning") [18:41:16.956] if (muffled) [18:41:16.956] invokeRestart("muffleWarning") [18:41:16.956] } [18:41:16.956] else if (inherits(cond, "condition")) { [18:41:16.956] if (!is.null(pattern)) { [18:41:16.956] computeRestarts <- base::computeRestarts [18:41:16.956] grepl <- base::grepl [18:41:16.956] restarts <- computeRestarts(cond) [18:41:16.956] for (restart in restarts) { [18:41:16.956] name <- restart$name [18:41:16.956] if (is.null(name)) [18:41:16.956] next [18:41:16.956] if (!grepl(pattern, name)) [18:41:16.956] next [18:41:16.956] invokeRestart(restart) [18:41:16.956] muffled <- TRUE [18:41:16.956] break [18:41:16.956] } [18:41:16.956] } [18:41:16.956] } [18:41:16.956] invisible(muffled) [18:41:16.956] } [18:41:16.956] muffleCondition(cond, pattern = "^muffle") [18:41:16.956] } [18:41:16.956] } [18:41:16.956] } [18:41:16.956] })) [18:41:16.956] }, error = function(ex) { [18:41:16.956] base::structure(base::list(value = NULL, visible = NULL, [18:41:16.956] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:16.956] ...future.rng), started = ...future.startTime, [18:41:16.956] finished = Sys.time(), session_uuid = NA_character_, [18:41:16.956] version = "1.8"), class = "FutureResult") [18:41:16.956] }, finally = { [18:41:16.956] if (!identical(...future.workdir, getwd())) [18:41:16.956] setwd(...future.workdir) [18:41:16.956] { [18:41:16.956] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:16.956] ...future.oldOptions$nwarnings <- NULL [18:41:16.956] } [18:41:16.956] base::options(...future.oldOptions) [18:41:16.956] if (.Platform$OS.type == "windows") { [18:41:16.956] old_names <- names(...future.oldEnvVars) [18:41:16.956] envs <- base::Sys.getenv() [18:41:16.956] names <- names(envs) [18:41:16.956] common <- intersect(names, old_names) [18:41:16.956] added <- setdiff(names, old_names) [18:41:16.956] removed <- setdiff(old_names, names) [18:41:16.956] changed <- common[...future.oldEnvVars[common] != [18:41:16.956] envs[common]] [18:41:16.956] NAMES <- toupper(changed) [18:41:16.956] args <- list() [18:41:16.956] for (kk in seq_along(NAMES)) { [18:41:16.956] name <- changed[[kk]] [18:41:16.956] NAME <- NAMES[[kk]] [18:41:16.956] if (name != NAME && is.element(NAME, old_names)) [18:41:16.956] next [18:41:16.956] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:16.956] } [18:41:16.956] NAMES <- toupper(added) [18:41:16.956] for (kk in seq_along(NAMES)) { [18:41:16.956] name <- added[[kk]] [18:41:16.956] NAME <- NAMES[[kk]] [18:41:16.956] if (name != NAME && is.element(NAME, old_names)) [18:41:16.956] next [18:41:16.956] args[[name]] <- "" [18:41:16.956] } [18:41:16.956] NAMES <- toupper(removed) [18:41:16.956] for (kk in seq_along(NAMES)) { [18:41:16.956] name <- removed[[kk]] [18:41:16.956] NAME <- NAMES[[kk]] [18:41:16.956] if (name != NAME && is.element(NAME, old_names)) [18:41:16.956] next [18:41:16.956] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:16.956] } [18:41:16.956] if (length(args) > 0) [18:41:16.956] base::do.call(base::Sys.setenv, args = args) [18:41:16.956] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:16.956] } [18:41:16.956] else { [18:41:16.956] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:16.956] } [18:41:16.956] { [18:41:16.956] if (base::length(...future.futureOptionsAdded) > [18:41:16.956] 0L) { [18:41:16.956] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:16.956] base::names(opts) <- ...future.futureOptionsAdded [18:41:16.956] base::options(opts) [18:41:16.956] } [18:41:16.956] { [18:41:16.956] { [18:41:16.956] NULL [18:41:16.956] RNGkind("Mersenne-Twister") [18:41:16.956] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:16.956] inherits = FALSE) [18:41:16.956] } [18:41:16.956] options(future.plan = NULL) [18:41:16.956] if (is.na(NA_character_)) [18:41:16.956] Sys.unsetenv("R_FUTURE_PLAN") [18:41:16.956] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:16.956] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:16.956] .init = FALSE) [18:41:16.956] } [18:41:16.956] } [18:41:16.956] } [18:41:16.956] }) [18:41:16.956] if (TRUE) { [18:41:16.956] base::sink(type = "output", split = FALSE) [18:41:16.956] if (TRUE) { [18:41:16.956] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:16.956] } [18:41:16.956] else { [18:41:16.956] ...future.result["stdout"] <- base::list(NULL) [18:41:16.956] } [18:41:16.956] base::close(...future.stdout) [18:41:16.956] ...future.stdout <- NULL [18:41:16.956] } [18:41:16.956] ...future.result$conditions <- ...future.conditions [18:41:16.956] ...future.result$finished <- base::Sys.time() [18:41:16.956] ...future.result [18:41:16.956] } [18:41:16.959] assign_globals() ... [18:41:16.960] List of 5 [18:41:16.960] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:16.960] $ future.call.arguments :List of 1 [18:41:16.960] ..$ length: int 2 [18:41:16.960] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:16.960] $ ...future.elements_ii :List of 4 [18:41:16.960] ..$ c: chr "character" [18:41:16.960] ..$ a: chr "integer" [18:41:16.960] ..$ c: chr "list" [18:41:16.960] ..$ b: chr "numeric" [18:41:16.960] $ ...future.seeds_ii : NULL [18:41:16.960] $ ...future.globals.maxSize: NULL [18:41:16.960] - attr(*, "where")=List of 5 [18:41:16.960] ..$ ...future.FUN : [18:41:16.960] ..$ future.call.arguments : [18:41:16.960] ..$ ...future.elements_ii : [18:41:16.960] ..$ ...future.seeds_ii : [18:41:16.960] ..$ ...future.globals.maxSize: [18:41:16.960] - attr(*, "resolved")= logi FALSE [18:41:16.960] - attr(*, "total_size")= num 4338 [18:41:16.960] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:16.960] - attr(*, "already-done")= logi TRUE [18:41:16.967] - copied '...future.FUN' to environment [18:41:16.967] - copied 'future.call.arguments' to environment [18:41:16.967] - copied '...future.elements_ii' to environment [18:41:16.967] - copied '...future.seeds_ii' to environment [18:41:16.967] - copied '...future.globals.maxSize' to environment [18:41:16.967] assign_globals() ... done [18:41:16.968] plan(): Setting new future strategy stack: [18:41:16.968] List of future strategies: [18:41:16.968] 1. sequential: [18:41:16.968] - args: function (..., envir = parent.frame(), workers = "") [18:41:16.968] - tweaked: FALSE [18:41:16.968] - call: NULL [18:41:16.969] plan(): nbrOfWorkers() = 1 [18:41:16.970] plan(): Setting new future strategy stack: [18:41:16.970] List of future strategies: [18:41:16.970] 1. sequential: [18:41:16.970] - args: function (..., envir = parent.frame(), workers = "") [18:41:16.970] - tweaked: FALSE [18:41:16.970] - call: plan(strategy) [18:41:16.971] plan(): nbrOfWorkers() = 1 [18:41:16.971] SequentialFuture started (and completed) [18:41:16.971] - Launch lazy future ... done [18:41:16.971] run() for 'SequentialFuture' ... done [18:41:16.971] Created future: [18:41:16.972] SequentialFuture: [18:41:16.972] Label: 'future_lapply-1' [18:41:16.972] Expression: [18:41:16.972] { [18:41:16.972] do.call(function(...) { [18:41:16.972] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:16.972] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:16.972] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:16.972] on.exit(options(oopts), add = TRUE) [18:41:16.972] } [18:41:16.972] { [18:41:16.972] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:16.972] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:16.972] ...future.FUN(...future.X_jj, ...) [18:41:16.972] }) [18:41:16.972] } [18:41:16.972] }, args = future.call.arguments) [18:41:16.972] } [18:41:16.972] Lazy evaluation: FALSE [18:41:16.972] Asynchronous evaluation: FALSE [18:41:16.972] Local evaluation: TRUE [18:41:16.972] Environment: R_GlobalEnv [18:41:16.972] Capture standard output: TRUE [18:41:16.972] Capture condition classes: 'condition' (excluding 'nothing') [18:41:16.972] Globals: 5 objects totaling 853 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 191 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:16.972] Packages: [18:41:16.972] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:16.972] Resolved: TRUE [18:41:16.972] Value: 111 bytes of class 'list' [18:41:16.972] Early signaling: FALSE [18:41:16.972] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:16.972] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:16.973] Chunk #1 of 1 ... DONE [18:41:16.973] Launching 1 futures (chunks) ... DONE [18:41:16.973] Resolving 1 futures (chunks) ... [18:41:16.973] resolve() on list ... [18:41:16.973] recursive: 0 [18:41:16.974] length: 1 [18:41:16.974] [18:41:16.974] resolved() for 'SequentialFuture' ... [18:41:16.974] - state: 'finished' [18:41:16.974] - run: TRUE [18:41:16.974] - result: 'FutureResult' [18:41:16.975] resolved() for 'SequentialFuture' ... done [18:41:16.975] Future #1 [18:41:16.975] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:16.975] - nx: 1 [18:41:16.975] - relay: TRUE [18:41:16.975] - stdout: TRUE [18:41:16.976] - signal: TRUE [18:41:16.976] - resignal: FALSE [18:41:16.976] - force: TRUE [18:41:16.976] - relayed: [n=1] FALSE [18:41:16.976] - queued futures: [n=1] FALSE [18:41:16.976] - until=1 [18:41:16.976] - relaying element #1 [18:41:16.977] - relayed: [n=1] TRUE [18:41:16.977] - queued futures: [n=1] TRUE [18:41:16.977] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:16.977] length: 0 (resolved future 1) [18:41:16.977] Relaying remaining futures [18:41:16.978] signalConditionsASAP(NULL, pos=0) ... [18:41:16.978] - nx: 1 [18:41:16.978] - relay: TRUE [18:41:16.978] - stdout: TRUE [18:41:16.978] - signal: TRUE [18:41:16.978] - resignal: FALSE [18:41:16.978] - force: TRUE [18:41:16.979] - relayed: [n=1] TRUE [18:41:16.979] - queued futures: [n=1] TRUE - flush all [18:41:16.979] - relayed: [n=1] TRUE [18:41:16.979] - queued futures: [n=1] TRUE [18:41:16.979] signalConditionsASAP(NULL, pos=0) ... done [18:41:16.979] resolve() on list ... DONE [18:41:16.980] - Number of value chunks collected: 1 [18:41:16.980] Resolving 1 futures (chunks) ... DONE [18:41:16.980] Reducing values from 1 chunks ... [18:41:16.980] - Number of values collected after concatenation: 4 [18:41:16.980] - Number of values expected: 4 [18:41:16.981] Reverse index remapping (attribute 'ordering'): [n = 4] 2, 4, 1, 3 [18:41:16.981] Reducing values from 1 chunks ... DONE [18:41:16.981] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL [18:41:16.983] future_lapply() ... [18:41:16.984] Number of chunks: 1 [18:41:16.984] Index remapping (attribute 'ordering'): [n = 4] 4, 1, 2, 3 [18:41:16.985] getGlobalsAndPackagesXApply() ... [18:41:16.985] - future.globals: TRUE [18:41:16.985] getGlobalsAndPackages() ... [18:41:16.985] Searching for globals... [18:41:16.987] - globals found: [2] 'FUN', '.Internal' [18:41:16.987] Searching for globals ... DONE [18:41:16.987] Resolving globals: FALSE [18:41:16.987] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:16.988] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:16.988] - globals: [1] 'FUN' [18:41:16.988] [18:41:16.988] getGlobalsAndPackages() ... DONE [18:41:16.988] - globals found/used: [n=1] 'FUN' [18:41:16.989] - needed namespaces: [n=0] [18:41:16.989] Finding globals ... DONE [18:41:16.989] - use_args: TRUE [18:41:16.989] - Getting '...' globals ... [18:41:16.990] resolve() on list ... [18:41:16.990] recursive: 0 [18:41:16.990] length: 1 [18:41:16.990] elements: '...' [18:41:16.990] length: 0 (resolved future 1) [18:41:16.990] resolve() on list ... DONE [18:41:16.991] - '...' content: [n=1] 'length' [18:41:16.991] List of 1 [18:41:16.991] $ ...:List of 1 [18:41:16.991] ..$ length: int 2 [18:41:16.991] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:16.991] - attr(*, "where")=List of 1 [18:41:16.991] ..$ ...: [18:41:16.991] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:16.991] - attr(*, "resolved")= logi TRUE [18:41:16.991] - attr(*, "total_size")= num NA [18:41:16.994] - Getting '...' globals ... DONE [18:41:16.994] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:16.994] List of 2 [18:41:16.994] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:16.994] $ ... :List of 1 [18:41:16.994] ..$ length: int 2 [18:41:16.994] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:16.994] - attr(*, "where")=List of 2 [18:41:16.994] ..$ ...future.FUN: [18:41:16.994] ..$ ... : [18:41:16.994] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:16.994] - attr(*, "resolved")= logi FALSE [18:41:16.994] - attr(*, "total_size")= int 4374 [18:41:16.998] Packages to be attached in all futures: [n=0] [18:41:16.998] getGlobalsAndPackagesXApply() ... DONE [18:41:16.999] Number of futures (= number of chunks): 1 [18:41:16.999] Launching 1 futures (chunks) ... [18:41:16.999] Chunk #1 of 1 ... [18:41:16.999] - Finding globals in 'X' for chunk #1 ... [18:41:16.999] getGlobalsAndPackages() ... [18:41:17.000] Searching for globals... [18:41:17.000] [18:41:17.000] Searching for globals ... DONE [18:41:17.000] - globals: [0] [18:41:17.000] getGlobalsAndPackages() ... DONE [18:41:17.000] + additional globals found: [n=0] [18:41:17.001] + additional namespaces needed: [n=0] [18:41:17.001] - Finding globals in 'X' for chunk #1 ... DONE [18:41:17.001] - seeds: [18:41:17.001] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.001] getGlobalsAndPackages() ... [18:41:17.001] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.002] Resolving globals: FALSE [18:41:17.002] Tweak future expression to call with '...' arguments ... [18:41:17.002] { [18:41:17.002] do.call(function(...) { [18:41:17.002] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.002] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:17.002] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.002] on.exit(options(oopts), add = TRUE) [18:41:17.002] } [18:41:17.002] { [18:41:17.002] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:17.002] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.002] ...future.FUN(...future.X_jj, ...) [18:41:17.002] }) [18:41:17.002] } [18:41:17.002] }, args = future.call.arguments) [18:41:17.002] } [18:41:17.002] Tweak future expression to call with '...' arguments ... DONE [18:41:17.003] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.003] [18:41:17.003] getGlobalsAndPackages() ... DONE [18:41:17.004] run() for 'Future' ... [18:41:17.004] - state: 'created' [18:41:17.004] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:17.004] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:17.005] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:17.005] - Field: 'label' [18:41:17.005] - Field: 'local' [18:41:17.005] - Field: 'owner' [18:41:17.005] - Field: 'envir' [18:41:17.006] - Field: 'packages' [18:41:17.006] - Field: 'gc' [18:41:17.006] - Field: 'conditions' [18:41:17.006] - Field: 'expr' [18:41:17.006] - Field: 'uuid' [18:41:17.006] - Field: 'seed' [18:41:17.007] - Field: 'version' [18:41:17.007] - Field: 'result' [18:41:17.007] - Field: 'asynchronous' [18:41:17.007] - Field: 'calls' [18:41:17.007] - Field: 'globals' [18:41:17.007] - Field: 'stdout' [18:41:17.008] - Field: 'earlySignal' [18:41:17.008] - Field: 'lazy' [18:41:17.008] - Field: 'state' [18:41:17.008] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:17.008] - Launch lazy future ... [18:41:17.008] Packages needed by the future expression (n = 0): [18:41:17.009] Packages needed by future strategies (n = 0): [18:41:17.009] { [18:41:17.009] { [18:41:17.009] { [18:41:17.009] ...future.startTime <- base::Sys.time() [18:41:17.009] { [18:41:17.009] { [18:41:17.009] { [18:41:17.009] base::local({ [18:41:17.009] has_future <- base::requireNamespace("future", [18:41:17.009] quietly = TRUE) [18:41:17.009] if (has_future) { [18:41:17.009] ns <- base::getNamespace("future") [18:41:17.009] version <- ns[[".package"]][["version"]] [18:41:17.009] if (is.null(version)) [18:41:17.009] version <- utils::packageVersion("future") [18:41:17.009] } [18:41:17.009] else { [18:41:17.009] version <- NULL [18:41:17.009] } [18:41:17.009] if (!has_future || version < "1.8.0") { [18:41:17.009] info <- base::c(r_version = base::gsub("R version ", [18:41:17.009] "", base::R.version$version.string), [18:41:17.009] platform = base::sprintf("%s (%s-bit)", [18:41:17.009] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:17.009] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:17.009] "release", "version")], collapse = " "), [18:41:17.009] hostname = base::Sys.info()[["nodename"]]) [18:41:17.009] info <- base::sprintf("%s: %s", base::names(info), [18:41:17.009] info) [18:41:17.009] info <- base::paste(info, collapse = "; ") [18:41:17.009] if (!has_future) { [18:41:17.009] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:17.009] info) [18:41:17.009] } [18:41:17.009] else { [18:41:17.009] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:17.009] info, version) [18:41:17.009] } [18:41:17.009] base::stop(msg) [18:41:17.009] } [18:41:17.009] }) [18:41:17.009] } [18:41:17.009] ...future.strategy.old <- future::plan("list") [18:41:17.009] options(future.plan = NULL) [18:41:17.009] Sys.unsetenv("R_FUTURE_PLAN") [18:41:17.009] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:17.009] } [18:41:17.009] ...future.workdir <- getwd() [18:41:17.009] } [18:41:17.009] ...future.oldOptions <- base::as.list(base::.Options) [18:41:17.009] ...future.oldEnvVars <- base::Sys.getenv() [18:41:17.009] } [18:41:17.009] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:17.009] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:17.009] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:17.009] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:17.009] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:17.009] future.stdout.windows.reencode = NULL, width = 80L) [18:41:17.009] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:17.009] base::names(...future.oldOptions)) [18:41:17.009] } [18:41:17.009] if (FALSE) { [18:41:17.009] } [18:41:17.009] else { [18:41:17.009] if (TRUE) { [18:41:17.009] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:17.009] open = "w") [18:41:17.009] } [18:41:17.009] else { [18:41:17.009] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:17.009] windows = "NUL", "/dev/null"), open = "w") [18:41:17.009] } [18:41:17.009] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:17.009] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:17.009] base::sink(type = "output", split = FALSE) [18:41:17.009] base::close(...future.stdout) [18:41:17.009] }, add = TRUE) [18:41:17.009] } [18:41:17.009] ...future.frame <- base::sys.nframe() [18:41:17.009] ...future.conditions <- base::list() [18:41:17.009] ...future.rng <- base::globalenv()$.Random.seed [18:41:17.009] if (FALSE) { [18:41:17.009] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:17.009] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:17.009] } [18:41:17.009] ...future.result <- base::tryCatch({ [18:41:17.009] base::withCallingHandlers({ [18:41:17.009] ...future.value <- base::withVisible(base::local({ [18:41:17.009] do.call(function(...) { [18:41:17.009] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.009] if (!identical(...future.globals.maxSize.org, [18:41:17.009] ...future.globals.maxSize)) { [18:41:17.009] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.009] on.exit(options(oopts), add = TRUE) [18:41:17.009] } [18:41:17.009] { [18:41:17.009] lapply(seq_along(...future.elements_ii), [18:41:17.009] FUN = function(jj) { [18:41:17.009] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.009] ...future.FUN(...future.X_jj, ...) [18:41:17.009] }) [18:41:17.009] } [18:41:17.009] }, args = future.call.arguments) [18:41:17.009] })) [18:41:17.009] future::FutureResult(value = ...future.value$value, [18:41:17.009] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:17.009] ...future.rng), globalenv = if (FALSE) [18:41:17.009] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:17.009] ...future.globalenv.names)) [18:41:17.009] else NULL, started = ...future.startTime, version = "1.8") [18:41:17.009] }, condition = base::local({ [18:41:17.009] c <- base::c [18:41:17.009] inherits <- base::inherits [18:41:17.009] invokeRestart <- base::invokeRestart [18:41:17.009] length <- base::length [18:41:17.009] list <- base::list [18:41:17.009] seq.int <- base::seq.int [18:41:17.009] signalCondition <- base::signalCondition [18:41:17.009] sys.calls <- base::sys.calls [18:41:17.009] `[[` <- base::`[[` [18:41:17.009] `+` <- base::`+` [18:41:17.009] `<<-` <- base::`<<-` [18:41:17.009] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:17.009] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:17.009] 3L)] [18:41:17.009] } [18:41:17.009] function(cond) { [18:41:17.009] is_error <- inherits(cond, "error") [18:41:17.009] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:17.009] NULL) [18:41:17.009] if (is_error) { [18:41:17.009] sessionInformation <- function() { [18:41:17.009] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:17.009] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:17.009] search = base::search(), system = base::Sys.info()) [18:41:17.009] } [18:41:17.009] ...future.conditions[[length(...future.conditions) + [18:41:17.009] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:17.009] cond$call), session = sessionInformation(), [18:41:17.009] timestamp = base::Sys.time(), signaled = 0L) [18:41:17.009] signalCondition(cond) [18:41:17.009] } [18:41:17.009] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:17.009] "immediateCondition"))) { [18:41:17.009] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:17.009] ...future.conditions[[length(...future.conditions) + [18:41:17.009] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:17.009] if (TRUE && !signal) { [18:41:17.009] muffleCondition <- function (cond, pattern = "^muffle") [18:41:17.009] { [18:41:17.009] inherits <- base::inherits [18:41:17.009] invokeRestart <- base::invokeRestart [18:41:17.009] is.null <- base::is.null [18:41:17.009] muffled <- FALSE [18:41:17.009] if (inherits(cond, "message")) { [18:41:17.009] muffled <- grepl(pattern, "muffleMessage") [18:41:17.009] if (muffled) [18:41:17.009] invokeRestart("muffleMessage") [18:41:17.009] } [18:41:17.009] else if (inherits(cond, "warning")) { [18:41:17.009] muffled <- grepl(pattern, "muffleWarning") [18:41:17.009] if (muffled) [18:41:17.009] invokeRestart("muffleWarning") [18:41:17.009] } [18:41:17.009] else if (inherits(cond, "condition")) { [18:41:17.009] if (!is.null(pattern)) { [18:41:17.009] computeRestarts <- base::computeRestarts [18:41:17.009] grepl <- base::grepl [18:41:17.009] restarts <- computeRestarts(cond) [18:41:17.009] for (restart in restarts) { [18:41:17.009] name <- restart$name [18:41:17.009] if (is.null(name)) [18:41:17.009] next [18:41:17.009] if (!grepl(pattern, name)) [18:41:17.009] next [18:41:17.009] invokeRestart(restart) [18:41:17.009] muffled <- TRUE [18:41:17.009] break [18:41:17.009] } [18:41:17.009] } [18:41:17.009] } [18:41:17.009] invisible(muffled) [18:41:17.009] } [18:41:17.009] muffleCondition(cond, pattern = "^muffle") [18:41:17.009] } [18:41:17.009] } [18:41:17.009] else { [18:41:17.009] if (TRUE) { [18:41:17.009] muffleCondition <- function (cond, pattern = "^muffle") [18:41:17.009] { [18:41:17.009] inherits <- base::inherits [18:41:17.009] invokeRestart <- base::invokeRestart [18:41:17.009] is.null <- base::is.null [18:41:17.009] muffled <- FALSE [18:41:17.009] if (inherits(cond, "message")) { [18:41:17.009] muffled <- grepl(pattern, "muffleMessage") [18:41:17.009] if (muffled) [18:41:17.009] invokeRestart("muffleMessage") [18:41:17.009] } [18:41:17.009] else if (inherits(cond, "warning")) { [18:41:17.009] muffled <- grepl(pattern, "muffleWarning") [18:41:17.009] if (muffled) [18:41:17.009] invokeRestart("muffleWarning") [18:41:17.009] } [18:41:17.009] else if (inherits(cond, "condition")) { [18:41:17.009] if (!is.null(pattern)) { [18:41:17.009] computeRestarts <- base::computeRestarts [18:41:17.009] grepl <- base::grepl [18:41:17.009] restarts <- computeRestarts(cond) [18:41:17.009] for (restart in restarts) { [18:41:17.009] name <- restart$name [18:41:17.009] if (is.null(name)) [18:41:17.009] next [18:41:17.009] if (!grepl(pattern, name)) [18:41:17.009] next [18:41:17.009] invokeRestart(restart) [18:41:17.009] muffled <- TRUE [18:41:17.009] break [18:41:17.009] } [18:41:17.009] } [18:41:17.009] } [18:41:17.009] invisible(muffled) [18:41:17.009] } [18:41:17.009] muffleCondition(cond, pattern = "^muffle") [18:41:17.009] } [18:41:17.009] } [18:41:17.009] } [18:41:17.009] })) [18:41:17.009] }, error = function(ex) { [18:41:17.009] base::structure(base::list(value = NULL, visible = NULL, [18:41:17.009] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:17.009] ...future.rng), started = ...future.startTime, [18:41:17.009] finished = Sys.time(), session_uuid = NA_character_, [18:41:17.009] version = "1.8"), class = "FutureResult") [18:41:17.009] }, finally = { [18:41:17.009] if (!identical(...future.workdir, getwd())) [18:41:17.009] setwd(...future.workdir) [18:41:17.009] { [18:41:17.009] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:17.009] ...future.oldOptions$nwarnings <- NULL [18:41:17.009] } [18:41:17.009] base::options(...future.oldOptions) [18:41:17.009] if (.Platform$OS.type == "windows") { [18:41:17.009] old_names <- names(...future.oldEnvVars) [18:41:17.009] envs <- base::Sys.getenv() [18:41:17.009] names <- names(envs) [18:41:17.009] common <- intersect(names, old_names) [18:41:17.009] added <- setdiff(names, old_names) [18:41:17.009] removed <- setdiff(old_names, names) [18:41:17.009] changed <- common[...future.oldEnvVars[common] != [18:41:17.009] envs[common]] [18:41:17.009] NAMES <- toupper(changed) [18:41:17.009] args <- list() [18:41:17.009] for (kk in seq_along(NAMES)) { [18:41:17.009] name <- changed[[kk]] [18:41:17.009] NAME <- NAMES[[kk]] [18:41:17.009] if (name != NAME && is.element(NAME, old_names)) [18:41:17.009] next [18:41:17.009] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:17.009] } [18:41:17.009] NAMES <- toupper(added) [18:41:17.009] for (kk in seq_along(NAMES)) { [18:41:17.009] name <- added[[kk]] [18:41:17.009] NAME <- NAMES[[kk]] [18:41:17.009] if (name != NAME && is.element(NAME, old_names)) [18:41:17.009] next [18:41:17.009] args[[name]] <- "" [18:41:17.009] } [18:41:17.009] NAMES <- toupper(removed) [18:41:17.009] for (kk in seq_along(NAMES)) { [18:41:17.009] name <- removed[[kk]] [18:41:17.009] NAME <- NAMES[[kk]] [18:41:17.009] if (name != NAME && is.element(NAME, old_names)) [18:41:17.009] next [18:41:17.009] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:17.009] } [18:41:17.009] if (length(args) > 0) [18:41:17.009] base::do.call(base::Sys.setenv, args = args) [18:41:17.009] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:17.009] } [18:41:17.009] else { [18:41:17.009] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:17.009] } [18:41:17.009] { [18:41:17.009] if (base::length(...future.futureOptionsAdded) > [18:41:17.009] 0L) { [18:41:17.009] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:17.009] base::names(opts) <- ...future.futureOptionsAdded [18:41:17.009] base::options(opts) [18:41:17.009] } [18:41:17.009] { [18:41:17.009] { [18:41:17.009] NULL [18:41:17.009] RNGkind("Mersenne-Twister") [18:41:17.009] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:17.009] inherits = FALSE) [18:41:17.009] } [18:41:17.009] options(future.plan = NULL) [18:41:17.009] if (is.na(NA_character_)) [18:41:17.009] Sys.unsetenv("R_FUTURE_PLAN") [18:41:17.009] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:17.009] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:17.009] .init = FALSE) [18:41:17.009] } [18:41:17.009] } [18:41:17.009] } [18:41:17.009] }) [18:41:17.009] if (TRUE) { [18:41:17.009] base::sink(type = "output", split = FALSE) [18:41:17.009] if (TRUE) { [18:41:17.009] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:17.009] } [18:41:17.009] else { [18:41:17.009] ...future.result["stdout"] <- base::list(NULL) [18:41:17.009] } [18:41:17.009] base::close(...future.stdout) [18:41:17.009] ...future.stdout <- NULL [18:41:17.009] } [18:41:17.009] ...future.result$conditions <- ...future.conditions [18:41:17.009] ...future.result$finished <- base::Sys.time() [18:41:17.009] ...future.result [18:41:17.009] } [18:41:17.013] assign_globals() ... [18:41:17.013] List of 5 [18:41:17.013] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:17.013] $ future.call.arguments :List of 1 [18:41:17.013] ..$ length: int 2 [18:41:17.013] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:17.013] $ ...future.elements_ii :List of 4 [18:41:17.013] ..$ c: chr "list" [18:41:17.013] ..$ a: chr "integer" [18:41:17.013] ..$ b: chr "numeric" [18:41:17.013] ..$ c: chr "character" [18:41:17.013] $ ...future.seeds_ii : NULL [18:41:17.013] $ ...future.globals.maxSize: NULL [18:41:17.013] - attr(*, "where")=List of 5 [18:41:17.013] ..$ ...future.FUN : [18:41:17.013] ..$ future.call.arguments : [18:41:17.013] ..$ ...future.elements_ii : [18:41:17.013] ..$ ...future.seeds_ii : [18:41:17.013] ..$ ...future.globals.maxSize: [18:41:17.013] - attr(*, "resolved")= logi FALSE [18:41:17.013] - attr(*, "total_size")= num 4374 [18:41:17.013] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:17.013] - attr(*, "already-done")= logi TRUE [18:41:17.020] - copied '...future.FUN' to environment [18:41:17.020] - copied 'future.call.arguments' to environment [18:41:17.020] - copied '...future.elements_ii' to environment [18:41:17.021] - copied '...future.seeds_ii' to environment [18:41:17.021] - copied '...future.globals.maxSize' to environment [18:41:17.021] assign_globals() ... done [18:41:17.021] plan(): Setting new future strategy stack: [18:41:17.021] List of future strategies: [18:41:17.021] 1. sequential: [18:41:17.021] - args: function (..., envir = parent.frame(), workers = "") [18:41:17.021] - tweaked: FALSE [18:41:17.021] - call: NULL [18:41:17.022] plan(): nbrOfWorkers() = 1 [18:41:17.023] plan(): Setting new future strategy stack: [18:41:17.023] List of future strategies: [18:41:17.023] 1. sequential: [18:41:17.023] - args: function (..., envir = parent.frame(), workers = "") [18:41:17.023] - tweaked: FALSE [18:41:17.023] - call: plan(strategy) [18:41:17.024] plan(): nbrOfWorkers() = 1 [18:41:17.024] SequentialFuture started (and completed) [18:41:17.024] - Launch lazy future ... done [18:41:17.025] run() for 'SequentialFuture' ... done [18:41:17.025] Created future: [18:41:17.025] SequentialFuture: [18:41:17.025] Label: 'future_lapply-1' [18:41:17.025] Expression: [18:41:17.025] { [18:41:17.025] do.call(function(...) { [18:41:17.025] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.025] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:17.025] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.025] on.exit(options(oopts), add = TRUE) [18:41:17.025] } [18:41:17.025] { [18:41:17.025] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:17.025] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.025] ...future.FUN(...future.X_jj, ...) [18:41:17.025] }) [18:41:17.025] } [18:41:17.025] }, args = future.call.arguments) [18:41:17.025] } [18:41:17.025] Lazy evaluation: FALSE [18:41:17.025] Asynchronous evaluation: FALSE [18:41:17.025] Local evaluation: TRUE [18:41:17.025] Environment: R_GlobalEnv [18:41:17.025] Capture standard output: TRUE [18:41:17.025] Capture condition classes: 'condition' (excluding 'nothing') [18:41:17.025] Globals: 5 objects totaling 853 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 191 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:17.025] Packages: [18:41:17.025] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:17.025] Resolved: TRUE [18:41:17.025] Value: 111 bytes of class 'list' [18:41:17.025] Early signaling: FALSE [18:41:17.025] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:17.025] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:17.026] Chunk #1 of 1 ... DONE [18:41:17.026] Launching 1 futures (chunks) ... DONE [18:41:17.026] Resolving 1 futures (chunks) ... [18:41:17.027] resolve() on list ... [18:41:17.027] recursive: 0 [18:41:17.027] length: 1 [18:41:17.027] [18:41:17.027] resolved() for 'SequentialFuture' ... [18:41:17.027] - state: 'finished' [18:41:17.028] - run: TRUE [18:41:17.028] - result: 'FutureResult' [18:41:17.028] resolved() for 'SequentialFuture' ... done [18:41:17.028] Future #1 [18:41:17.028] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:17.029] - nx: 1 [18:41:17.029] - relay: TRUE [18:41:17.029] - stdout: TRUE [18:41:17.029] - signal: TRUE [18:41:17.029] - resignal: FALSE [18:41:17.029] - force: TRUE [18:41:17.029] - relayed: [n=1] FALSE [18:41:17.030] - queued futures: [n=1] FALSE [18:41:17.030] - until=1 [18:41:17.030] - relaying element #1 [18:41:17.030] - relayed: [n=1] TRUE [18:41:17.030] - queued futures: [n=1] TRUE [18:41:17.030] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:17.031] length: 0 (resolved future 1) [18:41:17.031] Relaying remaining futures [18:41:17.031] signalConditionsASAP(NULL, pos=0) ... [18:41:17.031] - nx: 1 [18:41:17.031] - relay: TRUE [18:41:17.031] - stdout: TRUE [18:41:17.032] - signal: TRUE [18:41:17.032] - resignal: FALSE [18:41:17.032] - force: TRUE [18:41:17.032] - relayed: [n=1] TRUE [18:41:17.032] - queued futures: [n=1] TRUE - flush all [18:41:17.032] - relayed: [n=1] TRUE [18:41:17.033] - queued futures: [n=1] TRUE [18:41:17.033] signalConditionsASAP(NULL, pos=0) ... done [18:41:17.033] resolve() on list ... DONE [18:41:17.033] - Number of value chunks collected: 1 [18:41:17.033] Resolving 1 futures (chunks) ... DONE [18:41:17.033] Reducing values from 1 chunks ... [18:41:17.034] - Number of values collected after concatenation: 4 [18:41:17.034] - Number of values expected: 4 [18:41:17.034] Reverse index remapping (attribute 'ordering'): [n = 4] 2, 3, 4, 1 [18:41:17.034] Reducing values from 1 chunks ... DONE [18:41:17.034] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL - future_lapply(x, FUN = base::vector, ...) ... [18:41:17.037] future_lapply() ... [18:41:17.038] Number of chunks: 1 [18:41:17.038] Index remapping (attribute 'ordering'): [n = 4] 1, 3, 2, 4 [18:41:17.038] getGlobalsAndPackagesXApply() ... [18:41:17.038] - future.globals: TRUE [18:41:17.038] getGlobalsAndPackages() ... [18:41:17.039] Searching for globals... [18:41:17.040] - globals found: [2] 'FUN', '.Internal' [18:41:17.040] Searching for globals ... DONE [18:41:17.040] Resolving globals: FALSE [18:41:17.041] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:17.041] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:17.041] - globals: [1] 'FUN' [18:41:17.042] [18:41:17.042] getGlobalsAndPackages() ... DONE [18:41:17.042] - globals found/used: [n=1] 'FUN' [18:41:17.042] - needed namespaces: [n=0] [18:41:17.042] Finding globals ... DONE [18:41:17.042] - use_args: TRUE [18:41:17.043] - Getting '...' globals ... [18:41:17.043] resolve() on list ... [18:41:17.043] recursive: 0 [18:41:17.043] length: 1 [18:41:17.043] elements: '...' [18:41:17.044] length: 0 (resolved future 1) [18:41:17.044] resolve() on list ... DONE [18:41:17.044] - '...' content: [n=1] 'length' [18:41:17.044] List of 1 [18:41:17.044] $ ...:List of 1 [18:41:17.044] ..$ length: int 2 [18:41:17.044] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:17.044] - attr(*, "where")=List of 1 [18:41:17.044] ..$ ...: [18:41:17.044] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:17.044] - attr(*, "resolved")= logi TRUE [18:41:17.044] - attr(*, "total_size")= num NA [18:41:17.049] - Getting '...' globals ... DONE [18:41:17.050] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:17.050] List of 2 [18:41:17.050] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:17.050] $ ... :List of 1 [18:41:17.050] ..$ length: int 2 [18:41:17.050] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:17.050] - attr(*, "where")=List of 2 [18:41:17.050] ..$ ...future.FUN: [18:41:17.050] ..$ ... : [18:41:17.050] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:17.050] - attr(*, "resolved")= logi FALSE [18:41:17.050] - attr(*, "total_size")= int 4456 [18:41:17.053] Packages to be attached in all futures: [n=0] [18:41:17.054] getGlobalsAndPackagesXApply() ... DONE [18:41:17.054] Number of futures (= number of chunks): 1 [18:41:17.054] Launching 1 futures (chunks) ... [18:41:17.054] Chunk #1 of 1 ... [18:41:17.054] - Finding globals in 'X' for chunk #1 ... [18:41:17.055] getGlobalsAndPackages() ... [18:41:17.055] Searching for globals... [18:41:17.055] [18:41:17.055] Searching for globals ... DONE [18:41:17.055] - globals: [0] [18:41:17.055] getGlobalsAndPackages() ... DONE [18:41:17.056] + additional globals found: [n=0] [18:41:17.056] + additional namespaces needed: [n=0] [18:41:17.056] - Finding globals in 'X' for chunk #1 ... DONE [18:41:17.056] - seeds: [18:41:17.056] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.056] getGlobalsAndPackages() ... [18:41:17.057] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.057] Resolving globals: FALSE [18:41:17.057] Tweak future expression to call with '...' arguments ... [18:41:17.057] { [18:41:17.057] do.call(function(...) { [18:41:17.057] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.057] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:17.057] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.057] on.exit(options(oopts), add = TRUE) [18:41:17.057] } [18:41:17.057] { [18:41:17.057] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:17.057] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.057] ...future.FUN(...future.X_jj, ...) [18:41:17.057] }) [18:41:17.057] } [18:41:17.057] }, args = future.call.arguments) [18:41:17.057] } [18:41:17.058] Tweak future expression to call with '...' arguments ... DONE [18:41:17.058] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.058] [18:41:17.058] getGlobalsAndPackages() ... DONE [18:41:17.059] run() for 'Future' ... [18:41:17.059] - state: 'created' [18:41:17.059] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:17.060] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:17.060] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:17.060] - Field: 'label' [18:41:17.060] - Field: 'local' [18:41:17.060] - Field: 'owner' [18:41:17.060] - Field: 'envir' [18:41:17.061] - Field: 'packages' [18:41:17.061] - Field: 'gc' [18:41:17.061] - Field: 'conditions' [18:41:17.061] - Field: 'expr' [18:41:17.061] - Field: 'uuid' [18:41:17.061] - Field: 'seed' [18:41:17.062] - Field: 'version' [18:41:17.062] - Field: 'result' [18:41:17.062] - Field: 'asynchronous' [18:41:17.062] - Field: 'calls' [18:41:17.062] - Field: 'globals' [18:41:17.062] - Field: 'stdout' [18:41:17.063] - Field: 'earlySignal' [18:41:17.063] - Field: 'lazy' [18:41:17.063] - Field: 'state' [18:41:17.063] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:17.063] - Launch lazy future ... [18:41:17.064] Packages needed by the future expression (n = 0): [18:41:17.064] Packages needed by future strategies (n = 0): [18:41:17.064] { [18:41:17.064] { [18:41:17.064] { [18:41:17.064] ...future.startTime <- base::Sys.time() [18:41:17.064] { [18:41:17.064] { [18:41:17.064] { [18:41:17.064] base::local({ [18:41:17.064] has_future <- base::requireNamespace("future", [18:41:17.064] quietly = TRUE) [18:41:17.064] if (has_future) { [18:41:17.064] ns <- base::getNamespace("future") [18:41:17.064] version <- ns[[".package"]][["version"]] [18:41:17.064] if (is.null(version)) [18:41:17.064] version <- utils::packageVersion("future") [18:41:17.064] } [18:41:17.064] else { [18:41:17.064] version <- NULL [18:41:17.064] } [18:41:17.064] if (!has_future || version < "1.8.0") { [18:41:17.064] info <- base::c(r_version = base::gsub("R version ", [18:41:17.064] "", base::R.version$version.string), [18:41:17.064] platform = base::sprintf("%s (%s-bit)", [18:41:17.064] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:17.064] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:17.064] "release", "version")], collapse = " "), [18:41:17.064] hostname = base::Sys.info()[["nodename"]]) [18:41:17.064] info <- base::sprintf("%s: %s", base::names(info), [18:41:17.064] info) [18:41:17.064] info <- base::paste(info, collapse = "; ") [18:41:17.064] if (!has_future) { [18:41:17.064] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:17.064] info) [18:41:17.064] } [18:41:17.064] else { [18:41:17.064] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:17.064] info, version) [18:41:17.064] } [18:41:17.064] base::stop(msg) [18:41:17.064] } [18:41:17.064] }) [18:41:17.064] } [18:41:17.064] ...future.strategy.old <- future::plan("list") [18:41:17.064] options(future.plan = NULL) [18:41:17.064] Sys.unsetenv("R_FUTURE_PLAN") [18:41:17.064] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:17.064] } [18:41:17.064] ...future.workdir <- getwd() [18:41:17.064] } [18:41:17.064] ...future.oldOptions <- base::as.list(base::.Options) [18:41:17.064] ...future.oldEnvVars <- base::Sys.getenv() [18:41:17.064] } [18:41:17.064] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:17.064] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:17.064] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:17.064] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:17.064] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:17.064] future.stdout.windows.reencode = NULL, width = 80L) [18:41:17.064] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:17.064] base::names(...future.oldOptions)) [18:41:17.064] } [18:41:17.064] if (FALSE) { [18:41:17.064] } [18:41:17.064] else { [18:41:17.064] if (TRUE) { [18:41:17.064] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:17.064] open = "w") [18:41:17.064] } [18:41:17.064] else { [18:41:17.064] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:17.064] windows = "NUL", "/dev/null"), open = "w") [18:41:17.064] } [18:41:17.064] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:17.064] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:17.064] base::sink(type = "output", split = FALSE) [18:41:17.064] base::close(...future.stdout) [18:41:17.064] }, add = TRUE) [18:41:17.064] } [18:41:17.064] ...future.frame <- base::sys.nframe() [18:41:17.064] ...future.conditions <- base::list() [18:41:17.064] ...future.rng <- base::globalenv()$.Random.seed [18:41:17.064] if (FALSE) { [18:41:17.064] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:17.064] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:17.064] } [18:41:17.064] ...future.result <- base::tryCatch({ [18:41:17.064] base::withCallingHandlers({ [18:41:17.064] ...future.value <- base::withVisible(base::local({ [18:41:17.064] do.call(function(...) { [18:41:17.064] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.064] if (!identical(...future.globals.maxSize.org, [18:41:17.064] ...future.globals.maxSize)) { [18:41:17.064] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.064] on.exit(options(oopts), add = TRUE) [18:41:17.064] } [18:41:17.064] { [18:41:17.064] lapply(seq_along(...future.elements_ii), [18:41:17.064] FUN = function(jj) { [18:41:17.064] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.064] ...future.FUN(...future.X_jj, ...) [18:41:17.064] }) [18:41:17.064] } [18:41:17.064] }, args = future.call.arguments) [18:41:17.064] })) [18:41:17.064] future::FutureResult(value = ...future.value$value, [18:41:17.064] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:17.064] ...future.rng), globalenv = if (FALSE) [18:41:17.064] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:17.064] ...future.globalenv.names)) [18:41:17.064] else NULL, started = ...future.startTime, version = "1.8") [18:41:17.064] }, condition = base::local({ [18:41:17.064] c <- base::c [18:41:17.064] inherits <- base::inherits [18:41:17.064] invokeRestart <- base::invokeRestart [18:41:17.064] length <- base::length [18:41:17.064] list <- base::list [18:41:17.064] seq.int <- base::seq.int [18:41:17.064] signalCondition <- base::signalCondition [18:41:17.064] sys.calls <- base::sys.calls [18:41:17.064] `[[` <- base::`[[` [18:41:17.064] `+` <- base::`+` [18:41:17.064] `<<-` <- base::`<<-` [18:41:17.064] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:17.064] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:17.064] 3L)] [18:41:17.064] } [18:41:17.064] function(cond) { [18:41:17.064] is_error <- inherits(cond, "error") [18:41:17.064] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:17.064] NULL) [18:41:17.064] if (is_error) { [18:41:17.064] sessionInformation <- function() { [18:41:17.064] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:17.064] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:17.064] search = base::search(), system = base::Sys.info()) [18:41:17.064] } [18:41:17.064] ...future.conditions[[length(...future.conditions) + [18:41:17.064] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:17.064] cond$call), session = sessionInformation(), [18:41:17.064] timestamp = base::Sys.time(), signaled = 0L) [18:41:17.064] signalCondition(cond) [18:41:17.064] } [18:41:17.064] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:17.064] "immediateCondition"))) { [18:41:17.064] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:17.064] ...future.conditions[[length(...future.conditions) + [18:41:17.064] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:17.064] if (TRUE && !signal) { [18:41:17.064] muffleCondition <- function (cond, pattern = "^muffle") [18:41:17.064] { [18:41:17.064] inherits <- base::inherits [18:41:17.064] invokeRestart <- base::invokeRestart [18:41:17.064] is.null <- base::is.null [18:41:17.064] muffled <- FALSE [18:41:17.064] if (inherits(cond, "message")) { [18:41:17.064] muffled <- grepl(pattern, "muffleMessage") [18:41:17.064] if (muffled) [18:41:17.064] invokeRestart("muffleMessage") [18:41:17.064] } [18:41:17.064] else if (inherits(cond, "warning")) { [18:41:17.064] muffled <- grepl(pattern, "muffleWarning") [18:41:17.064] if (muffled) [18:41:17.064] invokeRestart("muffleWarning") [18:41:17.064] } [18:41:17.064] else if (inherits(cond, "condition")) { [18:41:17.064] if (!is.null(pattern)) { [18:41:17.064] computeRestarts <- base::computeRestarts [18:41:17.064] grepl <- base::grepl [18:41:17.064] restarts <- computeRestarts(cond) [18:41:17.064] for (restart in restarts) { [18:41:17.064] name <- restart$name [18:41:17.064] if (is.null(name)) [18:41:17.064] next [18:41:17.064] if (!grepl(pattern, name)) [18:41:17.064] next [18:41:17.064] invokeRestart(restart) [18:41:17.064] muffled <- TRUE [18:41:17.064] break [18:41:17.064] } [18:41:17.064] } [18:41:17.064] } [18:41:17.064] invisible(muffled) [18:41:17.064] } [18:41:17.064] muffleCondition(cond, pattern = "^muffle") [18:41:17.064] } [18:41:17.064] } [18:41:17.064] else { [18:41:17.064] if (TRUE) { [18:41:17.064] muffleCondition <- function (cond, pattern = "^muffle") [18:41:17.064] { [18:41:17.064] inherits <- base::inherits [18:41:17.064] invokeRestart <- base::invokeRestart [18:41:17.064] is.null <- base::is.null [18:41:17.064] muffled <- FALSE [18:41:17.064] if (inherits(cond, "message")) { [18:41:17.064] muffled <- grepl(pattern, "muffleMessage") [18:41:17.064] if (muffled) [18:41:17.064] invokeRestart("muffleMessage") [18:41:17.064] } [18:41:17.064] else if (inherits(cond, "warning")) { [18:41:17.064] muffled <- grepl(pattern, "muffleWarning") [18:41:17.064] if (muffled) [18:41:17.064] invokeRestart("muffleWarning") [18:41:17.064] } [18:41:17.064] else if (inherits(cond, "condition")) { [18:41:17.064] if (!is.null(pattern)) { [18:41:17.064] computeRestarts <- base::computeRestarts [18:41:17.064] grepl <- base::grepl [18:41:17.064] restarts <- computeRestarts(cond) [18:41:17.064] for (restart in restarts) { [18:41:17.064] name <- restart$name [18:41:17.064] if (is.null(name)) [18:41:17.064] next [18:41:17.064] if (!grepl(pattern, name)) [18:41:17.064] next [18:41:17.064] invokeRestart(restart) [18:41:17.064] muffled <- TRUE [18:41:17.064] break [18:41:17.064] } [18:41:17.064] } [18:41:17.064] } [18:41:17.064] invisible(muffled) [18:41:17.064] } [18:41:17.064] muffleCondition(cond, pattern = "^muffle") [18:41:17.064] } [18:41:17.064] } [18:41:17.064] } [18:41:17.064] })) [18:41:17.064] }, error = function(ex) { [18:41:17.064] base::structure(base::list(value = NULL, visible = NULL, [18:41:17.064] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:17.064] ...future.rng), started = ...future.startTime, [18:41:17.064] finished = Sys.time(), session_uuid = NA_character_, [18:41:17.064] version = "1.8"), class = "FutureResult") [18:41:17.064] }, finally = { [18:41:17.064] if (!identical(...future.workdir, getwd())) [18:41:17.064] setwd(...future.workdir) [18:41:17.064] { [18:41:17.064] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:17.064] ...future.oldOptions$nwarnings <- NULL [18:41:17.064] } [18:41:17.064] base::options(...future.oldOptions) [18:41:17.064] if (.Platform$OS.type == "windows") { [18:41:17.064] old_names <- names(...future.oldEnvVars) [18:41:17.064] envs <- base::Sys.getenv() [18:41:17.064] names <- names(envs) [18:41:17.064] common <- intersect(names, old_names) [18:41:17.064] added <- setdiff(names, old_names) [18:41:17.064] removed <- setdiff(old_names, names) [18:41:17.064] changed <- common[...future.oldEnvVars[common] != [18:41:17.064] envs[common]] [18:41:17.064] NAMES <- toupper(changed) [18:41:17.064] args <- list() [18:41:17.064] for (kk in seq_along(NAMES)) { [18:41:17.064] name <- changed[[kk]] [18:41:17.064] NAME <- NAMES[[kk]] [18:41:17.064] if (name != NAME && is.element(NAME, old_names)) [18:41:17.064] next [18:41:17.064] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:17.064] } [18:41:17.064] NAMES <- toupper(added) [18:41:17.064] for (kk in seq_along(NAMES)) { [18:41:17.064] name <- added[[kk]] [18:41:17.064] NAME <- NAMES[[kk]] [18:41:17.064] if (name != NAME && is.element(NAME, old_names)) [18:41:17.064] next [18:41:17.064] args[[name]] <- "" [18:41:17.064] } [18:41:17.064] NAMES <- toupper(removed) [18:41:17.064] for (kk in seq_along(NAMES)) { [18:41:17.064] name <- removed[[kk]] [18:41:17.064] NAME <- NAMES[[kk]] [18:41:17.064] if (name != NAME && is.element(NAME, old_names)) [18:41:17.064] next [18:41:17.064] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:17.064] } [18:41:17.064] if (length(args) > 0) [18:41:17.064] base::do.call(base::Sys.setenv, args = args) [18:41:17.064] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:17.064] } [18:41:17.064] else { [18:41:17.064] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:17.064] } [18:41:17.064] { [18:41:17.064] if (base::length(...future.futureOptionsAdded) > [18:41:17.064] 0L) { [18:41:17.064] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:17.064] base::names(opts) <- ...future.futureOptionsAdded [18:41:17.064] base::options(opts) [18:41:17.064] } [18:41:17.064] { [18:41:17.064] { [18:41:17.064] NULL [18:41:17.064] RNGkind("Mersenne-Twister") [18:41:17.064] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:17.064] inherits = FALSE) [18:41:17.064] } [18:41:17.064] options(future.plan = NULL) [18:41:17.064] if (is.na(NA_character_)) [18:41:17.064] Sys.unsetenv("R_FUTURE_PLAN") [18:41:17.064] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:17.064] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:17.064] .init = FALSE) [18:41:17.064] } [18:41:17.064] } [18:41:17.064] } [18:41:17.064] }) [18:41:17.064] if (TRUE) { [18:41:17.064] base::sink(type = "output", split = FALSE) [18:41:17.064] if (TRUE) { [18:41:17.064] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:17.064] } [18:41:17.064] else { [18:41:17.064] ...future.result["stdout"] <- base::list(NULL) [18:41:17.064] } [18:41:17.064] base::close(...future.stdout) [18:41:17.064] ...future.stdout <- NULL [18:41:17.064] } [18:41:17.064] ...future.result$conditions <- ...future.conditions [18:41:17.064] ...future.result$finished <- base::Sys.time() [18:41:17.064] ...future.result [18:41:17.064] } [18:41:17.068] assign_globals() ... [18:41:17.068] List of 5 [18:41:17.068] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:17.068] $ future.call.arguments :List of 1 [18:41:17.068] ..$ length: int 2 [18:41:17.068] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:17.068] $ ...future.elements_ii :List of 4 [18:41:17.068] ..$ a: chr "integer" [18:41:17.068] ..$ c: chr "character" [18:41:17.068] ..$ b: chr "numeric" [18:41:17.068] ..$ c: chr "list" [18:41:17.068] $ ...future.seeds_ii : NULL [18:41:17.068] $ ...future.globals.maxSize: NULL [18:41:17.068] - attr(*, "where")=List of 5 [18:41:17.068] ..$ ...future.FUN : [18:41:17.068] ..$ future.call.arguments : [18:41:17.068] ..$ ...future.elements_ii : [18:41:17.068] ..$ ...future.seeds_ii : [18:41:17.068] ..$ ...future.globals.maxSize: [18:41:17.068] - attr(*, "resolved")= logi FALSE [18:41:17.068] - attr(*, "total_size")= num 4456 [18:41:17.068] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:17.068] - attr(*, "already-done")= logi TRUE [18:41:17.075] - copied '...future.FUN' to environment [18:41:17.075] - copied 'future.call.arguments' to environment [18:41:17.075] - copied '...future.elements_ii' to environment [18:41:17.076] - copied '...future.seeds_ii' to environment [18:41:17.076] - copied '...future.globals.maxSize' to environment [18:41:17.076] assign_globals() ... done [18:41:17.076] plan(): Setting new future strategy stack: [18:41:17.077] List of future strategies: [18:41:17.077] 1. sequential: [18:41:17.077] - args: function (..., envir = parent.frame(), workers = "") [18:41:17.077] - tweaked: FALSE [18:41:17.077] - call: NULL [18:41:17.077] plan(): nbrOfWorkers() = 1 [18:41:17.078] plan(): Setting new future strategy stack: [18:41:17.079] List of future strategies: [18:41:17.079] 1. sequential: [18:41:17.079] - args: function (..., envir = parent.frame(), workers = "") [18:41:17.079] - tweaked: FALSE [18:41:17.079] - call: plan(strategy) [18:41:17.079] plan(): nbrOfWorkers() = 1 [18:41:17.079] SequentialFuture started (and completed) [18:41:17.080] - Launch lazy future ... done [18:41:17.080] run() for 'SequentialFuture' ... done [18:41:17.080] Created future: [18:41:17.080] SequentialFuture: [18:41:17.080] Label: 'future_lapply-1' [18:41:17.080] Expression: [18:41:17.080] { [18:41:17.080] do.call(function(...) { [18:41:17.080] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.080] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:17.080] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.080] on.exit(options(oopts), add = TRUE) [18:41:17.080] } [18:41:17.080] { [18:41:17.080] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:17.080] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.080] ...future.FUN(...future.X_jj, ...) [18:41:17.080] }) [18:41:17.080] } [18:41:17.080] }, args = future.call.arguments) [18:41:17.080] } [18:41:17.080] Lazy evaluation: FALSE [18:41:17.080] Asynchronous evaluation: FALSE [18:41:17.080] Local evaluation: TRUE [18:41:17.080] Environment: R_GlobalEnv [18:41:17.080] Capture standard output: TRUE [18:41:17.080] Capture condition classes: 'condition' (excluding 'nothing') [18:41:17.080] Globals: 5 objects totaling 853 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 191 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:17.080] Packages: [18:41:17.080] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:17.080] Resolved: TRUE [18:41:17.080] Value: 111 bytes of class 'list' [18:41:17.080] Early signaling: FALSE [18:41:17.080] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:17.080] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:17.081] Chunk #1 of 1 ... DONE [18:41:17.081] Launching 1 futures (chunks) ... DONE [18:41:17.082] Resolving 1 futures (chunks) ... [18:41:17.082] resolve() on list ... [18:41:17.082] recursive: 0 [18:41:17.082] length: 1 [18:41:17.082] [18:41:17.082] resolved() for 'SequentialFuture' ... [18:41:17.083] - state: 'finished' [18:41:17.083] - run: TRUE [18:41:17.083] - result: 'FutureResult' [18:41:17.083] resolved() for 'SequentialFuture' ... done [18:41:17.083] Future #1 [18:41:17.083] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:17.084] - nx: 1 [18:41:17.084] - relay: TRUE [18:41:17.084] - stdout: TRUE [18:41:17.084] - signal: TRUE [18:41:17.084] - resignal: FALSE [18:41:17.084] - force: TRUE [18:41:17.085] - relayed: [n=1] FALSE [18:41:17.085] - queued futures: [n=1] FALSE [18:41:17.085] - until=1 [18:41:17.085] - relaying element #1 [18:41:17.085] - relayed: [n=1] TRUE [18:41:17.085] - queued futures: [n=1] TRUE [18:41:17.086] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:17.086] length: 0 (resolved future 1) [18:41:17.086] Relaying remaining futures [18:41:17.086] signalConditionsASAP(NULL, pos=0) ... [18:41:17.086] - nx: 1 [18:41:17.086] - relay: TRUE [18:41:17.087] - stdout: TRUE [18:41:17.087] - signal: TRUE [18:41:17.087] - resignal: FALSE [18:41:17.087] - force: TRUE [18:41:17.087] - relayed: [n=1] TRUE [18:41:17.087] - queued futures: [n=1] TRUE - flush all [18:41:17.087] - relayed: [n=1] TRUE [18:41:17.088] - queued futures: [n=1] TRUE [18:41:17.088] signalConditionsASAP(NULL, pos=0) ... done [18:41:17.088] resolve() on list ... DONE [18:41:17.088] - Number of value chunks collected: 1 [18:41:17.088] Resolving 1 futures (chunks) ... DONE [18:41:17.089] Reducing values from 1 chunks ... [18:41:17.089] - Number of values collected after concatenation: 4 [18:41:17.089] - Number of values expected: 4 [18:41:17.089] Reverse index remapping (attribute 'ordering'): [n = 4] 1, 3, 2, 4 [18:41:17.089] Reducing values from 1 chunks ... DONE [18:41:17.089] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL - future_lapply(x, FUN = future:::hpaste, ...) ... [18:41:17.092] future_lapply() ... [18:41:17.100] Number of chunks: 1 [18:41:17.101] getGlobalsAndPackagesXApply() ... [18:41:17.101] - future.globals: TRUE [18:41:17.101] getGlobalsAndPackages() ... [18:41:17.101] Searching for globals... [18:41:17.110] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [18:41:17.111] Searching for globals ... DONE [18:41:17.111] Resolving globals: FALSE [18:41:17.112] The total size of the 1 globals is 7.17 KiB (7342 bytes) [18:41:17.112] The total size of the 1 globals exported for future expression ('FUN(collapse = "; ", maxHead = 3L)') is 7.17 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (7.17 KiB of class 'function') [18:41:17.113] - globals: [1] 'FUN' [18:41:17.113] - packages: [1] 'future' [18:41:17.113] getGlobalsAndPackages() ... DONE [18:41:17.113] - globals found/used: [n=1] 'FUN' [18:41:17.113] - needed namespaces: [n=1] 'future' [18:41:17.113] Finding globals ... DONE [18:41:17.114] - use_args: TRUE [18:41:17.114] - Getting '...' globals ... [18:41:17.114] resolve() on list ... [18:41:17.114] recursive: 0 [18:41:17.115] length: 1 [18:41:17.115] elements: '...' [18:41:17.115] length: 0 (resolved future 1) [18:41:17.115] resolve() on list ... DONE [18:41:17.115] - '...' content: [n=2] 'collapse', 'maxHead' [18:41:17.115] List of 1 [18:41:17.115] $ ...:List of 2 [18:41:17.115] ..$ collapse: chr "; " [18:41:17.115] ..$ maxHead : int 3 [18:41:17.115] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:17.115] - attr(*, "where")=List of 1 [18:41:17.115] ..$ ...: [18:41:17.115] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:17.115] - attr(*, "resolved")= logi TRUE [18:41:17.115] - attr(*, "total_size")= num NA [18:41:17.119] - Getting '...' globals ... DONE [18:41:17.119] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:17.119] List of 2 [18:41:17.119] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [18:41:17.119] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [18:41:17.119] $ ... :List of 2 [18:41:17.119] ..$ collapse: chr "; " [18:41:17.119] ..$ maxHead : int 3 [18:41:17.119] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:17.119] - attr(*, "where")=List of 2 [18:41:17.119] ..$ ...future.FUN: [18:41:17.119] ..$ ... : [18:41:17.119] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:17.119] - attr(*, "resolved")= logi FALSE [18:41:17.119] - attr(*, "total_size")= int 20351 [18:41:17.123] Packages to be attached in all futures: [n=1] 'future' [18:41:17.124] getGlobalsAndPackagesXApply() ... DONE [18:41:17.124] Number of futures (= number of chunks): 1 [18:41:17.124] Launching 1 futures (chunks) ... [18:41:17.124] Chunk #1 of 1 ... [18:41:17.124] - Finding globals in 'X' for chunk #1 ... [18:41:17.125] getGlobalsAndPackages() ... [18:41:17.125] Searching for globals... [18:41:17.125] [18:41:17.125] Searching for globals ... DONE [18:41:17.125] - globals: [0] [18:41:17.126] getGlobalsAndPackages() ... DONE [18:41:17.126] + additional globals found: [n=0] [18:41:17.126] + additional namespaces needed: [n=0] [18:41:17.126] - Finding globals in 'X' for chunk #1 ... DONE [18:41:17.126] - seeds: [18:41:17.126] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.127] getGlobalsAndPackages() ... [18:41:17.127] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.127] Resolving globals: FALSE [18:41:17.127] Tweak future expression to call with '...' arguments ... [18:41:17.127] { [18:41:17.127] do.call(function(...) { [18:41:17.127] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.127] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:17.127] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.127] on.exit(options(oopts), add = TRUE) [18:41:17.127] } [18:41:17.127] { [18:41:17.127] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:17.127] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.127] ...future.FUN(...future.X_jj, ...) [18:41:17.127] }) [18:41:17.127] } [18:41:17.127] }, args = future.call.arguments) [18:41:17.127] } [18:41:17.128] Tweak future expression to call with '...' arguments ... DONE [18:41:17.128] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.128] - packages: [1] 'future' [18:41:17.129] getGlobalsAndPackages() ... DONE [18:41:17.129] run() for 'Future' ... [18:41:17.129] - state: 'created' [18:41:17.129] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:17.130] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:17.130] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:17.130] - Field: 'label' [18:41:17.130] - Field: 'local' [18:41:17.130] - Field: 'owner' [18:41:17.131] - Field: 'envir' [18:41:17.131] - Field: 'packages' [18:41:17.131] - Field: 'gc' [18:41:17.131] - Field: 'conditions' [18:41:17.131] - Field: 'expr' [18:41:17.132] - Field: 'uuid' [18:41:17.132] - Field: 'seed' [18:41:17.132] - Field: 'version' [18:41:17.132] - Field: 'result' [18:41:17.132] - Field: 'asynchronous' [18:41:17.132] - Field: 'calls' [18:41:17.133] - Field: 'globals' [18:41:17.133] - Field: 'stdout' [18:41:17.133] - Field: 'earlySignal' [18:41:17.133] - Field: 'lazy' [18:41:17.133] - Field: 'state' [18:41:17.133] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:17.134] - Launch lazy future ... [18:41:17.134] Packages needed by the future expression (n = 1): 'future' [18:41:17.134] Packages needed by future strategies (n = 0): [18:41:17.135] { [18:41:17.135] { [18:41:17.135] { [18:41:17.135] ...future.startTime <- base::Sys.time() [18:41:17.135] { [18:41:17.135] { [18:41:17.135] { [18:41:17.135] { [18:41:17.135] base::local({ [18:41:17.135] has_future <- base::requireNamespace("future", [18:41:17.135] quietly = TRUE) [18:41:17.135] if (has_future) { [18:41:17.135] ns <- base::getNamespace("future") [18:41:17.135] version <- ns[[".package"]][["version"]] [18:41:17.135] if (is.null(version)) [18:41:17.135] version <- utils::packageVersion("future") [18:41:17.135] } [18:41:17.135] else { [18:41:17.135] version <- NULL [18:41:17.135] } [18:41:17.135] if (!has_future || version < "1.8.0") { [18:41:17.135] info <- base::c(r_version = base::gsub("R version ", [18:41:17.135] "", base::R.version$version.string), [18:41:17.135] platform = base::sprintf("%s (%s-bit)", [18:41:17.135] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:17.135] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:17.135] "release", "version")], collapse = " "), [18:41:17.135] hostname = base::Sys.info()[["nodename"]]) [18:41:17.135] info <- base::sprintf("%s: %s", base::names(info), [18:41:17.135] info) [18:41:17.135] info <- base::paste(info, collapse = "; ") [18:41:17.135] if (!has_future) { [18:41:17.135] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:17.135] info) [18:41:17.135] } [18:41:17.135] else { [18:41:17.135] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:17.135] info, version) [18:41:17.135] } [18:41:17.135] base::stop(msg) [18:41:17.135] } [18:41:17.135] }) [18:41:17.135] } [18:41:17.135] base::local({ [18:41:17.135] for (pkg in "future") { [18:41:17.135] base::loadNamespace(pkg) [18:41:17.135] base::library(pkg, character.only = TRUE) [18:41:17.135] } [18:41:17.135] }) [18:41:17.135] } [18:41:17.135] ...future.strategy.old <- future::plan("list") [18:41:17.135] options(future.plan = NULL) [18:41:17.135] Sys.unsetenv("R_FUTURE_PLAN") [18:41:17.135] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:17.135] } [18:41:17.135] ...future.workdir <- getwd() [18:41:17.135] } [18:41:17.135] ...future.oldOptions <- base::as.list(base::.Options) [18:41:17.135] ...future.oldEnvVars <- base::Sys.getenv() [18:41:17.135] } [18:41:17.135] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:17.135] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:17.135] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:17.135] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:17.135] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:17.135] future.stdout.windows.reencode = NULL, width = 80L) [18:41:17.135] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:17.135] base::names(...future.oldOptions)) [18:41:17.135] } [18:41:17.135] if (FALSE) { [18:41:17.135] } [18:41:17.135] else { [18:41:17.135] if (TRUE) { [18:41:17.135] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:17.135] open = "w") [18:41:17.135] } [18:41:17.135] else { [18:41:17.135] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:17.135] windows = "NUL", "/dev/null"), open = "w") [18:41:17.135] } [18:41:17.135] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:17.135] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:17.135] base::sink(type = "output", split = FALSE) [18:41:17.135] base::close(...future.stdout) [18:41:17.135] }, add = TRUE) [18:41:17.135] } [18:41:17.135] ...future.frame <- base::sys.nframe() [18:41:17.135] ...future.conditions <- base::list() [18:41:17.135] ...future.rng <- base::globalenv()$.Random.seed [18:41:17.135] if (FALSE) { [18:41:17.135] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:17.135] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:17.135] } [18:41:17.135] ...future.result <- base::tryCatch({ [18:41:17.135] base::withCallingHandlers({ [18:41:17.135] ...future.value <- base::withVisible(base::local({ [18:41:17.135] do.call(function(...) { [18:41:17.135] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.135] if (!identical(...future.globals.maxSize.org, [18:41:17.135] ...future.globals.maxSize)) { [18:41:17.135] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.135] on.exit(options(oopts), add = TRUE) [18:41:17.135] } [18:41:17.135] { [18:41:17.135] lapply(seq_along(...future.elements_ii), [18:41:17.135] FUN = function(jj) { [18:41:17.135] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.135] ...future.FUN(...future.X_jj, ...) [18:41:17.135] }) [18:41:17.135] } [18:41:17.135] }, args = future.call.arguments) [18:41:17.135] })) [18:41:17.135] future::FutureResult(value = ...future.value$value, [18:41:17.135] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:17.135] ...future.rng), globalenv = if (FALSE) [18:41:17.135] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:17.135] ...future.globalenv.names)) [18:41:17.135] else NULL, started = ...future.startTime, version = "1.8") [18:41:17.135] }, condition = base::local({ [18:41:17.135] c <- base::c [18:41:17.135] inherits <- base::inherits [18:41:17.135] invokeRestart <- base::invokeRestart [18:41:17.135] length <- base::length [18:41:17.135] list <- base::list [18:41:17.135] seq.int <- base::seq.int [18:41:17.135] signalCondition <- base::signalCondition [18:41:17.135] sys.calls <- base::sys.calls [18:41:17.135] `[[` <- base::`[[` [18:41:17.135] `+` <- base::`+` [18:41:17.135] `<<-` <- base::`<<-` [18:41:17.135] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:17.135] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:17.135] 3L)] [18:41:17.135] } [18:41:17.135] function(cond) { [18:41:17.135] is_error <- inherits(cond, "error") [18:41:17.135] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:17.135] NULL) [18:41:17.135] if (is_error) { [18:41:17.135] sessionInformation <- function() { [18:41:17.135] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:17.135] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:17.135] search = base::search(), system = base::Sys.info()) [18:41:17.135] } [18:41:17.135] ...future.conditions[[length(...future.conditions) + [18:41:17.135] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:17.135] cond$call), session = sessionInformation(), [18:41:17.135] timestamp = base::Sys.time(), signaled = 0L) [18:41:17.135] signalCondition(cond) [18:41:17.135] } [18:41:17.135] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:17.135] "immediateCondition"))) { [18:41:17.135] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:17.135] ...future.conditions[[length(...future.conditions) + [18:41:17.135] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:17.135] if (TRUE && !signal) { [18:41:17.135] muffleCondition <- function (cond, pattern = "^muffle") [18:41:17.135] { [18:41:17.135] inherits <- base::inherits [18:41:17.135] invokeRestart <- base::invokeRestart [18:41:17.135] is.null <- base::is.null [18:41:17.135] muffled <- FALSE [18:41:17.135] if (inherits(cond, "message")) { [18:41:17.135] muffled <- grepl(pattern, "muffleMessage") [18:41:17.135] if (muffled) [18:41:17.135] invokeRestart("muffleMessage") [18:41:17.135] } [18:41:17.135] else if (inherits(cond, "warning")) { [18:41:17.135] muffled <- grepl(pattern, "muffleWarning") [18:41:17.135] if (muffled) [18:41:17.135] invokeRestart("muffleWarning") [18:41:17.135] } [18:41:17.135] else if (inherits(cond, "condition")) { [18:41:17.135] if (!is.null(pattern)) { [18:41:17.135] computeRestarts <- base::computeRestarts [18:41:17.135] grepl <- base::grepl [18:41:17.135] restarts <- computeRestarts(cond) [18:41:17.135] for (restart in restarts) { [18:41:17.135] name <- restart$name [18:41:17.135] if (is.null(name)) [18:41:17.135] next [18:41:17.135] if (!grepl(pattern, name)) [18:41:17.135] next [18:41:17.135] invokeRestart(restart) [18:41:17.135] muffled <- TRUE [18:41:17.135] break [18:41:17.135] } [18:41:17.135] } [18:41:17.135] } [18:41:17.135] invisible(muffled) [18:41:17.135] } [18:41:17.135] muffleCondition(cond, pattern = "^muffle") [18:41:17.135] } [18:41:17.135] } [18:41:17.135] else { [18:41:17.135] if (TRUE) { [18:41:17.135] muffleCondition <- function (cond, pattern = "^muffle") [18:41:17.135] { [18:41:17.135] inherits <- base::inherits [18:41:17.135] invokeRestart <- base::invokeRestart [18:41:17.135] is.null <- base::is.null [18:41:17.135] muffled <- FALSE [18:41:17.135] if (inherits(cond, "message")) { [18:41:17.135] muffled <- grepl(pattern, "muffleMessage") [18:41:17.135] if (muffled) [18:41:17.135] invokeRestart("muffleMessage") [18:41:17.135] } [18:41:17.135] else if (inherits(cond, "warning")) { [18:41:17.135] muffled <- grepl(pattern, "muffleWarning") [18:41:17.135] if (muffled) [18:41:17.135] invokeRestart("muffleWarning") [18:41:17.135] } [18:41:17.135] else if (inherits(cond, "condition")) { [18:41:17.135] if (!is.null(pattern)) { [18:41:17.135] computeRestarts <- base::computeRestarts [18:41:17.135] grepl <- base::grepl [18:41:17.135] restarts <- computeRestarts(cond) [18:41:17.135] for (restart in restarts) { [18:41:17.135] name <- restart$name [18:41:17.135] if (is.null(name)) [18:41:17.135] next [18:41:17.135] if (!grepl(pattern, name)) [18:41:17.135] next [18:41:17.135] invokeRestart(restart) [18:41:17.135] muffled <- TRUE [18:41:17.135] break [18:41:17.135] } [18:41:17.135] } [18:41:17.135] } [18:41:17.135] invisible(muffled) [18:41:17.135] } [18:41:17.135] muffleCondition(cond, pattern = "^muffle") [18:41:17.135] } [18:41:17.135] } [18:41:17.135] } [18:41:17.135] })) [18:41:17.135] }, error = function(ex) { [18:41:17.135] base::structure(base::list(value = NULL, visible = NULL, [18:41:17.135] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:17.135] ...future.rng), started = ...future.startTime, [18:41:17.135] finished = Sys.time(), session_uuid = NA_character_, [18:41:17.135] version = "1.8"), class = "FutureResult") [18:41:17.135] }, finally = { [18:41:17.135] if (!identical(...future.workdir, getwd())) [18:41:17.135] setwd(...future.workdir) [18:41:17.135] { [18:41:17.135] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:17.135] ...future.oldOptions$nwarnings <- NULL [18:41:17.135] } [18:41:17.135] base::options(...future.oldOptions) [18:41:17.135] if (.Platform$OS.type == "windows") { [18:41:17.135] old_names <- names(...future.oldEnvVars) [18:41:17.135] envs <- base::Sys.getenv() [18:41:17.135] names <- names(envs) [18:41:17.135] common <- intersect(names, old_names) [18:41:17.135] added <- setdiff(names, old_names) [18:41:17.135] removed <- setdiff(old_names, names) [18:41:17.135] changed <- common[...future.oldEnvVars[common] != [18:41:17.135] envs[common]] [18:41:17.135] NAMES <- toupper(changed) [18:41:17.135] args <- list() [18:41:17.135] for (kk in seq_along(NAMES)) { [18:41:17.135] name <- changed[[kk]] [18:41:17.135] NAME <- NAMES[[kk]] [18:41:17.135] if (name != NAME && is.element(NAME, old_names)) [18:41:17.135] next [18:41:17.135] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:17.135] } [18:41:17.135] NAMES <- toupper(added) [18:41:17.135] for (kk in seq_along(NAMES)) { [18:41:17.135] name <- added[[kk]] [18:41:17.135] NAME <- NAMES[[kk]] [18:41:17.135] if (name != NAME && is.element(NAME, old_names)) [18:41:17.135] next [18:41:17.135] args[[name]] <- "" [18:41:17.135] } [18:41:17.135] NAMES <- toupper(removed) [18:41:17.135] for (kk in seq_along(NAMES)) { [18:41:17.135] name <- removed[[kk]] [18:41:17.135] NAME <- NAMES[[kk]] [18:41:17.135] if (name != NAME && is.element(NAME, old_names)) [18:41:17.135] next [18:41:17.135] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:17.135] } [18:41:17.135] if (length(args) > 0) [18:41:17.135] base::do.call(base::Sys.setenv, args = args) [18:41:17.135] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:17.135] } [18:41:17.135] else { [18:41:17.135] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:17.135] } [18:41:17.135] { [18:41:17.135] if (base::length(...future.futureOptionsAdded) > [18:41:17.135] 0L) { [18:41:17.135] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:17.135] base::names(opts) <- ...future.futureOptionsAdded [18:41:17.135] base::options(opts) [18:41:17.135] } [18:41:17.135] { [18:41:17.135] { [18:41:17.135] NULL [18:41:17.135] RNGkind("Mersenne-Twister") [18:41:17.135] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:17.135] inherits = FALSE) [18:41:17.135] } [18:41:17.135] options(future.plan = NULL) [18:41:17.135] if (is.na(NA_character_)) [18:41:17.135] Sys.unsetenv("R_FUTURE_PLAN") [18:41:17.135] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:17.135] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:17.135] .init = FALSE) [18:41:17.135] } [18:41:17.135] } [18:41:17.135] } [18:41:17.135] }) [18:41:17.135] if (TRUE) { [18:41:17.135] base::sink(type = "output", split = FALSE) [18:41:17.135] if (TRUE) { [18:41:17.135] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:17.135] } [18:41:17.135] else { [18:41:17.135] ...future.result["stdout"] <- base::list(NULL) [18:41:17.135] } [18:41:17.135] base::close(...future.stdout) [18:41:17.135] ...future.stdout <- NULL [18:41:17.135] } [18:41:17.135] ...future.result$conditions <- ...future.conditions [18:41:17.135] ...future.result$finished <- base::Sys.time() [18:41:17.135] ...future.result [18:41:17.135] } [18:41:17.138] assign_globals() ... [18:41:17.139] List of 5 [18:41:17.139] $ ...future.FUN :function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [18:41:17.139] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [18:41:17.139] $ future.call.arguments :List of 2 [18:41:17.139] ..$ collapse: chr "; " [18:41:17.139] ..$ maxHead : int 3 [18:41:17.139] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:17.139] $ ...future.elements_ii :List of 1 [18:41:17.139] ..$ a: Named chr [1:101] "hello" "1" "2" "3" ... [18:41:17.139] .. ..- attr(*, "names")= chr [1:101] "" "b1" "b2" "b3" ... [18:41:17.139] $ ...future.seeds_ii : NULL [18:41:17.139] $ ...future.globals.maxSize: NULL [18:41:17.139] - attr(*, "where")=List of 5 [18:41:17.139] ..$ ...future.FUN : [18:41:17.139] ..$ future.call.arguments : [18:41:17.139] ..$ ...future.elements_ii : [18:41:17.139] ..$ ...future.seeds_ii : [18:41:17.139] ..$ ...future.globals.maxSize: [18:41:17.139] - attr(*, "resolved")= logi FALSE [18:41:17.139] - attr(*, "total_size")= num 20351 [18:41:17.139] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:17.139] - attr(*, "already-done")= logi TRUE [18:41:17.146] - copied '...future.FUN' to environment [18:41:17.146] - copied 'future.call.arguments' to environment [18:41:17.146] - copied '...future.elements_ii' to environment [18:41:17.146] - copied '...future.seeds_ii' to environment [18:41:17.146] - copied '...future.globals.maxSize' to environment [18:41:17.147] assign_globals() ... done [18:41:17.147] plan(): Setting new future strategy stack: [18:41:17.147] List of future strategies: [18:41:17.147] 1. sequential: [18:41:17.147] - args: function (..., envir = parent.frame(), workers = "") [18:41:17.147] - tweaked: FALSE [18:41:17.147] - call: NULL [18:41:17.148] plan(): nbrOfWorkers() = 1 [18:41:17.149] plan(): Setting new future strategy stack: [18:41:17.150] List of future strategies: [18:41:17.150] 1. sequential: [18:41:17.150] - args: function (..., envir = parent.frame(), workers = "") [18:41:17.150] - tweaked: FALSE [18:41:17.150] - call: plan(strategy) [18:41:17.150] plan(): nbrOfWorkers() = 1 [18:41:17.150] SequentialFuture started (and completed) [18:41:17.151] - Launch lazy future ... done [18:41:17.151] run() for 'SequentialFuture' ... done [18:41:17.151] Created future: [18:41:17.151] SequentialFuture: [18:41:17.151] Label: 'future_lapply-1' [18:41:17.151] Expression: [18:41:17.151] { [18:41:17.151] do.call(function(...) { [18:41:17.151] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.151] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:17.151] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.151] on.exit(options(oopts), add = TRUE) [18:41:17.151] } [18:41:17.151] { [18:41:17.151] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:17.151] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.151] ...future.FUN(...future.X_jj, ...) [18:41:17.151] }) [18:41:17.151] } [18:41:17.151] }, args = future.call.arguments) [18:41:17.151] } [18:41:17.151] Lazy evaluation: FALSE [18:41:17.151] Asynchronous evaluation: FALSE [18:41:17.151] Local evaluation: TRUE [18:41:17.151] Environment: R_GlobalEnv [18:41:17.151] Capture standard output: TRUE [18:41:17.151] Capture condition classes: 'condition' (excluding 'nothing') [18:41:17.151] Globals: 5 objects totaling 9.56 KiB (function '...future.FUN' of 7.17 KiB, DotDotDotList 'future.call.arguments' of 187 bytes, list '...future.elements_ii' of 2.15 KiB, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:17.151] Packages: 1 packages ('future') [18:41:17.151] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:17.151] Resolved: TRUE [18:41:17.151] Value: 68 bytes of class 'list' [18:41:17.151] Early signaling: FALSE [18:41:17.151] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:17.151] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:17.154] Chunk #1 of 1 ... DONE [18:41:17.154] Launching 1 futures (chunks) ... DONE [18:41:17.154] Resolving 1 futures (chunks) ... [18:41:17.155] resolve() on list ... [18:41:17.155] recursive: 0 [18:41:17.155] length: 1 [18:41:17.155] [18:41:17.155] resolved() for 'SequentialFuture' ... [18:41:17.155] - state: 'finished' [18:41:17.156] - run: TRUE [18:41:17.156] - result: 'FutureResult' [18:41:17.156] resolved() for 'SequentialFuture' ... done [18:41:17.156] Future #1 [18:41:17.156] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:17.156] - nx: 1 [18:41:17.157] - relay: TRUE [18:41:17.157] - stdout: TRUE [18:41:17.157] - signal: TRUE [18:41:17.157] - resignal: FALSE [18:41:17.157] - force: TRUE [18:41:17.157] - relayed: [n=1] FALSE [18:41:17.157] - queued futures: [n=1] FALSE [18:41:17.158] - until=1 [18:41:17.158] - relaying element #1 [18:41:17.158] - relayed: [n=1] TRUE [18:41:17.158] - queued futures: [n=1] TRUE [18:41:17.158] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:17.159] length: 0 (resolved future 1) [18:41:17.159] Relaying remaining futures [18:41:17.159] signalConditionsASAP(NULL, pos=0) ... [18:41:17.159] - nx: 1 [18:41:17.159] - relay: TRUE [18:41:17.159] - stdout: TRUE [18:41:17.160] - signal: TRUE [18:41:17.160] - resignal: FALSE [18:41:17.160] - force: TRUE [18:41:17.160] - relayed: [n=1] TRUE [18:41:17.160] - queued futures: [n=1] TRUE - flush all [18:41:17.160] - relayed: [n=1] TRUE [18:41:17.160] - queued futures: [n=1] TRUE [18:41:17.161] signalConditionsASAP(NULL, pos=0) ... done [18:41:17.161] resolve() on list ... DONE [18:41:17.161] - Number of value chunks collected: 1 [18:41:17.161] Resolving 1 futures (chunks) ... DONE [18:41:17.161] Reducing values from 1 chunks ... [18:41:17.161] - Number of values collected after concatenation: 1 [18:41:17.162] - Number of values expected: 1 [18:41:17.162] Reducing values from 1 chunks ... DONE [18:41:17.162] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [18:41:17.163] future_lapply() ... [18:41:17.164] Number of chunks: 1 [18:41:17.164] Index remapping (attribute 'ordering'): [n = 2] 2, 1 [18:41:17.164] getGlobalsAndPackagesXApply() ... [18:41:17.164] - future.globals: TRUE [18:41:17.165] getGlobalsAndPackages() ... [18:41:17.165] Searching for globals... [18:41:17.166] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [18:41:17.166] Searching for globals ... DONE [18:41:17.167] Resolving globals: FALSE [18:41:17.167] The total size of the 1 globals is 911 bytes (911 bytes) [18:41:17.167] The total size of the 1 globals exported for future expression ('FUN()') is 911 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (911 bytes of class 'function') [18:41:17.168] - globals: [1] 'FUN' [18:41:17.168] - packages: [1] 'listenv' [18:41:17.168] getGlobalsAndPackages() ... DONE [18:41:17.168] - globals found/used: [n=1] 'FUN' [18:41:17.168] - needed namespaces: [n=1] 'listenv' [18:41:17.169] Finding globals ... DONE [18:41:17.169] - use_args: TRUE [18:41:17.169] - Getting '...' globals ... [18:41:17.169] resolve() on list ... [18:41:17.169] recursive: 0 [18:41:17.170] length: 1 [18:41:17.170] elements: '...' [18:41:17.170] length: 0 (resolved future 1) [18:41:17.170] resolve() on list ... DONE [18:41:17.170] - '...' content: [n=0] [18:41:17.170] List of 1 [18:41:17.170] $ ...: list() [18:41:17.170] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:17.170] - attr(*, "where")=List of 1 [18:41:17.170] ..$ ...: [18:41:17.170] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:17.170] - attr(*, "resolved")= logi TRUE [18:41:17.170] - attr(*, "total_size")= num NA [18:41:17.173] - Getting '...' globals ... DONE [18:41:17.174] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:17.174] List of 2 [18:41:17.174] $ ...future.FUN:function (x, ...) [18:41:17.174] $ ... : list() [18:41:17.174] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:17.174] - attr(*, "where")=List of 2 [18:41:17.174] ..$ ...future.FUN: [18:41:17.174] ..$ ... : [18:41:17.174] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:17.174] - attr(*, "resolved")= logi FALSE [18:41:17.174] - attr(*, "total_size")= int 8195 [18:41:17.177] Packages to be attached in all futures: [n=1] 'listenv' [18:41:17.177] getGlobalsAndPackagesXApply() ... DONE [18:41:17.177] Number of futures (= number of chunks): 1 [18:41:17.178] Launching 1 futures (chunks) ... [18:41:17.178] Chunk #1 of 1 ... [18:41:17.178] - Finding globals in 'X' for chunk #1 ... [18:41:17.178] getGlobalsAndPackages() ... [18:41:17.178] Searching for globals... [18:41:17.179] [18:41:17.179] Searching for globals ... DONE [18:41:17.179] - globals: [0] [18:41:17.179] getGlobalsAndPackages() ... DONE [18:41:17.180] + additional globals found: [n=0] [18:41:17.180] + additional namespaces needed: [n=0] [18:41:17.180] - Finding globals in 'X' for chunk #1 ... DONE [18:41:17.180] - seeds: [18:41:17.180] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.180] getGlobalsAndPackages() ... [18:41:17.181] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.181] Resolving globals: FALSE [18:41:17.181] Tweak future expression to call with '...' arguments ... [18:41:17.181] { [18:41:17.181] do.call(function(...) { [18:41:17.181] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.181] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:17.181] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.181] on.exit(options(oopts), add = TRUE) [18:41:17.181] } [18:41:17.181] { [18:41:17.181] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:17.181] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.181] ...future.FUN(...future.X_jj, ...) [18:41:17.181] }) [18:41:17.181] } [18:41:17.181] }, args = future.call.arguments) [18:41:17.181] } [18:41:17.182] Tweak future expression to call with '...' arguments ... DONE [18:41:17.182] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.182] - packages: [1] 'listenv' [18:41:17.182] getGlobalsAndPackages() ... DONE [18:41:17.183] run() for 'Future' ... [18:41:17.183] - state: 'created' [18:41:17.183] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:17.184] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:17.184] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:17.184] - Field: 'label' [18:41:17.184] - Field: 'local' [18:41:17.184] - Field: 'owner' [18:41:17.184] - Field: 'envir' [18:41:17.185] - Field: 'packages' [18:41:17.185] - Field: 'gc' [18:41:17.185] - Field: 'conditions' [18:41:17.185] - Field: 'expr' [18:41:17.185] - Field: 'uuid' [18:41:17.185] - Field: 'seed' [18:41:17.186] - Field: 'version' [18:41:17.186] - Field: 'result' [18:41:17.186] - Field: 'asynchronous' [18:41:17.186] - Field: 'calls' [18:41:17.186] - Field: 'globals' [18:41:17.187] - Field: 'stdout' [18:41:17.187] - Field: 'earlySignal' [18:41:17.187] - Field: 'lazy' [18:41:17.187] - Field: 'state' [18:41:17.187] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:17.187] - Launch lazy future ... [18:41:17.188] Packages needed by the future expression (n = 1): 'listenv' [18:41:17.188] Packages needed by future strategies (n = 0): [18:41:17.188] { [18:41:17.188] { [18:41:17.188] { [18:41:17.188] ...future.startTime <- base::Sys.time() [18:41:17.188] { [18:41:17.188] { [18:41:17.188] { [18:41:17.188] { [18:41:17.188] base::local({ [18:41:17.188] has_future <- base::requireNamespace("future", [18:41:17.188] quietly = TRUE) [18:41:17.188] if (has_future) { [18:41:17.188] ns <- base::getNamespace("future") [18:41:17.188] version <- ns[[".package"]][["version"]] [18:41:17.188] if (is.null(version)) [18:41:17.188] version <- utils::packageVersion("future") [18:41:17.188] } [18:41:17.188] else { [18:41:17.188] version <- NULL [18:41:17.188] } [18:41:17.188] if (!has_future || version < "1.8.0") { [18:41:17.188] info <- base::c(r_version = base::gsub("R version ", [18:41:17.188] "", base::R.version$version.string), [18:41:17.188] platform = base::sprintf("%s (%s-bit)", [18:41:17.188] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:17.188] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:17.188] "release", "version")], collapse = " "), [18:41:17.188] hostname = base::Sys.info()[["nodename"]]) [18:41:17.188] info <- base::sprintf("%s: %s", base::names(info), [18:41:17.188] info) [18:41:17.188] info <- base::paste(info, collapse = "; ") [18:41:17.188] if (!has_future) { [18:41:17.188] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:17.188] info) [18:41:17.188] } [18:41:17.188] else { [18:41:17.188] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:17.188] info, version) [18:41:17.188] } [18:41:17.188] base::stop(msg) [18:41:17.188] } [18:41:17.188] }) [18:41:17.188] } [18:41:17.188] base::local({ [18:41:17.188] for (pkg in "listenv") { [18:41:17.188] base::loadNamespace(pkg) [18:41:17.188] base::library(pkg, character.only = TRUE) [18:41:17.188] } [18:41:17.188] }) [18:41:17.188] } [18:41:17.188] ...future.strategy.old <- future::plan("list") [18:41:17.188] options(future.plan = NULL) [18:41:17.188] Sys.unsetenv("R_FUTURE_PLAN") [18:41:17.188] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:17.188] } [18:41:17.188] ...future.workdir <- getwd() [18:41:17.188] } [18:41:17.188] ...future.oldOptions <- base::as.list(base::.Options) [18:41:17.188] ...future.oldEnvVars <- base::Sys.getenv() [18:41:17.188] } [18:41:17.188] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:17.188] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:17.188] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:17.188] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:17.188] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:17.188] future.stdout.windows.reencode = NULL, width = 80L) [18:41:17.188] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:17.188] base::names(...future.oldOptions)) [18:41:17.188] } [18:41:17.188] if (FALSE) { [18:41:17.188] } [18:41:17.188] else { [18:41:17.188] if (TRUE) { [18:41:17.188] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:17.188] open = "w") [18:41:17.188] } [18:41:17.188] else { [18:41:17.188] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:17.188] windows = "NUL", "/dev/null"), open = "w") [18:41:17.188] } [18:41:17.188] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:17.188] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:17.188] base::sink(type = "output", split = FALSE) [18:41:17.188] base::close(...future.stdout) [18:41:17.188] }, add = TRUE) [18:41:17.188] } [18:41:17.188] ...future.frame <- base::sys.nframe() [18:41:17.188] ...future.conditions <- base::list() [18:41:17.188] ...future.rng <- base::globalenv()$.Random.seed [18:41:17.188] if (FALSE) { [18:41:17.188] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:17.188] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:17.188] } [18:41:17.188] ...future.result <- base::tryCatch({ [18:41:17.188] base::withCallingHandlers({ [18:41:17.188] ...future.value <- base::withVisible(base::local({ [18:41:17.188] do.call(function(...) { [18:41:17.188] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.188] if (!identical(...future.globals.maxSize.org, [18:41:17.188] ...future.globals.maxSize)) { [18:41:17.188] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.188] on.exit(options(oopts), add = TRUE) [18:41:17.188] } [18:41:17.188] { [18:41:17.188] lapply(seq_along(...future.elements_ii), [18:41:17.188] FUN = function(jj) { [18:41:17.188] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.188] ...future.FUN(...future.X_jj, ...) [18:41:17.188] }) [18:41:17.188] } [18:41:17.188] }, args = future.call.arguments) [18:41:17.188] })) [18:41:17.188] future::FutureResult(value = ...future.value$value, [18:41:17.188] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:17.188] ...future.rng), globalenv = if (FALSE) [18:41:17.188] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:17.188] ...future.globalenv.names)) [18:41:17.188] else NULL, started = ...future.startTime, version = "1.8") [18:41:17.188] }, condition = base::local({ [18:41:17.188] c <- base::c [18:41:17.188] inherits <- base::inherits [18:41:17.188] invokeRestart <- base::invokeRestart [18:41:17.188] length <- base::length [18:41:17.188] list <- base::list [18:41:17.188] seq.int <- base::seq.int [18:41:17.188] signalCondition <- base::signalCondition [18:41:17.188] sys.calls <- base::sys.calls [18:41:17.188] `[[` <- base::`[[` [18:41:17.188] `+` <- base::`+` [18:41:17.188] `<<-` <- base::`<<-` [18:41:17.188] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:17.188] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:17.188] 3L)] [18:41:17.188] } [18:41:17.188] function(cond) { [18:41:17.188] is_error <- inherits(cond, "error") [18:41:17.188] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:17.188] NULL) [18:41:17.188] if (is_error) { [18:41:17.188] sessionInformation <- function() { [18:41:17.188] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:17.188] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:17.188] search = base::search(), system = base::Sys.info()) [18:41:17.188] } [18:41:17.188] ...future.conditions[[length(...future.conditions) + [18:41:17.188] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:17.188] cond$call), session = sessionInformation(), [18:41:17.188] timestamp = base::Sys.time(), signaled = 0L) [18:41:17.188] signalCondition(cond) [18:41:17.188] } [18:41:17.188] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:17.188] "immediateCondition"))) { [18:41:17.188] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:17.188] ...future.conditions[[length(...future.conditions) + [18:41:17.188] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:17.188] if (TRUE && !signal) { [18:41:17.188] muffleCondition <- function (cond, pattern = "^muffle") [18:41:17.188] { [18:41:17.188] inherits <- base::inherits [18:41:17.188] invokeRestart <- base::invokeRestart [18:41:17.188] is.null <- base::is.null [18:41:17.188] muffled <- FALSE [18:41:17.188] if (inherits(cond, "message")) { [18:41:17.188] muffled <- grepl(pattern, "muffleMessage") [18:41:17.188] if (muffled) [18:41:17.188] invokeRestart("muffleMessage") [18:41:17.188] } [18:41:17.188] else if (inherits(cond, "warning")) { [18:41:17.188] muffled <- grepl(pattern, "muffleWarning") [18:41:17.188] if (muffled) [18:41:17.188] invokeRestart("muffleWarning") [18:41:17.188] } [18:41:17.188] else if (inherits(cond, "condition")) { [18:41:17.188] if (!is.null(pattern)) { [18:41:17.188] computeRestarts <- base::computeRestarts [18:41:17.188] grepl <- base::grepl [18:41:17.188] restarts <- computeRestarts(cond) [18:41:17.188] for (restart in restarts) { [18:41:17.188] name <- restart$name [18:41:17.188] if (is.null(name)) [18:41:17.188] next [18:41:17.188] if (!grepl(pattern, name)) [18:41:17.188] next [18:41:17.188] invokeRestart(restart) [18:41:17.188] muffled <- TRUE [18:41:17.188] break [18:41:17.188] } [18:41:17.188] } [18:41:17.188] } [18:41:17.188] invisible(muffled) [18:41:17.188] } [18:41:17.188] muffleCondition(cond, pattern = "^muffle") [18:41:17.188] } [18:41:17.188] } [18:41:17.188] else { [18:41:17.188] if (TRUE) { [18:41:17.188] muffleCondition <- function (cond, pattern = "^muffle") [18:41:17.188] { [18:41:17.188] inherits <- base::inherits [18:41:17.188] invokeRestart <- base::invokeRestart [18:41:17.188] is.null <- base::is.null [18:41:17.188] muffled <- FALSE [18:41:17.188] if (inherits(cond, "message")) { [18:41:17.188] muffled <- grepl(pattern, "muffleMessage") [18:41:17.188] if (muffled) [18:41:17.188] invokeRestart("muffleMessage") [18:41:17.188] } [18:41:17.188] else if (inherits(cond, "warning")) { [18:41:17.188] muffled <- grepl(pattern, "muffleWarning") [18:41:17.188] if (muffled) [18:41:17.188] invokeRestart("muffleWarning") [18:41:17.188] } [18:41:17.188] else if (inherits(cond, "condition")) { [18:41:17.188] if (!is.null(pattern)) { [18:41:17.188] computeRestarts <- base::computeRestarts [18:41:17.188] grepl <- base::grepl [18:41:17.188] restarts <- computeRestarts(cond) [18:41:17.188] for (restart in restarts) { [18:41:17.188] name <- restart$name [18:41:17.188] if (is.null(name)) [18:41:17.188] next [18:41:17.188] if (!grepl(pattern, name)) [18:41:17.188] next [18:41:17.188] invokeRestart(restart) [18:41:17.188] muffled <- TRUE [18:41:17.188] break [18:41:17.188] } [18:41:17.188] } [18:41:17.188] } [18:41:17.188] invisible(muffled) [18:41:17.188] } [18:41:17.188] muffleCondition(cond, pattern = "^muffle") [18:41:17.188] } [18:41:17.188] } [18:41:17.188] } [18:41:17.188] })) [18:41:17.188] }, error = function(ex) { [18:41:17.188] base::structure(base::list(value = NULL, visible = NULL, [18:41:17.188] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:17.188] ...future.rng), started = ...future.startTime, [18:41:17.188] finished = Sys.time(), session_uuid = NA_character_, [18:41:17.188] version = "1.8"), class = "FutureResult") [18:41:17.188] }, finally = { [18:41:17.188] if (!identical(...future.workdir, getwd())) [18:41:17.188] setwd(...future.workdir) [18:41:17.188] { [18:41:17.188] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:17.188] ...future.oldOptions$nwarnings <- NULL [18:41:17.188] } [18:41:17.188] base::options(...future.oldOptions) [18:41:17.188] if (.Platform$OS.type == "windows") { [18:41:17.188] old_names <- names(...future.oldEnvVars) [18:41:17.188] envs <- base::Sys.getenv() [18:41:17.188] names <- names(envs) [18:41:17.188] common <- intersect(names, old_names) [18:41:17.188] added <- setdiff(names, old_names) [18:41:17.188] removed <- setdiff(old_names, names) [18:41:17.188] changed <- common[...future.oldEnvVars[common] != [18:41:17.188] envs[common]] [18:41:17.188] NAMES <- toupper(changed) [18:41:17.188] args <- list() [18:41:17.188] for (kk in seq_along(NAMES)) { [18:41:17.188] name <- changed[[kk]] [18:41:17.188] NAME <- NAMES[[kk]] [18:41:17.188] if (name != NAME && is.element(NAME, old_names)) [18:41:17.188] next [18:41:17.188] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:17.188] } [18:41:17.188] NAMES <- toupper(added) [18:41:17.188] for (kk in seq_along(NAMES)) { [18:41:17.188] name <- added[[kk]] [18:41:17.188] NAME <- NAMES[[kk]] [18:41:17.188] if (name != NAME && is.element(NAME, old_names)) [18:41:17.188] next [18:41:17.188] args[[name]] <- "" [18:41:17.188] } [18:41:17.188] NAMES <- toupper(removed) [18:41:17.188] for (kk in seq_along(NAMES)) { [18:41:17.188] name <- removed[[kk]] [18:41:17.188] NAME <- NAMES[[kk]] [18:41:17.188] if (name != NAME && is.element(NAME, old_names)) [18:41:17.188] next [18:41:17.188] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:17.188] } [18:41:17.188] if (length(args) > 0) [18:41:17.188] base::do.call(base::Sys.setenv, args = args) [18:41:17.188] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:17.188] } [18:41:17.188] else { [18:41:17.188] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:17.188] } [18:41:17.188] { [18:41:17.188] if (base::length(...future.futureOptionsAdded) > [18:41:17.188] 0L) { [18:41:17.188] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:17.188] base::names(opts) <- ...future.futureOptionsAdded [18:41:17.188] base::options(opts) [18:41:17.188] } [18:41:17.188] { [18:41:17.188] { [18:41:17.188] NULL [18:41:17.188] RNGkind("Mersenne-Twister") [18:41:17.188] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:17.188] inherits = FALSE) [18:41:17.188] } [18:41:17.188] options(future.plan = NULL) [18:41:17.188] if (is.na(NA_character_)) [18:41:17.188] Sys.unsetenv("R_FUTURE_PLAN") [18:41:17.188] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:17.188] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:17.188] .init = FALSE) [18:41:17.188] } [18:41:17.188] } [18:41:17.188] } [18:41:17.188] }) [18:41:17.188] if (TRUE) { [18:41:17.188] base::sink(type = "output", split = FALSE) [18:41:17.188] if (TRUE) { [18:41:17.188] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:17.188] } [18:41:17.188] else { [18:41:17.188] ...future.result["stdout"] <- base::list(NULL) [18:41:17.188] } [18:41:17.188] base::close(...future.stdout) [18:41:17.188] ...future.stdout <- NULL [18:41:17.188] } [18:41:17.188] ...future.result$conditions <- ...future.conditions [18:41:17.188] ...future.result$finished <- base::Sys.time() [18:41:17.188] ...future.result [18:41:17.188] } [18:41:17.192] assign_globals() ... [18:41:17.193] List of 5 [18:41:17.193] $ ...future.FUN :function (x, ...) [18:41:17.193] $ future.call.arguments : list() [18:41:17.193] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:17.193] $ ...future.elements_ii :List of 2 [18:41:17.193] ..$ b:Classes 'listenv', 'environment' [18:41:17.193] ..$ a:Classes 'listenv', 'environment' [18:41:17.193] $ ...future.seeds_ii : NULL [18:41:17.193] $ ...future.globals.maxSize: NULL [18:41:17.193] - attr(*, "where")=List of 5 [18:41:17.193] ..$ ...future.FUN : [18:41:17.193] ..$ future.call.arguments : [18:41:17.193] ..$ ...future.elements_ii : [18:41:17.193] ..$ ...future.seeds_ii : [18:41:17.193] ..$ ...future.globals.maxSize: [18:41:17.193] - attr(*, "resolved")= logi FALSE [18:41:17.193] - attr(*, "total_size")= num 8195 [18:41:17.193] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:17.193] - attr(*, "already-done")= logi TRUE [18:41:17.198] - copied '...future.FUN' to environment [18:41:17.199] - copied 'future.call.arguments' to environment [18:41:17.199] - copied '...future.elements_ii' to environment [18:41:17.199] - copied '...future.seeds_ii' to environment [18:41:17.199] - copied '...future.globals.maxSize' to environment [18:41:17.199] assign_globals() ... done [18:41:17.200] plan(): Setting new future strategy stack: [18:41:17.200] List of future strategies: [18:41:17.200] 1. sequential: [18:41:17.200] - args: function (..., envir = parent.frame(), workers = "") [18:41:17.200] - tweaked: FALSE [18:41:17.200] - call: NULL [18:41:17.201] plan(): nbrOfWorkers() = 1 [18:41:17.202] plan(): Setting new future strategy stack: [18:41:17.202] List of future strategies: [18:41:17.202] 1. sequential: [18:41:17.202] - args: function (..., envir = parent.frame(), workers = "") [18:41:17.202] - tweaked: FALSE [18:41:17.202] - call: plan(strategy) [18:41:17.203] plan(): nbrOfWorkers() = 1 [18:41:17.203] SequentialFuture started (and completed) [18:41:17.203] - Launch lazy future ... done [18:41:17.203] run() for 'SequentialFuture' ... done [18:41:17.204] Created future: [18:41:17.204] SequentialFuture: [18:41:17.204] Label: 'future_lapply-1' [18:41:17.204] Expression: [18:41:17.204] { [18:41:17.204] do.call(function(...) { [18:41:17.204] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.204] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:17.204] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.204] on.exit(options(oopts), add = TRUE) [18:41:17.204] } [18:41:17.204] { [18:41:17.204] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:17.204] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.204] ...future.FUN(...future.X_jj, ...) [18:41:17.204] }) [18:41:17.204] } [18:41:17.204] }, args = future.call.arguments) [18:41:17.204] } [18:41:17.204] Lazy evaluation: FALSE [18:41:17.204] Asynchronous evaluation: FALSE [18:41:17.204] Local evaluation: TRUE [18:41:17.204] Environment: R_GlobalEnv [18:41:17.204] Capture standard output: TRUE [18:41:17.204] Capture condition classes: 'condition' (excluding 'nothing') [18:41:17.204] Globals: 5 objects totaling 4.14 KiB (function '...future.FUN' of 911 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 3.10 KiB, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:17.204] Packages: 1 packages ('listenv') [18:41:17.204] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:17.204] Resolved: TRUE [18:41:17.204] Value: 154 bytes of class 'list' [18:41:17.204] Early signaling: FALSE [18:41:17.204] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:17.204] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:17.205] Chunk #1 of 1 ... DONE [18:41:17.205] Launching 1 futures (chunks) ... DONE [18:41:17.205] Resolving 1 futures (chunks) ... [18:41:17.205] resolve() on list ... [18:41:17.206] recursive: 0 [18:41:17.206] length: 1 [18:41:17.206] [18:41:17.206] resolved() for 'SequentialFuture' ... [18:41:17.206] - state: 'finished' [18:41:17.206] - run: TRUE [18:41:17.207] - result: 'FutureResult' [18:41:17.207] resolved() for 'SequentialFuture' ... done [18:41:17.207] Future #1 [18:41:17.207] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:17.207] - nx: 1 [18:41:17.207] - relay: TRUE [18:41:17.208] - stdout: TRUE [18:41:17.208] - signal: TRUE [18:41:17.208] - resignal: FALSE [18:41:17.208] - force: TRUE [18:41:17.208] - relayed: [n=1] FALSE [18:41:17.208] - queued futures: [n=1] FALSE [18:41:17.208] - until=1 [18:41:17.209] - relaying element #1 [18:41:17.209] - relayed: [n=1] TRUE [18:41:17.209] - queued futures: [n=1] TRUE [18:41:17.209] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:17.209] length: 0 (resolved future 1) [18:41:17.210] Relaying remaining futures [18:41:17.210] signalConditionsASAP(NULL, pos=0) ... [18:41:17.210] - nx: 1 [18:41:17.210] - relay: TRUE [18:41:17.210] - stdout: TRUE [18:41:17.210] - signal: TRUE [18:41:17.210] - resignal: FALSE [18:41:17.211] - force: TRUE [18:41:17.211] - relayed: [n=1] TRUE [18:41:17.211] - queued futures: [n=1] TRUE - flush all [18:41:17.211] - relayed: [n=1] TRUE [18:41:17.211] - queued futures: [n=1] TRUE [18:41:17.211] signalConditionsASAP(NULL, pos=0) ... done [18:41:17.212] resolve() on list ... DONE [18:41:17.212] - Number of value chunks collected: 1 [18:41:17.212] Resolving 1 futures (chunks) ... DONE [18:41:17.212] Reducing values from 1 chunks ... [18:41:17.212] - Number of values collected after concatenation: 2 [18:41:17.212] - Number of values expected: 2 [18:41:17.213] Reverse index remapping (attribute 'ordering'): [n = 2] 2, 1 [18:41:17.213] Reducing values from 1 chunks ... DONE [18:41:17.213] future_lapply() ... DONE List of 1 $ y:List of 2 ..$ a: Named chr "A" .. ..- attr(*, "names")= chr "A" ..$ b: Named chr [1:2] "A" "B" .. ..- attr(*, "names")= chr [1:2] "A" "B" - future_lapply(x, FUN = vector, ...) ... [18:41:17.215] future_lapply() ... [18:41:17.216] Number of chunks: 1 [18:41:17.216] Index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [18:41:17.216] getGlobalsAndPackagesXApply() ... [18:41:17.216] - future.globals: TRUE [18:41:17.216] getGlobalsAndPackages() ... [18:41:17.217] Searching for globals... [18:41:17.218] - globals found: [2] 'FUN', '.Internal' [18:41:17.218] Searching for globals ... DONE [18:41:17.218] Resolving globals: FALSE [18:41:17.219] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:17.219] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:17.219] - globals: [1] 'FUN' [18:41:17.220] [18:41:17.220] getGlobalsAndPackages() ... DONE [18:41:17.220] - globals found/used: [n=1] 'FUN' [18:41:17.220] - needed namespaces: [n=0] [18:41:17.220] Finding globals ... DONE [18:41:17.220] - use_args: TRUE [18:41:17.221] - Getting '...' globals ... [18:41:17.221] resolve() on list ... [18:41:17.221] recursive: 0 [18:41:17.221] length: 1 [18:41:17.221] elements: '...' [18:41:17.222] length: 0 (resolved future 1) [18:41:17.222] resolve() on list ... DONE [18:41:17.222] - '...' content: [n=1] 'length' [18:41:17.222] List of 1 [18:41:17.222] $ ...:List of 1 [18:41:17.222] ..$ length: int 2 [18:41:17.222] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:17.222] - attr(*, "where")=List of 1 [18:41:17.222] ..$ ...: [18:41:17.222] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:17.222] - attr(*, "resolved")= logi TRUE [18:41:17.222] - attr(*, "total_size")= num NA [18:41:17.225] - Getting '...' globals ... DONE [18:41:17.226] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:17.226] List of 2 [18:41:17.226] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:17.226] $ ... :List of 1 [18:41:17.226] ..$ length: int 2 [18:41:17.226] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:17.226] - attr(*, "where")=List of 2 [18:41:17.226] ..$ ...future.FUN: [18:41:17.226] ..$ ... : [18:41:17.226] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:17.226] - attr(*, "resolved")= logi FALSE [18:41:17.226] - attr(*, "total_size")= int 4763 [18:41:17.230] Packages to be attached in all futures: [n=0] [18:41:17.230] getGlobalsAndPackagesXApply() ... DONE [18:41:17.230] Number of futures (= number of chunks): 1 [18:41:17.230] Launching 1 futures (chunks) ... [18:41:17.230] Chunk #1 of 1 ... [18:41:17.231] - Finding globals in 'X' for chunk #1 ... [18:41:17.231] getGlobalsAndPackages() ... [18:41:17.231] Searching for globals... [18:41:17.231] [18:41:17.232] Searching for globals ... DONE [18:41:17.232] - globals: [0] [18:41:17.232] getGlobalsAndPackages() ... DONE [18:41:17.232] + additional globals found: [n=0] [18:41:17.232] + additional namespaces needed: [n=0] [18:41:17.232] - Finding globals in 'X' for chunk #1 ... DONE [18:41:17.232] - seeds: [18:41:17.233] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.233] getGlobalsAndPackages() ... [18:41:17.233] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.233] Resolving globals: FALSE [18:41:17.233] Tweak future expression to call with '...' arguments ... [18:41:17.234] { [18:41:17.234] do.call(function(...) { [18:41:17.234] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.234] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:17.234] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.234] on.exit(options(oopts), add = TRUE) [18:41:17.234] } [18:41:17.234] { [18:41:17.234] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:17.234] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.234] ...future.FUN(...future.X_jj, ...) [18:41:17.234] }) [18:41:17.234] } [18:41:17.234] }, args = future.call.arguments) [18:41:17.234] } [18:41:17.234] Tweak future expression to call with '...' arguments ... DONE [18:41:17.234] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.235] [18:41:17.235] getGlobalsAndPackages() ... DONE [18:41:17.235] run() for 'Future' ... [18:41:17.235] - state: 'created' [18:41:17.236] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:17.236] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:17.236] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:17.236] - Field: 'label' [18:41:17.237] - Field: 'local' [18:41:17.237] - Field: 'owner' [18:41:17.237] - Field: 'envir' [18:41:17.237] - Field: 'packages' [18:41:17.237] - Field: 'gc' [18:41:17.237] - Field: 'conditions' [18:41:17.238] - Field: 'expr' [18:41:17.238] - Field: 'uuid' [18:41:17.238] - Field: 'seed' [18:41:17.238] - Field: 'version' [18:41:17.238] - Field: 'result' [18:41:17.238] - Field: 'asynchronous' [18:41:17.239] - Field: 'calls' [18:41:17.239] - Field: 'globals' [18:41:17.239] - Field: 'stdout' [18:41:17.239] - Field: 'earlySignal' [18:41:17.239] - Field: 'lazy' [18:41:17.240] - Field: 'state' [18:41:17.240] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:17.240] - Launch lazy future ... [18:41:17.240] Packages needed by the future expression (n = 0): [18:41:17.240] Packages needed by future strategies (n = 0): [18:41:17.241] { [18:41:17.241] { [18:41:17.241] { [18:41:17.241] ...future.startTime <- base::Sys.time() [18:41:17.241] { [18:41:17.241] { [18:41:17.241] { [18:41:17.241] base::local({ [18:41:17.241] has_future <- base::requireNamespace("future", [18:41:17.241] quietly = TRUE) [18:41:17.241] if (has_future) { [18:41:17.241] ns <- base::getNamespace("future") [18:41:17.241] version <- ns[[".package"]][["version"]] [18:41:17.241] if (is.null(version)) [18:41:17.241] version <- utils::packageVersion("future") [18:41:17.241] } [18:41:17.241] else { [18:41:17.241] version <- NULL [18:41:17.241] } [18:41:17.241] if (!has_future || version < "1.8.0") { [18:41:17.241] info <- base::c(r_version = base::gsub("R version ", [18:41:17.241] "", base::R.version$version.string), [18:41:17.241] platform = base::sprintf("%s (%s-bit)", [18:41:17.241] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:17.241] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:17.241] "release", "version")], collapse = " "), [18:41:17.241] hostname = base::Sys.info()[["nodename"]]) [18:41:17.241] info <- base::sprintf("%s: %s", base::names(info), [18:41:17.241] info) [18:41:17.241] info <- base::paste(info, collapse = "; ") [18:41:17.241] if (!has_future) { [18:41:17.241] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:17.241] info) [18:41:17.241] } [18:41:17.241] else { [18:41:17.241] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:17.241] info, version) [18:41:17.241] } [18:41:17.241] base::stop(msg) [18:41:17.241] } [18:41:17.241] }) [18:41:17.241] } [18:41:17.241] ...future.strategy.old <- future::plan("list") [18:41:17.241] options(future.plan = NULL) [18:41:17.241] Sys.unsetenv("R_FUTURE_PLAN") [18:41:17.241] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:17.241] } [18:41:17.241] ...future.workdir <- getwd() [18:41:17.241] } [18:41:17.241] ...future.oldOptions <- base::as.list(base::.Options) [18:41:17.241] ...future.oldEnvVars <- base::Sys.getenv() [18:41:17.241] } [18:41:17.241] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:17.241] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:17.241] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:17.241] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:17.241] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:17.241] future.stdout.windows.reencode = NULL, width = 80L) [18:41:17.241] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:17.241] base::names(...future.oldOptions)) [18:41:17.241] } [18:41:17.241] if (FALSE) { [18:41:17.241] } [18:41:17.241] else { [18:41:17.241] if (TRUE) { [18:41:17.241] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:17.241] open = "w") [18:41:17.241] } [18:41:17.241] else { [18:41:17.241] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:17.241] windows = "NUL", "/dev/null"), open = "w") [18:41:17.241] } [18:41:17.241] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:17.241] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:17.241] base::sink(type = "output", split = FALSE) [18:41:17.241] base::close(...future.stdout) [18:41:17.241] }, add = TRUE) [18:41:17.241] } [18:41:17.241] ...future.frame <- base::sys.nframe() [18:41:17.241] ...future.conditions <- base::list() [18:41:17.241] ...future.rng <- base::globalenv()$.Random.seed [18:41:17.241] if (FALSE) { [18:41:17.241] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:17.241] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:17.241] } [18:41:17.241] ...future.result <- base::tryCatch({ [18:41:17.241] base::withCallingHandlers({ [18:41:17.241] ...future.value <- base::withVisible(base::local({ [18:41:17.241] do.call(function(...) { [18:41:17.241] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.241] if (!identical(...future.globals.maxSize.org, [18:41:17.241] ...future.globals.maxSize)) { [18:41:17.241] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.241] on.exit(options(oopts), add = TRUE) [18:41:17.241] } [18:41:17.241] { [18:41:17.241] lapply(seq_along(...future.elements_ii), [18:41:17.241] FUN = function(jj) { [18:41:17.241] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.241] ...future.FUN(...future.X_jj, ...) [18:41:17.241] }) [18:41:17.241] } [18:41:17.241] }, args = future.call.arguments) [18:41:17.241] })) [18:41:17.241] future::FutureResult(value = ...future.value$value, [18:41:17.241] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:17.241] ...future.rng), globalenv = if (FALSE) [18:41:17.241] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:17.241] ...future.globalenv.names)) [18:41:17.241] else NULL, started = ...future.startTime, version = "1.8") [18:41:17.241] }, condition = base::local({ [18:41:17.241] c <- base::c [18:41:17.241] inherits <- base::inherits [18:41:17.241] invokeRestart <- base::invokeRestart [18:41:17.241] length <- base::length [18:41:17.241] list <- base::list [18:41:17.241] seq.int <- base::seq.int [18:41:17.241] signalCondition <- base::signalCondition [18:41:17.241] sys.calls <- base::sys.calls [18:41:17.241] `[[` <- base::`[[` [18:41:17.241] `+` <- base::`+` [18:41:17.241] `<<-` <- base::`<<-` [18:41:17.241] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:17.241] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:17.241] 3L)] [18:41:17.241] } [18:41:17.241] function(cond) { [18:41:17.241] is_error <- inherits(cond, "error") [18:41:17.241] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:17.241] NULL) [18:41:17.241] if (is_error) { [18:41:17.241] sessionInformation <- function() { [18:41:17.241] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:17.241] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:17.241] search = base::search(), system = base::Sys.info()) [18:41:17.241] } [18:41:17.241] ...future.conditions[[length(...future.conditions) + [18:41:17.241] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:17.241] cond$call), session = sessionInformation(), [18:41:17.241] timestamp = base::Sys.time(), signaled = 0L) [18:41:17.241] signalCondition(cond) [18:41:17.241] } [18:41:17.241] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:17.241] "immediateCondition"))) { [18:41:17.241] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:17.241] ...future.conditions[[length(...future.conditions) + [18:41:17.241] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:17.241] if (TRUE && !signal) { [18:41:17.241] muffleCondition <- function (cond, pattern = "^muffle") [18:41:17.241] { [18:41:17.241] inherits <- base::inherits [18:41:17.241] invokeRestart <- base::invokeRestart [18:41:17.241] is.null <- base::is.null [18:41:17.241] muffled <- FALSE [18:41:17.241] if (inherits(cond, "message")) { [18:41:17.241] muffled <- grepl(pattern, "muffleMessage") [18:41:17.241] if (muffled) [18:41:17.241] invokeRestart("muffleMessage") [18:41:17.241] } [18:41:17.241] else if (inherits(cond, "warning")) { [18:41:17.241] muffled <- grepl(pattern, "muffleWarning") [18:41:17.241] if (muffled) [18:41:17.241] invokeRestart("muffleWarning") [18:41:17.241] } [18:41:17.241] else if (inherits(cond, "condition")) { [18:41:17.241] if (!is.null(pattern)) { [18:41:17.241] computeRestarts <- base::computeRestarts [18:41:17.241] grepl <- base::grepl [18:41:17.241] restarts <- computeRestarts(cond) [18:41:17.241] for (restart in restarts) { [18:41:17.241] name <- restart$name [18:41:17.241] if (is.null(name)) [18:41:17.241] next [18:41:17.241] if (!grepl(pattern, name)) [18:41:17.241] next [18:41:17.241] invokeRestart(restart) [18:41:17.241] muffled <- TRUE [18:41:17.241] break [18:41:17.241] } [18:41:17.241] } [18:41:17.241] } [18:41:17.241] invisible(muffled) [18:41:17.241] } [18:41:17.241] muffleCondition(cond, pattern = "^muffle") [18:41:17.241] } [18:41:17.241] } [18:41:17.241] else { [18:41:17.241] if (TRUE) { [18:41:17.241] muffleCondition <- function (cond, pattern = "^muffle") [18:41:17.241] { [18:41:17.241] inherits <- base::inherits [18:41:17.241] invokeRestart <- base::invokeRestart [18:41:17.241] is.null <- base::is.null [18:41:17.241] muffled <- FALSE [18:41:17.241] if (inherits(cond, "message")) { [18:41:17.241] muffled <- grepl(pattern, "muffleMessage") [18:41:17.241] if (muffled) [18:41:17.241] invokeRestart("muffleMessage") [18:41:17.241] } [18:41:17.241] else if (inherits(cond, "warning")) { [18:41:17.241] muffled <- grepl(pattern, "muffleWarning") [18:41:17.241] if (muffled) [18:41:17.241] invokeRestart("muffleWarning") [18:41:17.241] } [18:41:17.241] else if (inherits(cond, "condition")) { [18:41:17.241] if (!is.null(pattern)) { [18:41:17.241] computeRestarts <- base::computeRestarts [18:41:17.241] grepl <- base::grepl [18:41:17.241] restarts <- computeRestarts(cond) [18:41:17.241] for (restart in restarts) { [18:41:17.241] name <- restart$name [18:41:17.241] if (is.null(name)) [18:41:17.241] next [18:41:17.241] if (!grepl(pattern, name)) [18:41:17.241] next [18:41:17.241] invokeRestart(restart) [18:41:17.241] muffled <- TRUE [18:41:17.241] break [18:41:17.241] } [18:41:17.241] } [18:41:17.241] } [18:41:17.241] invisible(muffled) [18:41:17.241] } [18:41:17.241] muffleCondition(cond, pattern = "^muffle") [18:41:17.241] } [18:41:17.241] } [18:41:17.241] } [18:41:17.241] })) [18:41:17.241] }, error = function(ex) { [18:41:17.241] base::structure(base::list(value = NULL, visible = NULL, [18:41:17.241] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:17.241] ...future.rng), started = ...future.startTime, [18:41:17.241] finished = Sys.time(), session_uuid = NA_character_, [18:41:17.241] version = "1.8"), class = "FutureResult") [18:41:17.241] }, finally = { [18:41:17.241] if (!identical(...future.workdir, getwd())) [18:41:17.241] setwd(...future.workdir) [18:41:17.241] { [18:41:17.241] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:17.241] ...future.oldOptions$nwarnings <- NULL [18:41:17.241] } [18:41:17.241] base::options(...future.oldOptions) [18:41:17.241] if (.Platform$OS.type == "windows") { [18:41:17.241] old_names <- names(...future.oldEnvVars) [18:41:17.241] envs <- base::Sys.getenv() [18:41:17.241] names <- names(envs) [18:41:17.241] common <- intersect(names, old_names) [18:41:17.241] added <- setdiff(names, old_names) [18:41:17.241] removed <- setdiff(old_names, names) [18:41:17.241] changed <- common[...future.oldEnvVars[common] != [18:41:17.241] envs[common]] [18:41:17.241] NAMES <- toupper(changed) [18:41:17.241] args <- list() [18:41:17.241] for (kk in seq_along(NAMES)) { [18:41:17.241] name <- changed[[kk]] [18:41:17.241] NAME <- NAMES[[kk]] [18:41:17.241] if (name != NAME && is.element(NAME, old_names)) [18:41:17.241] next [18:41:17.241] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:17.241] } [18:41:17.241] NAMES <- toupper(added) [18:41:17.241] for (kk in seq_along(NAMES)) { [18:41:17.241] name <- added[[kk]] [18:41:17.241] NAME <- NAMES[[kk]] [18:41:17.241] if (name != NAME && is.element(NAME, old_names)) [18:41:17.241] next [18:41:17.241] args[[name]] <- "" [18:41:17.241] } [18:41:17.241] NAMES <- toupper(removed) [18:41:17.241] for (kk in seq_along(NAMES)) { [18:41:17.241] name <- removed[[kk]] [18:41:17.241] NAME <- NAMES[[kk]] [18:41:17.241] if (name != NAME && is.element(NAME, old_names)) [18:41:17.241] next [18:41:17.241] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:17.241] } [18:41:17.241] if (length(args) > 0) [18:41:17.241] base::do.call(base::Sys.setenv, args = args) [18:41:17.241] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:17.241] } [18:41:17.241] else { [18:41:17.241] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:17.241] } [18:41:17.241] { [18:41:17.241] if (base::length(...future.futureOptionsAdded) > [18:41:17.241] 0L) { [18:41:17.241] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:17.241] base::names(opts) <- ...future.futureOptionsAdded [18:41:17.241] base::options(opts) [18:41:17.241] } [18:41:17.241] { [18:41:17.241] { [18:41:17.241] NULL [18:41:17.241] RNGkind("Mersenne-Twister") [18:41:17.241] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:17.241] inherits = FALSE) [18:41:17.241] } [18:41:17.241] options(future.plan = NULL) [18:41:17.241] if (is.na(NA_character_)) [18:41:17.241] Sys.unsetenv("R_FUTURE_PLAN") [18:41:17.241] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:17.241] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:17.241] .init = FALSE) [18:41:17.241] } [18:41:17.241] } [18:41:17.241] } [18:41:17.241] }) [18:41:17.241] if (TRUE) { [18:41:17.241] base::sink(type = "output", split = FALSE) [18:41:17.241] if (TRUE) { [18:41:17.241] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:17.241] } [18:41:17.241] else { [18:41:17.241] ...future.result["stdout"] <- base::list(NULL) [18:41:17.241] } [18:41:17.241] base::close(...future.stdout) [18:41:17.241] ...future.stdout <- NULL [18:41:17.241] } [18:41:17.241] ...future.result$conditions <- ...future.conditions [18:41:17.241] ...future.result$finished <- base::Sys.time() [18:41:17.241] ...future.result [18:41:17.241] } [18:41:17.245] assign_globals() ... [18:41:17.245] List of 5 [18:41:17.245] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:17.245] $ future.call.arguments :List of 1 [18:41:17.245] ..$ length: int 2 [18:41:17.245] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:17.245] $ ...future.elements_ii :List of 4 [18:41:17.245] ..$ c: chr "list" [18:41:17.245] ..$ c: chr "character" [18:41:17.245] ..$ b: chr "numeric" [18:41:17.245] ..$ a: chr "integer" [18:41:17.245] $ ...future.seeds_ii : NULL [18:41:17.245] $ ...future.globals.maxSize: NULL [18:41:17.245] - attr(*, "where")=List of 5 [18:41:17.245] ..$ ...future.FUN : [18:41:17.245] ..$ future.call.arguments : [18:41:17.245] ..$ ...future.elements_ii : [18:41:17.245] ..$ ...future.seeds_ii : [18:41:17.245] ..$ ...future.globals.maxSize: [18:41:17.245] - attr(*, "resolved")= logi FALSE [18:41:17.245] - attr(*, "total_size")= num 4763 [18:41:17.245] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:17.245] - attr(*, "already-done")= logi TRUE [18:41:17.252] - copied '...future.FUN' to environment [18:41:17.252] - copied 'future.call.arguments' to environment [18:41:17.252] - copied '...future.elements_ii' to environment [18:41:17.252] - copied '...future.seeds_ii' to environment [18:41:17.253] - copied '...future.globals.maxSize' to environment [18:41:17.253] assign_globals() ... done [18:41:17.253] plan(): Setting new future strategy stack: [18:41:17.253] List of future strategies: [18:41:17.253] 1. sequential: [18:41:17.253] - args: function (..., envir = parent.frame(), workers = "") [18:41:17.253] - tweaked: FALSE [18:41:17.253] - call: NULL [18:41:17.254] plan(): nbrOfWorkers() = 1 [18:41:17.255] plan(): Setting new future strategy stack: [18:41:17.255] List of future strategies: [18:41:17.255] 1. sequential: [18:41:17.255] - args: function (..., envir = parent.frame(), workers = "") [18:41:17.255] - tweaked: FALSE [18:41:17.255] - call: plan(strategy) [18:41:17.256] plan(): nbrOfWorkers() = 1 [18:41:17.256] SequentialFuture started (and completed) [18:41:17.256] - Launch lazy future ... done [18:41:17.257] run() for 'SequentialFuture' ... done [18:41:17.257] Created future: [18:41:17.257] SequentialFuture: [18:41:17.257] Label: 'future_lapply-1' [18:41:17.257] Expression: [18:41:17.257] { [18:41:17.257] do.call(function(...) { [18:41:17.257] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.257] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:17.257] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.257] on.exit(options(oopts), add = TRUE) [18:41:17.257] } [18:41:17.257] { [18:41:17.257] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:17.257] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.257] ...future.FUN(...future.X_jj, ...) [18:41:17.257] }) [18:41:17.257] } [18:41:17.257] }, args = future.call.arguments) [18:41:17.257] } [18:41:17.257] Lazy evaluation: FALSE [18:41:17.257] Asynchronous evaluation: FALSE [18:41:17.257] Local evaluation: TRUE [18:41:17.257] Environment: R_GlobalEnv [18:41:17.257] Capture standard output: TRUE [18:41:17.257] Capture condition classes: 'condition' (excluding 'nothing') [18:41:17.257] Globals: 5 objects totaling 853 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 191 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:17.257] Packages: [18:41:17.257] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:17.257] Resolved: TRUE [18:41:17.257] Value: 111 bytes of class 'list' [18:41:17.257] Early signaling: FALSE [18:41:17.257] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:17.257] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:17.258] Chunk #1 of 1 ... DONE [18:41:17.258] Launching 1 futures (chunks) ... DONE [18:41:17.258] Resolving 1 futures (chunks) ... [18:41:17.259] resolve() on list ... [18:41:17.259] recursive: 0 [18:41:17.259] length: 1 [18:41:17.259] [18:41:17.259] resolved() for 'SequentialFuture' ... [18:41:17.259] - state: 'finished' [18:41:17.260] - run: TRUE [18:41:17.260] - result: 'FutureResult' [18:41:17.260] resolved() for 'SequentialFuture' ... done [18:41:17.260] Future #1 [18:41:17.260] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:17.260] - nx: 1 [18:41:17.261] - relay: TRUE [18:41:17.261] - stdout: TRUE [18:41:17.261] - signal: TRUE [18:41:17.261] - resignal: FALSE [18:41:17.261] - force: TRUE [18:41:17.261] - relayed: [n=1] FALSE [18:41:17.262] - queued futures: [n=1] FALSE [18:41:17.262] - until=1 [18:41:17.262] - relaying element #1 [18:41:17.262] - relayed: [n=1] TRUE [18:41:17.262] - queued futures: [n=1] TRUE [18:41:17.262] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:17.263] length: 0 (resolved future 1) [18:41:17.263] Relaying remaining futures [18:41:17.263] signalConditionsASAP(NULL, pos=0) ... [18:41:17.263] - nx: 1 [18:41:17.263] - relay: TRUE [18:41:17.263] - stdout: TRUE [18:41:17.264] - signal: TRUE [18:41:17.264] - resignal: FALSE [18:41:17.264] - force: TRUE [18:41:17.264] - relayed: [n=1] TRUE [18:41:17.264] - queued futures: [n=1] TRUE - flush all [18:41:17.264] - relayed: [n=1] TRUE [18:41:17.265] - queued futures: [n=1] TRUE [18:41:17.265] signalConditionsASAP(NULL, pos=0) ... done [18:41:17.265] resolve() on list ... DONE [18:41:17.265] - Number of value chunks collected: 1 [18:41:17.265] Resolving 1 futures (chunks) ... DONE [18:41:17.265] Reducing values from 1 chunks ... [18:41:17.266] - Number of values collected after concatenation: 4 [18:41:17.266] - Number of values expected: 4 [18:41:17.268] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [18:41:17.268] Reducing values from 1 chunks ... DONE [18:41:17.268] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL [18:41:17.271] future_lapply() ... [18:41:17.271] Number of chunks: 1 [18:41:17.272] Index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [18:41:17.272] getGlobalsAndPackagesXApply() ... [18:41:17.272] - future.globals: TRUE [18:41:17.272] getGlobalsAndPackages() ... [18:41:17.272] Searching for globals... [18:41:17.273] - globals found: [2] 'FUN', '.Internal' [18:41:17.274] Searching for globals ... DONE [18:41:17.274] Resolving globals: FALSE [18:41:17.274] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:17.275] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:17.275] - globals: [1] 'FUN' [18:41:17.275] [18:41:17.275] getGlobalsAndPackages() ... DONE [18:41:17.275] - globals found/used: [n=1] 'FUN' [18:41:17.276] - needed namespaces: [n=0] [18:41:17.276] Finding globals ... DONE [18:41:17.276] - use_args: TRUE [18:41:17.276] - Getting '...' globals ... [18:41:17.277] resolve() on list ... [18:41:17.277] recursive: 0 [18:41:17.277] length: 1 [18:41:17.277] elements: '...' [18:41:17.277] length: 0 (resolved future 1) [18:41:17.277] resolve() on list ... DONE [18:41:17.277] - '...' content: [n=1] 'length' [18:41:17.278] List of 1 [18:41:17.278] $ ...:List of 1 [18:41:17.278] ..$ length: int 2 [18:41:17.278] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:17.278] - attr(*, "where")=List of 1 [18:41:17.278] ..$ ...: [18:41:17.278] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:17.278] - attr(*, "resolved")= logi TRUE [18:41:17.278] - attr(*, "total_size")= num NA [18:41:17.281] - Getting '...' globals ... DONE [18:41:17.281] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:17.281] List of 2 [18:41:17.281] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:17.281] $ ... :List of 1 [18:41:17.281] ..$ length: int 2 [18:41:17.281] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:17.281] - attr(*, "where")=List of 2 [18:41:17.281] ..$ ...future.FUN: [18:41:17.281] ..$ ... : [18:41:17.281] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:17.281] - attr(*, "resolved")= logi FALSE [18:41:17.281] - attr(*, "total_size")= int 4799 [18:41:17.285] Packages to be attached in all futures: [n=0] [18:41:17.285] getGlobalsAndPackagesXApply() ... DONE [18:41:17.286] Number of futures (= number of chunks): 1 [18:41:17.286] Launching 1 futures (chunks) ... [18:41:17.286] Chunk #1 of 1 ... [18:41:17.286] - Finding globals in 'X' for chunk #1 ... [18:41:17.286] getGlobalsAndPackages() ... [18:41:17.286] Searching for globals... [18:41:17.287] [18:41:17.287] Searching for globals ... DONE [18:41:17.287] - globals: [0] [18:41:17.287] getGlobalsAndPackages() ... DONE [18:41:17.287] + additional globals found: [n=0] [18:41:17.287] + additional namespaces needed: [n=0] [18:41:17.288] - Finding globals in 'X' for chunk #1 ... DONE [18:41:17.288] - seeds: [18:41:17.288] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.288] getGlobalsAndPackages() ... [18:41:17.288] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.288] Resolving globals: FALSE [18:41:17.289] Tweak future expression to call with '...' arguments ... [18:41:17.289] { [18:41:17.289] do.call(function(...) { [18:41:17.289] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.289] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:17.289] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.289] on.exit(options(oopts), add = TRUE) [18:41:17.289] } [18:41:17.289] { [18:41:17.289] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:17.289] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.289] ...future.FUN(...future.X_jj, ...) [18:41:17.289] }) [18:41:17.289] } [18:41:17.289] }, args = future.call.arguments) [18:41:17.289] } [18:41:17.289] Tweak future expression to call with '...' arguments ... DONE [18:41:17.290] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.290] [18:41:17.290] getGlobalsAndPackages() ... DONE [18:41:17.290] run() for 'Future' ... [18:41:17.291] - state: 'created' [18:41:17.291] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:17.291] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:17.291] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:17.292] - Field: 'label' [18:41:17.292] - Field: 'local' [18:41:17.292] - Field: 'owner' [18:41:17.292] - Field: 'envir' [18:41:17.292] - Field: 'packages' [18:41:17.293] - Field: 'gc' [18:41:17.293] - Field: 'conditions' [18:41:17.293] - Field: 'expr' [18:41:17.293] - Field: 'uuid' [18:41:17.293] - Field: 'seed' [18:41:17.293] - Field: 'version' [18:41:17.294] - Field: 'result' [18:41:17.294] - Field: 'asynchronous' [18:41:17.294] - Field: 'calls' [18:41:17.294] - Field: 'globals' [18:41:17.294] - Field: 'stdout' [18:41:17.294] - Field: 'earlySignal' [18:41:17.295] - Field: 'lazy' [18:41:17.295] - Field: 'state' [18:41:17.295] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:17.295] - Launch lazy future ... [18:41:17.295] Packages needed by the future expression (n = 0): [18:41:17.295] Packages needed by future strategies (n = 0): [18:41:17.296] { [18:41:17.296] { [18:41:17.296] { [18:41:17.296] ...future.startTime <- base::Sys.time() [18:41:17.296] { [18:41:17.296] { [18:41:17.296] { [18:41:17.296] base::local({ [18:41:17.296] has_future <- base::requireNamespace("future", [18:41:17.296] quietly = TRUE) [18:41:17.296] if (has_future) { [18:41:17.296] ns <- base::getNamespace("future") [18:41:17.296] version <- ns[[".package"]][["version"]] [18:41:17.296] if (is.null(version)) [18:41:17.296] version <- utils::packageVersion("future") [18:41:17.296] } [18:41:17.296] else { [18:41:17.296] version <- NULL [18:41:17.296] } [18:41:17.296] if (!has_future || version < "1.8.0") { [18:41:17.296] info <- base::c(r_version = base::gsub("R version ", [18:41:17.296] "", base::R.version$version.string), [18:41:17.296] platform = base::sprintf("%s (%s-bit)", [18:41:17.296] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:17.296] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:17.296] "release", "version")], collapse = " "), [18:41:17.296] hostname = base::Sys.info()[["nodename"]]) [18:41:17.296] info <- base::sprintf("%s: %s", base::names(info), [18:41:17.296] info) [18:41:17.296] info <- base::paste(info, collapse = "; ") [18:41:17.296] if (!has_future) { [18:41:17.296] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:17.296] info) [18:41:17.296] } [18:41:17.296] else { [18:41:17.296] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:17.296] info, version) [18:41:17.296] } [18:41:17.296] base::stop(msg) [18:41:17.296] } [18:41:17.296] }) [18:41:17.296] } [18:41:17.296] ...future.strategy.old <- future::plan("list") [18:41:17.296] options(future.plan = NULL) [18:41:17.296] Sys.unsetenv("R_FUTURE_PLAN") [18:41:17.296] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:17.296] } [18:41:17.296] ...future.workdir <- getwd() [18:41:17.296] } [18:41:17.296] ...future.oldOptions <- base::as.list(base::.Options) [18:41:17.296] ...future.oldEnvVars <- base::Sys.getenv() [18:41:17.296] } [18:41:17.296] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:17.296] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:17.296] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:17.296] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:17.296] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:17.296] future.stdout.windows.reencode = NULL, width = 80L) [18:41:17.296] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:17.296] base::names(...future.oldOptions)) [18:41:17.296] } [18:41:17.296] if (FALSE) { [18:41:17.296] } [18:41:17.296] else { [18:41:17.296] if (TRUE) { [18:41:17.296] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:17.296] open = "w") [18:41:17.296] } [18:41:17.296] else { [18:41:17.296] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:17.296] windows = "NUL", "/dev/null"), open = "w") [18:41:17.296] } [18:41:17.296] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:17.296] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:17.296] base::sink(type = "output", split = FALSE) [18:41:17.296] base::close(...future.stdout) [18:41:17.296] }, add = TRUE) [18:41:17.296] } [18:41:17.296] ...future.frame <- base::sys.nframe() [18:41:17.296] ...future.conditions <- base::list() [18:41:17.296] ...future.rng <- base::globalenv()$.Random.seed [18:41:17.296] if (FALSE) { [18:41:17.296] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:17.296] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:17.296] } [18:41:17.296] ...future.result <- base::tryCatch({ [18:41:17.296] base::withCallingHandlers({ [18:41:17.296] ...future.value <- base::withVisible(base::local({ [18:41:17.296] do.call(function(...) { [18:41:17.296] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.296] if (!identical(...future.globals.maxSize.org, [18:41:17.296] ...future.globals.maxSize)) { [18:41:17.296] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.296] on.exit(options(oopts), add = TRUE) [18:41:17.296] } [18:41:17.296] { [18:41:17.296] lapply(seq_along(...future.elements_ii), [18:41:17.296] FUN = function(jj) { [18:41:17.296] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.296] ...future.FUN(...future.X_jj, ...) [18:41:17.296] }) [18:41:17.296] } [18:41:17.296] }, args = future.call.arguments) [18:41:17.296] })) [18:41:17.296] future::FutureResult(value = ...future.value$value, [18:41:17.296] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:17.296] ...future.rng), globalenv = if (FALSE) [18:41:17.296] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:17.296] ...future.globalenv.names)) [18:41:17.296] else NULL, started = ...future.startTime, version = "1.8") [18:41:17.296] }, condition = base::local({ [18:41:17.296] c <- base::c [18:41:17.296] inherits <- base::inherits [18:41:17.296] invokeRestart <- base::invokeRestart [18:41:17.296] length <- base::length [18:41:17.296] list <- base::list [18:41:17.296] seq.int <- base::seq.int [18:41:17.296] signalCondition <- base::signalCondition [18:41:17.296] sys.calls <- base::sys.calls [18:41:17.296] `[[` <- base::`[[` [18:41:17.296] `+` <- base::`+` [18:41:17.296] `<<-` <- base::`<<-` [18:41:17.296] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:17.296] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:17.296] 3L)] [18:41:17.296] } [18:41:17.296] function(cond) { [18:41:17.296] is_error <- inherits(cond, "error") [18:41:17.296] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:17.296] NULL) [18:41:17.296] if (is_error) { [18:41:17.296] sessionInformation <- function() { [18:41:17.296] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:17.296] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:17.296] search = base::search(), system = base::Sys.info()) [18:41:17.296] } [18:41:17.296] ...future.conditions[[length(...future.conditions) + [18:41:17.296] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:17.296] cond$call), session = sessionInformation(), [18:41:17.296] timestamp = base::Sys.time(), signaled = 0L) [18:41:17.296] signalCondition(cond) [18:41:17.296] } [18:41:17.296] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:17.296] "immediateCondition"))) { [18:41:17.296] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:17.296] ...future.conditions[[length(...future.conditions) + [18:41:17.296] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:17.296] if (TRUE && !signal) { [18:41:17.296] muffleCondition <- function (cond, pattern = "^muffle") [18:41:17.296] { [18:41:17.296] inherits <- base::inherits [18:41:17.296] invokeRestart <- base::invokeRestart [18:41:17.296] is.null <- base::is.null [18:41:17.296] muffled <- FALSE [18:41:17.296] if (inherits(cond, "message")) { [18:41:17.296] muffled <- grepl(pattern, "muffleMessage") [18:41:17.296] if (muffled) [18:41:17.296] invokeRestart("muffleMessage") [18:41:17.296] } [18:41:17.296] else if (inherits(cond, "warning")) { [18:41:17.296] muffled <- grepl(pattern, "muffleWarning") [18:41:17.296] if (muffled) [18:41:17.296] invokeRestart("muffleWarning") [18:41:17.296] } [18:41:17.296] else if (inherits(cond, "condition")) { [18:41:17.296] if (!is.null(pattern)) { [18:41:17.296] computeRestarts <- base::computeRestarts [18:41:17.296] grepl <- base::grepl [18:41:17.296] restarts <- computeRestarts(cond) [18:41:17.296] for (restart in restarts) { [18:41:17.296] name <- restart$name [18:41:17.296] if (is.null(name)) [18:41:17.296] next [18:41:17.296] if (!grepl(pattern, name)) [18:41:17.296] next [18:41:17.296] invokeRestart(restart) [18:41:17.296] muffled <- TRUE [18:41:17.296] break [18:41:17.296] } [18:41:17.296] } [18:41:17.296] } [18:41:17.296] invisible(muffled) [18:41:17.296] } [18:41:17.296] muffleCondition(cond, pattern = "^muffle") [18:41:17.296] } [18:41:17.296] } [18:41:17.296] else { [18:41:17.296] if (TRUE) { [18:41:17.296] muffleCondition <- function (cond, pattern = "^muffle") [18:41:17.296] { [18:41:17.296] inherits <- base::inherits [18:41:17.296] invokeRestart <- base::invokeRestart [18:41:17.296] is.null <- base::is.null [18:41:17.296] muffled <- FALSE [18:41:17.296] if (inherits(cond, "message")) { [18:41:17.296] muffled <- grepl(pattern, "muffleMessage") [18:41:17.296] if (muffled) [18:41:17.296] invokeRestart("muffleMessage") [18:41:17.296] } [18:41:17.296] else if (inherits(cond, "warning")) { [18:41:17.296] muffled <- grepl(pattern, "muffleWarning") [18:41:17.296] if (muffled) [18:41:17.296] invokeRestart("muffleWarning") [18:41:17.296] } [18:41:17.296] else if (inherits(cond, "condition")) { [18:41:17.296] if (!is.null(pattern)) { [18:41:17.296] computeRestarts <- base::computeRestarts [18:41:17.296] grepl <- base::grepl [18:41:17.296] restarts <- computeRestarts(cond) [18:41:17.296] for (restart in restarts) { [18:41:17.296] name <- restart$name [18:41:17.296] if (is.null(name)) [18:41:17.296] next [18:41:17.296] if (!grepl(pattern, name)) [18:41:17.296] next [18:41:17.296] invokeRestart(restart) [18:41:17.296] muffled <- TRUE [18:41:17.296] break [18:41:17.296] } [18:41:17.296] } [18:41:17.296] } [18:41:17.296] invisible(muffled) [18:41:17.296] } [18:41:17.296] muffleCondition(cond, pattern = "^muffle") [18:41:17.296] } [18:41:17.296] } [18:41:17.296] } [18:41:17.296] })) [18:41:17.296] }, error = function(ex) { [18:41:17.296] base::structure(base::list(value = NULL, visible = NULL, [18:41:17.296] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:17.296] ...future.rng), started = ...future.startTime, [18:41:17.296] finished = Sys.time(), session_uuid = NA_character_, [18:41:17.296] version = "1.8"), class = "FutureResult") [18:41:17.296] }, finally = { [18:41:17.296] if (!identical(...future.workdir, getwd())) [18:41:17.296] setwd(...future.workdir) [18:41:17.296] { [18:41:17.296] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:17.296] ...future.oldOptions$nwarnings <- NULL [18:41:17.296] } [18:41:17.296] base::options(...future.oldOptions) [18:41:17.296] if (.Platform$OS.type == "windows") { [18:41:17.296] old_names <- names(...future.oldEnvVars) [18:41:17.296] envs <- base::Sys.getenv() [18:41:17.296] names <- names(envs) [18:41:17.296] common <- intersect(names, old_names) [18:41:17.296] added <- setdiff(names, old_names) [18:41:17.296] removed <- setdiff(old_names, names) [18:41:17.296] changed <- common[...future.oldEnvVars[common] != [18:41:17.296] envs[common]] [18:41:17.296] NAMES <- toupper(changed) [18:41:17.296] args <- list() [18:41:17.296] for (kk in seq_along(NAMES)) { [18:41:17.296] name <- changed[[kk]] [18:41:17.296] NAME <- NAMES[[kk]] [18:41:17.296] if (name != NAME && is.element(NAME, old_names)) [18:41:17.296] next [18:41:17.296] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:17.296] } [18:41:17.296] NAMES <- toupper(added) [18:41:17.296] for (kk in seq_along(NAMES)) { [18:41:17.296] name <- added[[kk]] [18:41:17.296] NAME <- NAMES[[kk]] [18:41:17.296] if (name != NAME && is.element(NAME, old_names)) [18:41:17.296] next [18:41:17.296] args[[name]] <- "" [18:41:17.296] } [18:41:17.296] NAMES <- toupper(removed) [18:41:17.296] for (kk in seq_along(NAMES)) { [18:41:17.296] name <- removed[[kk]] [18:41:17.296] NAME <- NAMES[[kk]] [18:41:17.296] if (name != NAME && is.element(NAME, old_names)) [18:41:17.296] next [18:41:17.296] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:17.296] } [18:41:17.296] if (length(args) > 0) [18:41:17.296] base::do.call(base::Sys.setenv, args = args) [18:41:17.296] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:17.296] } [18:41:17.296] else { [18:41:17.296] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:17.296] } [18:41:17.296] { [18:41:17.296] if (base::length(...future.futureOptionsAdded) > [18:41:17.296] 0L) { [18:41:17.296] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:17.296] base::names(opts) <- ...future.futureOptionsAdded [18:41:17.296] base::options(opts) [18:41:17.296] } [18:41:17.296] { [18:41:17.296] { [18:41:17.296] NULL [18:41:17.296] RNGkind("Mersenne-Twister") [18:41:17.296] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:17.296] inherits = FALSE) [18:41:17.296] } [18:41:17.296] options(future.plan = NULL) [18:41:17.296] if (is.na(NA_character_)) [18:41:17.296] Sys.unsetenv("R_FUTURE_PLAN") [18:41:17.296] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:17.296] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:17.296] .init = FALSE) [18:41:17.296] } [18:41:17.296] } [18:41:17.296] } [18:41:17.296] }) [18:41:17.296] if (TRUE) { [18:41:17.296] base::sink(type = "output", split = FALSE) [18:41:17.296] if (TRUE) { [18:41:17.296] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:17.296] } [18:41:17.296] else { [18:41:17.296] ...future.result["stdout"] <- base::list(NULL) [18:41:17.296] } [18:41:17.296] base::close(...future.stdout) [18:41:17.296] ...future.stdout <- NULL [18:41:17.296] } [18:41:17.296] ...future.result$conditions <- ...future.conditions [18:41:17.296] ...future.result$finished <- base::Sys.time() [18:41:17.296] ...future.result [18:41:17.296] } [18:41:17.300] assign_globals() ... [18:41:17.300] List of 5 [18:41:17.300] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:17.300] $ future.call.arguments :List of 1 [18:41:17.300] ..$ length: int 2 [18:41:17.300] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:17.300] $ ...future.elements_ii :List of 4 [18:41:17.300] ..$ c: chr "list" [18:41:17.300] ..$ c: chr "character" [18:41:17.300] ..$ b: chr "numeric" [18:41:17.300] ..$ a: chr "integer" [18:41:17.300] $ ...future.seeds_ii : NULL [18:41:17.300] $ ...future.globals.maxSize: NULL [18:41:17.300] - attr(*, "where")=List of 5 [18:41:17.300] ..$ ...future.FUN : [18:41:17.300] ..$ future.call.arguments : [18:41:17.300] ..$ ...future.elements_ii : [18:41:17.300] ..$ ...future.seeds_ii : [18:41:17.300] ..$ ...future.globals.maxSize: [18:41:17.300] - attr(*, "resolved")= logi FALSE [18:41:17.300] - attr(*, "total_size")= num 4799 [18:41:17.300] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:17.300] - attr(*, "already-done")= logi TRUE [18:41:17.307] - copied '...future.FUN' to environment [18:41:17.307] - copied 'future.call.arguments' to environment [18:41:17.307] - copied '...future.elements_ii' to environment [18:41:17.308] - copied '...future.seeds_ii' to environment [18:41:17.308] - copied '...future.globals.maxSize' to environment [18:41:17.308] assign_globals() ... done [18:41:17.308] plan(): Setting new future strategy stack: [18:41:17.308] List of future strategies: [18:41:17.308] 1. sequential: [18:41:17.308] - args: function (..., envir = parent.frame(), workers = "") [18:41:17.308] - tweaked: FALSE [18:41:17.308] - call: NULL [18:41:17.309] plan(): nbrOfWorkers() = 1 [18:41:17.310] plan(): Setting new future strategy stack: [18:41:17.310] List of future strategies: [18:41:17.310] 1. sequential: [18:41:17.310] - args: function (..., envir = parent.frame(), workers = "") [18:41:17.310] - tweaked: FALSE [18:41:17.310] - call: plan(strategy) [18:41:17.311] plan(): nbrOfWorkers() = 1 [18:41:17.311] SequentialFuture started (and completed) [18:41:17.312] - Launch lazy future ... done [18:41:17.312] run() for 'SequentialFuture' ... done [18:41:17.312] Created future: [18:41:17.312] SequentialFuture: [18:41:17.312] Label: 'future_lapply-1' [18:41:17.312] Expression: [18:41:17.312] { [18:41:17.312] do.call(function(...) { [18:41:17.312] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.312] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:17.312] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.312] on.exit(options(oopts), add = TRUE) [18:41:17.312] } [18:41:17.312] { [18:41:17.312] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:17.312] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.312] ...future.FUN(...future.X_jj, ...) [18:41:17.312] }) [18:41:17.312] } [18:41:17.312] }, args = future.call.arguments) [18:41:17.312] } [18:41:17.312] Lazy evaluation: FALSE [18:41:17.312] Asynchronous evaluation: FALSE [18:41:17.312] Local evaluation: TRUE [18:41:17.312] Environment: R_GlobalEnv [18:41:17.312] Capture standard output: TRUE [18:41:17.312] Capture condition classes: 'condition' (excluding 'nothing') [18:41:17.312] Globals: 5 objects totaling 853 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 191 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:17.312] Packages: [18:41:17.312] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:17.312] Resolved: TRUE [18:41:17.312] Value: 111 bytes of class 'list' [18:41:17.312] Early signaling: FALSE [18:41:17.312] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:17.312] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:17.313] Chunk #1 of 1 ... DONE [18:41:17.313] Launching 1 futures (chunks) ... DONE [18:41:17.313] Resolving 1 futures (chunks) ... [18:41:17.314] resolve() on list ... [18:41:17.314] recursive: 0 [18:41:17.314] length: 1 [18:41:17.314] [18:41:17.314] resolved() for 'SequentialFuture' ... [18:41:17.315] - state: 'finished' [18:41:17.315] - run: TRUE [18:41:17.315] - result: 'FutureResult' [18:41:17.315] resolved() for 'SequentialFuture' ... done [18:41:17.315] Future #1 [18:41:17.315] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:17.316] - nx: 1 [18:41:17.316] - relay: TRUE [18:41:17.316] - stdout: TRUE [18:41:17.316] - signal: TRUE [18:41:17.316] - resignal: FALSE [18:41:17.316] - force: TRUE [18:41:17.316] - relayed: [n=1] FALSE [18:41:17.317] - queued futures: [n=1] FALSE [18:41:17.317] - until=1 [18:41:17.317] - relaying element #1 [18:41:17.317] - relayed: [n=1] TRUE [18:41:17.317] - queued futures: [n=1] TRUE [18:41:17.318] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:17.318] length: 0 (resolved future 1) [18:41:17.318] Relaying remaining futures [18:41:17.318] signalConditionsASAP(NULL, pos=0) ... [18:41:17.318] - nx: 1 [18:41:17.318] - relay: TRUE [18:41:17.319] - stdout: TRUE [18:41:17.319] - signal: TRUE [18:41:17.319] - resignal: FALSE [18:41:17.319] - force: TRUE [18:41:17.319] - relayed: [n=1] TRUE [18:41:17.319] - queued futures: [n=1] TRUE - flush all [18:41:17.319] - relayed: [n=1] TRUE [18:41:17.320] - queued futures: [n=1] TRUE [18:41:17.320] signalConditionsASAP(NULL, pos=0) ... done [18:41:17.320] resolve() on list ... DONE [18:41:17.320] - Number of value chunks collected: 1 [18:41:17.320] Resolving 1 futures (chunks) ... DONE [18:41:17.321] Reducing values from 1 chunks ... [18:41:17.321] - Number of values collected after concatenation: 4 [18:41:17.321] - Number of values expected: 4 [18:41:17.321] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [18:41:17.321] Reducing values from 1 chunks ... DONE [18:41:17.321] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL - future_lapply(x, FUN = base::vector, ...) ... [18:41:17.324] future_lapply() ... [18:41:17.325] Number of chunks: 1 [18:41:17.325] Index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [18:41:17.325] getGlobalsAndPackagesXApply() ... [18:41:17.325] - future.globals: TRUE [18:41:17.325] getGlobalsAndPackages() ... [18:41:17.326] Searching for globals... [18:41:17.327] - globals found: [2] 'FUN', '.Internal' [18:41:17.327] Searching for globals ... DONE [18:41:17.327] Resolving globals: FALSE [18:41:17.328] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:17.328] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:17.328] - globals: [1] 'FUN' [18:41:17.328] [18:41:17.329] getGlobalsAndPackages() ... DONE [18:41:17.329] - globals found/used: [n=1] 'FUN' [18:41:17.329] - needed namespaces: [n=0] [18:41:17.329] Finding globals ... DONE [18:41:17.329] - use_args: TRUE [18:41:17.329] - Getting '...' globals ... [18:41:17.330] resolve() on list ... [18:41:17.330] recursive: 0 [18:41:17.330] length: 1 [18:41:17.330] elements: '...' [18:41:17.331] length: 0 (resolved future 1) [18:41:17.331] resolve() on list ... DONE [18:41:17.331] - '...' content: [n=1] 'length' [18:41:17.331] List of 1 [18:41:17.331] $ ...:List of 1 [18:41:17.331] ..$ length: int 2 [18:41:17.331] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:17.331] - attr(*, "where")=List of 1 [18:41:17.331] ..$ ...: [18:41:17.331] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:17.331] - attr(*, "resolved")= logi TRUE [18:41:17.331] - attr(*, "total_size")= num NA [18:41:17.334] - Getting '...' globals ... DONE [18:41:17.335] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:17.335] List of 2 [18:41:17.335] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:17.335] $ ... :List of 1 [18:41:17.335] ..$ length: int 2 [18:41:17.335] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:17.335] - attr(*, "where")=List of 2 [18:41:17.335] ..$ ...future.FUN: [18:41:17.335] ..$ ... : [18:41:17.335] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:17.335] - attr(*, "resolved")= logi FALSE [18:41:17.335] - attr(*, "total_size")= int 4881 [18:41:17.338] Packages to be attached in all futures: [n=0] [18:41:17.339] getGlobalsAndPackagesXApply() ... DONE [18:41:17.339] Number of futures (= number of chunks): 1 [18:41:17.339] Launching 1 futures (chunks) ... [18:41:17.339] Chunk #1 of 1 ... [18:41:17.339] - Finding globals in 'X' for chunk #1 ... [18:41:17.340] getGlobalsAndPackages() ... [18:41:17.340] Searching for globals... [18:41:17.340] [18:41:17.340] Searching for globals ... DONE [18:41:17.340] - globals: [0] [18:41:17.341] getGlobalsAndPackages() ... DONE [18:41:17.341] + additional globals found: [n=0] [18:41:17.341] + additional namespaces needed: [n=0] [18:41:17.341] - Finding globals in 'X' for chunk #1 ... DONE [18:41:17.341] - seeds: [18:41:17.341] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.342] getGlobalsAndPackages() ... [18:41:17.342] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.342] Resolving globals: FALSE [18:41:17.342] Tweak future expression to call with '...' arguments ... [18:41:17.342] { [18:41:17.342] do.call(function(...) { [18:41:17.342] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.342] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:17.342] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.342] on.exit(options(oopts), add = TRUE) [18:41:17.342] } [18:41:17.342] { [18:41:17.342] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:17.342] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.342] ...future.FUN(...future.X_jj, ...) [18:41:17.342] }) [18:41:17.342] } [18:41:17.342] }, args = future.call.arguments) [18:41:17.342] } [18:41:17.343] Tweak future expression to call with '...' arguments ... DONE [18:41:17.343] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.343] [18:41:17.343] getGlobalsAndPackages() ... DONE [18:41:17.344] run() for 'Future' ... [18:41:17.344] - state: 'created' [18:41:17.344] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:17.345] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:17.345] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:17.345] - Field: 'label' [18:41:17.345] - Field: 'local' [18:41:17.345] - Field: 'owner' [18:41:17.346] - Field: 'envir' [18:41:17.346] - Field: 'packages' [18:41:17.346] - Field: 'gc' [18:41:17.346] - Field: 'conditions' [18:41:17.346] - Field: 'expr' [18:41:17.347] - Field: 'uuid' [18:41:17.347] - Field: 'seed' [18:41:17.347] - Field: 'version' [18:41:17.347] - Field: 'result' [18:41:17.347] - Field: 'asynchronous' [18:41:17.347] - Field: 'calls' [18:41:17.348] - Field: 'globals' [18:41:17.348] - Field: 'stdout' [18:41:17.348] - Field: 'earlySignal' [18:41:17.348] - Field: 'lazy' [18:41:17.348] - Field: 'state' [18:41:17.348] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:17.349] - Launch lazy future ... [18:41:17.349] Packages needed by the future expression (n = 0): [18:41:17.349] Packages needed by future strategies (n = 0): [18:41:17.350] { [18:41:17.350] { [18:41:17.350] { [18:41:17.350] ...future.startTime <- base::Sys.time() [18:41:17.350] { [18:41:17.350] { [18:41:17.350] { [18:41:17.350] base::local({ [18:41:17.350] has_future <- base::requireNamespace("future", [18:41:17.350] quietly = TRUE) [18:41:17.350] if (has_future) { [18:41:17.350] ns <- base::getNamespace("future") [18:41:17.350] version <- ns[[".package"]][["version"]] [18:41:17.350] if (is.null(version)) [18:41:17.350] version <- utils::packageVersion("future") [18:41:17.350] } [18:41:17.350] else { [18:41:17.350] version <- NULL [18:41:17.350] } [18:41:17.350] if (!has_future || version < "1.8.0") { [18:41:17.350] info <- base::c(r_version = base::gsub("R version ", [18:41:17.350] "", base::R.version$version.string), [18:41:17.350] platform = base::sprintf("%s (%s-bit)", [18:41:17.350] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:17.350] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:17.350] "release", "version")], collapse = " "), [18:41:17.350] hostname = base::Sys.info()[["nodename"]]) [18:41:17.350] info <- base::sprintf("%s: %s", base::names(info), [18:41:17.350] info) [18:41:17.350] info <- base::paste(info, collapse = "; ") [18:41:17.350] if (!has_future) { [18:41:17.350] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:17.350] info) [18:41:17.350] } [18:41:17.350] else { [18:41:17.350] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:17.350] info, version) [18:41:17.350] } [18:41:17.350] base::stop(msg) [18:41:17.350] } [18:41:17.350] }) [18:41:17.350] } [18:41:17.350] ...future.strategy.old <- future::plan("list") [18:41:17.350] options(future.plan = NULL) [18:41:17.350] Sys.unsetenv("R_FUTURE_PLAN") [18:41:17.350] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:17.350] } [18:41:17.350] ...future.workdir <- getwd() [18:41:17.350] } [18:41:17.350] ...future.oldOptions <- base::as.list(base::.Options) [18:41:17.350] ...future.oldEnvVars <- base::Sys.getenv() [18:41:17.350] } [18:41:17.350] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:17.350] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:17.350] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:17.350] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:17.350] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:17.350] future.stdout.windows.reencode = NULL, width = 80L) [18:41:17.350] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:17.350] base::names(...future.oldOptions)) [18:41:17.350] } [18:41:17.350] if (FALSE) { [18:41:17.350] } [18:41:17.350] else { [18:41:17.350] if (TRUE) { [18:41:17.350] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:17.350] open = "w") [18:41:17.350] } [18:41:17.350] else { [18:41:17.350] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:17.350] windows = "NUL", "/dev/null"), open = "w") [18:41:17.350] } [18:41:17.350] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:17.350] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:17.350] base::sink(type = "output", split = FALSE) [18:41:17.350] base::close(...future.stdout) [18:41:17.350] }, add = TRUE) [18:41:17.350] } [18:41:17.350] ...future.frame <- base::sys.nframe() [18:41:17.350] ...future.conditions <- base::list() [18:41:17.350] ...future.rng <- base::globalenv()$.Random.seed [18:41:17.350] if (FALSE) { [18:41:17.350] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:17.350] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:17.350] } [18:41:17.350] ...future.result <- base::tryCatch({ [18:41:17.350] base::withCallingHandlers({ [18:41:17.350] ...future.value <- base::withVisible(base::local({ [18:41:17.350] do.call(function(...) { [18:41:17.350] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.350] if (!identical(...future.globals.maxSize.org, [18:41:17.350] ...future.globals.maxSize)) { [18:41:17.350] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.350] on.exit(options(oopts), add = TRUE) [18:41:17.350] } [18:41:17.350] { [18:41:17.350] lapply(seq_along(...future.elements_ii), [18:41:17.350] FUN = function(jj) { [18:41:17.350] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.350] ...future.FUN(...future.X_jj, ...) [18:41:17.350] }) [18:41:17.350] } [18:41:17.350] }, args = future.call.arguments) [18:41:17.350] })) [18:41:17.350] future::FutureResult(value = ...future.value$value, [18:41:17.350] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:17.350] ...future.rng), globalenv = if (FALSE) [18:41:17.350] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:17.350] ...future.globalenv.names)) [18:41:17.350] else NULL, started = ...future.startTime, version = "1.8") [18:41:17.350] }, condition = base::local({ [18:41:17.350] c <- base::c [18:41:17.350] inherits <- base::inherits [18:41:17.350] invokeRestart <- base::invokeRestart [18:41:17.350] length <- base::length [18:41:17.350] list <- base::list [18:41:17.350] seq.int <- base::seq.int [18:41:17.350] signalCondition <- base::signalCondition [18:41:17.350] sys.calls <- base::sys.calls [18:41:17.350] `[[` <- base::`[[` [18:41:17.350] `+` <- base::`+` [18:41:17.350] `<<-` <- base::`<<-` [18:41:17.350] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:17.350] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:17.350] 3L)] [18:41:17.350] } [18:41:17.350] function(cond) { [18:41:17.350] is_error <- inherits(cond, "error") [18:41:17.350] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:17.350] NULL) [18:41:17.350] if (is_error) { [18:41:17.350] sessionInformation <- function() { [18:41:17.350] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:17.350] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:17.350] search = base::search(), system = base::Sys.info()) [18:41:17.350] } [18:41:17.350] ...future.conditions[[length(...future.conditions) + [18:41:17.350] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:17.350] cond$call), session = sessionInformation(), [18:41:17.350] timestamp = base::Sys.time(), signaled = 0L) [18:41:17.350] signalCondition(cond) [18:41:17.350] } [18:41:17.350] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:17.350] "immediateCondition"))) { [18:41:17.350] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:17.350] ...future.conditions[[length(...future.conditions) + [18:41:17.350] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:17.350] if (TRUE && !signal) { [18:41:17.350] muffleCondition <- function (cond, pattern = "^muffle") [18:41:17.350] { [18:41:17.350] inherits <- base::inherits [18:41:17.350] invokeRestart <- base::invokeRestart [18:41:17.350] is.null <- base::is.null [18:41:17.350] muffled <- FALSE [18:41:17.350] if (inherits(cond, "message")) { [18:41:17.350] muffled <- grepl(pattern, "muffleMessage") [18:41:17.350] if (muffled) [18:41:17.350] invokeRestart("muffleMessage") [18:41:17.350] } [18:41:17.350] else if (inherits(cond, "warning")) { [18:41:17.350] muffled <- grepl(pattern, "muffleWarning") [18:41:17.350] if (muffled) [18:41:17.350] invokeRestart("muffleWarning") [18:41:17.350] } [18:41:17.350] else if (inherits(cond, "condition")) { [18:41:17.350] if (!is.null(pattern)) { [18:41:17.350] computeRestarts <- base::computeRestarts [18:41:17.350] grepl <- base::grepl [18:41:17.350] restarts <- computeRestarts(cond) [18:41:17.350] for (restart in restarts) { [18:41:17.350] name <- restart$name [18:41:17.350] if (is.null(name)) [18:41:17.350] next [18:41:17.350] if (!grepl(pattern, name)) [18:41:17.350] next [18:41:17.350] invokeRestart(restart) [18:41:17.350] muffled <- TRUE [18:41:17.350] break [18:41:17.350] } [18:41:17.350] } [18:41:17.350] } [18:41:17.350] invisible(muffled) [18:41:17.350] } [18:41:17.350] muffleCondition(cond, pattern = "^muffle") [18:41:17.350] } [18:41:17.350] } [18:41:17.350] else { [18:41:17.350] if (TRUE) { [18:41:17.350] muffleCondition <- function (cond, pattern = "^muffle") [18:41:17.350] { [18:41:17.350] inherits <- base::inherits [18:41:17.350] invokeRestart <- base::invokeRestart [18:41:17.350] is.null <- base::is.null [18:41:17.350] muffled <- FALSE [18:41:17.350] if (inherits(cond, "message")) { [18:41:17.350] muffled <- grepl(pattern, "muffleMessage") [18:41:17.350] if (muffled) [18:41:17.350] invokeRestart("muffleMessage") [18:41:17.350] } [18:41:17.350] else if (inherits(cond, "warning")) { [18:41:17.350] muffled <- grepl(pattern, "muffleWarning") [18:41:17.350] if (muffled) [18:41:17.350] invokeRestart("muffleWarning") [18:41:17.350] } [18:41:17.350] else if (inherits(cond, "condition")) { [18:41:17.350] if (!is.null(pattern)) { [18:41:17.350] computeRestarts <- base::computeRestarts [18:41:17.350] grepl <- base::grepl [18:41:17.350] restarts <- computeRestarts(cond) [18:41:17.350] for (restart in restarts) { [18:41:17.350] name <- restart$name [18:41:17.350] if (is.null(name)) [18:41:17.350] next [18:41:17.350] if (!grepl(pattern, name)) [18:41:17.350] next [18:41:17.350] invokeRestart(restart) [18:41:17.350] muffled <- TRUE [18:41:17.350] break [18:41:17.350] } [18:41:17.350] } [18:41:17.350] } [18:41:17.350] invisible(muffled) [18:41:17.350] } [18:41:17.350] muffleCondition(cond, pattern = "^muffle") [18:41:17.350] } [18:41:17.350] } [18:41:17.350] } [18:41:17.350] })) [18:41:17.350] }, error = function(ex) { [18:41:17.350] base::structure(base::list(value = NULL, visible = NULL, [18:41:17.350] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:17.350] ...future.rng), started = ...future.startTime, [18:41:17.350] finished = Sys.time(), session_uuid = NA_character_, [18:41:17.350] version = "1.8"), class = "FutureResult") [18:41:17.350] }, finally = { [18:41:17.350] if (!identical(...future.workdir, getwd())) [18:41:17.350] setwd(...future.workdir) [18:41:17.350] { [18:41:17.350] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:17.350] ...future.oldOptions$nwarnings <- NULL [18:41:17.350] } [18:41:17.350] base::options(...future.oldOptions) [18:41:17.350] if (.Platform$OS.type == "windows") { [18:41:17.350] old_names <- names(...future.oldEnvVars) [18:41:17.350] envs <- base::Sys.getenv() [18:41:17.350] names <- names(envs) [18:41:17.350] common <- intersect(names, old_names) [18:41:17.350] added <- setdiff(names, old_names) [18:41:17.350] removed <- setdiff(old_names, names) [18:41:17.350] changed <- common[...future.oldEnvVars[common] != [18:41:17.350] envs[common]] [18:41:17.350] NAMES <- toupper(changed) [18:41:17.350] args <- list() [18:41:17.350] for (kk in seq_along(NAMES)) { [18:41:17.350] name <- changed[[kk]] [18:41:17.350] NAME <- NAMES[[kk]] [18:41:17.350] if (name != NAME && is.element(NAME, old_names)) [18:41:17.350] next [18:41:17.350] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:17.350] } [18:41:17.350] NAMES <- toupper(added) [18:41:17.350] for (kk in seq_along(NAMES)) { [18:41:17.350] name <- added[[kk]] [18:41:17.350] NAME <- NAMES[[kk]] [18:41:17.350] if (name != NAME && is.element(NAME, old_names)) [18:41:17.350] next [18:41:17.350] args[[name]] <- "" [18:41:17.350] } [18:41:17.350] NAMES <- toupper(removed) [18:41:17.350] for (kk in seq_along(NAMES)) { [18:41:17.350] name <- removed[[kk]] [18:41:17.350] NAME <- NAMES[[kk]] [18:41:17.350] if (name != NAME && is.element(NAME, old_names)) [18:41:17.350] next [18:41:17.350] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:17.350] } [18:41:17.350] if (length(args) > 0) [18:41:17.350] base::do.call(base::Sys.setenv, args = args) [18:41:17.350] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:17.350] } [18:41:17.350] else { [18:41:17.350] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:17.350] } [18:41:17.350] { [18:41:17.350] if (base::length(...future.futureOptionsAdded) > [18:41:17.350] 0L) { [18:41:17.350] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:17.350] base::names(opts) <- ...future.futureOptionsAdded [18:41:17.350] base::options(opts) [18:41:17.350] } [18:41:17.350] { [18:41:17.350] { [18:41:17.350] NULL [18:41:17.350] RNGkind("Mersenne-Twister") [18:41:17.350] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:17.350] inherits = FALSE) [18:41:17.350] } [18:41:17.350] options(future.plan = NULL) [18:41:17.350] if (is.na(NA_character_)) [18:41:17.350] Sys.unsetenv("R_FUTURE_PLAN") [18:41:17.350] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:17.350] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:17.350] .init = FALSE) [18:41:17.350] } [18:41:17.350] } [18:41:17.350] } [18:41:17.350] }) [18:41:17.350] if (TRUE) { [18:41:17.350] base::sink(type = "output", split = FALSE) [18:41:17.350] if (TRUE) { [18:41:17.350] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:17.350] } [18:41:17.350] else { [18:41:17.350] ...future.result["stdout"] <- base::list(NULL) [18:41:17.350] } [18:41:17.350] base::close(...future.stdout) [18:41:17.350] ...future.stdout <- NULL [18:41:17.350] } [18:41:17.350] ...future.result$conditions <- ...future.conditions [18:41:17.350] ...future.result$finished <- base::Sys.time() [18:41:17.350] ...future.result [18:41:17.350] } [18:41:17.353] assign_globals() ... [18:41:17.354] List of 5 [18:41:17.354] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:17.354] $ future.call.arguments :List of 1 [18:41:17.354] ..$ length: int 2 [18:41:17.354] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:17.354] $ ...future.elements_ii :List of 4 [18:41:17.354] ..$ c: chr "list" [18:41:17.354] ..$ c: chr "character" [18:41:17.354] ..$ b: chr "numeric" [18:41:17.354] ..$ a: chr "integer" [18:41:17.354] $ ...future.seeds_ii : NULL [18:41:17.354] $ ...future.globals.maxSize: NULL [18:41:17.354] - attr(*, "where")=List of 5 [18:41:17.354] ..$ ...future.FUN : [18:41:17.354] ..$ future.call.arguments : [18:41:17.354] ..$ ...future.elements_ii : [18:41:17.354] ..$ ...future.seeds_ii : [18:41:17.354] ..$ ...future.globals.maxSize: [18:41:17.354] - attr(*, "resolved")= logi FALSE [18:41:17.354] - attr(*, "total_size")= num 4881 [18:41:17.354] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:17.354] - attr(*, "already-done")= logi TRUE [18:41:17.360] - copied '...future.FUN' to environment [18:41:17.361] - copied 'future.call.arguments' to environment [18:41:17.361] - copied '...future.elements_ii' to environment [18:41:17.361] - copied '...future.seeds_ii' to environment [18:41:17.361] - copied '...future.globals.maxSize' to environment [18:41:17.361] assign_globals() ... done [18:41:17.362] plan(): Setting new future strategy stack: [18:41:17.362] List of future strategies: [18:41:17.362] 1. sequential: [18:41:17.362] - args: function (..., envir = parent.frame(), workers = "") [18:41:17.362] - tweaked: FALSE [18:41:17.362] - call: NULL [18:41:17.362] plan(): nbrOfWorkers() = 1 [18:41:17.364] plan(): Setting new future strategy stack: [18:41:17.364] List of future strategies: [18:41:17.364] 1. sequential: [18:41:17.364] - args: function (..., envir = parent.frame(), workers = "") [18:41:17.364] - tweaked: FALSE [18:41:17.364] - call: plan(strategy) [18:41:17.364] plan(): nbrOfWorkers() = 1 [18:41:17.365] SequentialFuture started (and completed) [18:41:17.365] - Launch lazy future ... done [18:41:17.365] run() for 'SequentialFuture' ... done [18:41:17.365] Created future: [18:41:17.365] SequentialFuture: [18:41:17.365] Label: 'future_lapply-1' [18:41:17.365] Expression: [18:41:17.365] { [18:41:17.365] do.call(function(...) { [18:41:17.365] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.365] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:17.365] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.365] on.exit(options(oopts), add = TRUE) [18:41:17.365] } [18:41:17.365] { [18:41:17.365] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:17.365] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.365] ...future.FUN(...future.X_jj, ...) [18:41:17.365] }) [18:41:17.365] } [18:41:17.365] }, args = future.call.arguments) [18:41:17.365] } [18:41:17.365] Lazy evaluation: FALSE [18:41:17.365] Asynchronous evaluation: FALSE [18:41:17.365] Local evaluation: TRUE [18:41:17.365] Environment: R_GlobalEnv [18:41:17.365] Capture standard output: TRUE [18:41:17.365] Capture condition classes: 'condition' (excluding 'nothing') [18:41:17.365] Globals: 5 objects totaling 853 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 191 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:17.365] Packages: [18:41:17.365] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:17.365] Resolved: TRUE [18:41:17.365] Value: 111 bytes of class 'list' [18:41:17.365] Early signaling: FALSE [18:41:17.365] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:17.365] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:17.366] Chunk #1 of 1 ... DONE [18:41:17.367] Launching 1 futures (chunks) ... DONE [18:41:17.367] Resolving 1 futures (chunks) ... [18:41:17.367] resolve() on list ... [18:41:17.367] recursive: 0 [18:41:17.367] length: 1 [18:41:17.367] [18:41:17.368] resolved() for 'SequentialFuture' ... [18:41:17.368] - state: 'finished' [18:41:17.368] - run: TRUE [18:41:17.368] - result: 'FutureResult' [18:41:17.368] resolved() for 'SequentialFuture' ... done [18:41:17.369] Future #1 [18:41:17.369] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:17.369] - nx: 1 [18:41:17.369] - relay: TRUE [18:41:17.369] - stdout: TRUE [18:41:17.369] - signal: TRUE [18:41:17.369] - resignal: FALSE [18:41:17.370] - force: TRUE [18:41:17.370] - relayed: [n=1] FALSE [18:41:17.370] - queued futures: [n=1] FALSE [18:41:17.370] - until=1 [18:41:17.370] - relaying element #1 [18:41:17.371] - relayed: [n=1] TRUE [18:41:17.371] - queued futures: [n=1] TRUE [18:41:17.371] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:17.371] length: 0 (resolved future 1) [18:41:17.371] Relaying remaining futures [18:41:17.371] signalConditionsASAP(NULL, pos=0) ... [18:41:17.372] - nx: 1 [18:41:17.372] - relay: TRUE [18:41:17.372] - stdout: TRUE [18:41:17.372] - signal: TRUE [18:41:17.372] - resignal: FALSE [18:41:17.372] - force: TRUE [18:41:17.372] - relayed: [n=1] TRUE [18:41:17.373] - queued futures: [n=1] TRUE - flush all [18:41:17.373] - relayed: [n=1] TRUE [18:41:17.373] - queued futures: [n=1] TRUE [18:41:17.373] signalConditionsASAP(NULL, pos=0) ... done [18:41:17.373] resolve() on list ... DONE [18:41:17.374] - Number of value chunks collected: 1 [18:41:17.374] Resolving 1 futures (chunks) ... DONE [18:41:17.374] Reducing values from 1 chunks ... [18:41:17.374] - Number of values collected after concatenation: 4 [18:41:17.374] - Number of values expected: 4 [18:41:17.374] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [18:41:17.374] Reducing values from 1 chunks ... DONE [18:41:17.375] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL - future_lapply(x, FUN = future:::hpaste, ...) ... [18:41:17.379] future_lapply() ... [18:41:17.387] Number of chunks: 1 [18:41:17.388] getGlobalsAndPackagesXApply() ... [18:41:17.388] - future.globals: TRUE [18:41:17.388] getGlobalsAndPackages() ... [18:41:17.388] Searching for globals... [18:41:17.398] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [18:41:17.398] Searching for globals ... DONE [18:41:17.398] Resolving globals: FALSE [18:41:17.399] The total size of the 1 globals is 7.17 KiB (7342 bytes) [18:41:17.400] The total size of the 1 globals exported for future expression ('FUN(collapse = "; ", maxHead = 3L)') is 7.17 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (7.17 KiB of class 'function') [18:41:17.400] - globals: [1] 'FUN' [18:41:17.400] - packages: [1] 'future' [18:41:17.400] getGlobalsAndPackages() ... DONE [18:41:17.400] - globals found/used: [n=1] 'FUN' [18:41:17.401] - needed namespaces: [n=1] 'future' [18:41:17.401] Finding globals ... DONE [18:41:17.401] - use_args: TRUE [18:41:17.401] - Getting '...' globals ... [18:41:17.401] resolve() on list ... [18:41:17.402] recursive: 0 [18:41:17.402] length: 1 [18:41:17.402] elements: '...' [18:41:17.402] length: 0 (resolved future 1) [18:41:17.402] resolve() on list ... DONE [18:41:17.402] - '...' content: [n=2] 'collapse', 'maxHead' [18:41:17.403] List of 1 [18:41:17.403] $ ...:List of 2 [18:41:17.403] ..$ collapse: chr "; " [18:41:17.403] ..$ maxHead : int 3 [18:41:17.403] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:17.403] - attr(*, "where")=List of 1 [18:41:17.403] ..$ ...: [18:41:17.403] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:17.403] - attr(*, "resolved")= logi TRUE [18:41:17.403] - attr(*, "total_size")= num NA [18:41:17.406] - Getting '...' globals ... DONE [18:41:17.407] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:17.407] List of 2 [18:41:17.407] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [18:41:17.407] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [18:41:17.407] $ ... :List of 2 [18:41:17.407] ..$ collapse: chr "; " [18:41:17.407] ..$ maxHead : int 3 [18:41:17.407] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:17.407] - attr(*, "where")=List of 2 [18:41:17.407] ..$ ...future.FUN: [18:41:17.407] ..$ ... : [18:41:17.407] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:17.407] - attr(*, "resolved")= logi FALSE [18:41:17.407] - attr(*, "total_size")= int 20741 [18:41:17.411] Packages to be attached in all futures: [n=1] 'future' [18:41:17.411] getGlobalsAndPackagesXApply() ... DONE [18:41:17.411] Number of futures (= number of chunks): 1 [18:41:17.412] Launching 1 futures (chunks) ... [18:41:17.412] Chunk #1 of 1 ... [18:41:17.412] - Finding globals in 'X' for chunk #1 ... [18:41:17.412] getGlobalsAndPackages() ... [18:41:17.412] Searching for globals... [18:41:17.413] [18:41:17.413] Searching for globals ... DONE [18:41:17.413] - globals: [0] [18:41:17.413] getGlobalsAndPackages() ... DONE [18:41:17.413] + additional globals found: [n=0] [18:41:17.413] + additional namespaces needed: [n=0] [18:41:17.413] - Finding globals in 'X' for chunk #1 ... DONE [18:41:17.414] - seeds: [18:41:17.414] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.414] getGlobalsAndPackages() ... [18:41:17.414] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.414] Resolving globals: FALSE [18:41:17.414] Tweak future expression to call with '...' arguments ... [18:41:17.415] { [18:41:17.415] do.call(function(...) { [18:41:17.415] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.415] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:17.415] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.415] on.exit(options(oopts), add = TRUE) [18:41:17.415] } [18:41:17.415] { [18:41:17.415] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:17.415] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.415] ...future.FUN(...future.X_jj, ...) [18:41:17.415] }) [18:41:17.415] } [18:41:17.415] }, args = future.call.arguments) [18:41:17.415] } [18:41:17.415] Tweak future expression to call with '...' arguments ... DONE [18:41:17.416] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.416] - packages: [1] 'future' [18:41:17.416] getGlobalsAndPackages() ... DONE [18:41:17.416] run() for 'Future' ... [18:41:17.417] - state: 'created' [18:41:17.417] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:17.417] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:17.417] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:17.418] - Field: 'label' [18:41:17.418] - Field: 'local' [18:41:17.418] - Field: 'owner' [18:41:17.418] - Field: 'envir' [18:41:17.418] - Field: 'packages' [18:41:17.418] - Field: 'gc' [18:41:17.419] - Field: 'conditions' [18:41:17.419] - Field: 'expr' [18:41:17.419] - Field: 'uuid' [18:41:17.419] - Field: 'seed' [18:41:17.419] - Field: 'version' [18:41:17.419] - Field: 'result' [18:41:17.420] - Field: 'asynchronous' [18:41:17.420] - Field: 'calls' [18:41:17.420] - Field: 'globals' [18:41:17.420] - Field: 'stdout' [18:41:17.420] - Field: 'earlySignal' [18:41:17.420] - Field: 'lazy' [18:41:17.421] - Field: 'state' [18:41:17.421] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:17.421] - Launch lazy future ... [18:41:17.421] Packages needed by the future expression (n = 1): 'future' [18:41:17.421] Packages needed by future strategies (n = 0): [18:41:17.422] { [18:41:17.422] { [18:41:17.422] { [18:41:17.422] ...future.startTime <- base::Sys.time() [18:41:17.422] { [18:41:17.422] { [18:41:17.422] { [18:41:17.422] { [18:41:17.422] base::local({ [18:41:17.422] has_future <- base::requireNamespace("future", [18:41:17.422] quietly = TRUE) [18:41:17.422] if (has_future) { [18:41:17.422] ns <- base::getNamespace("future") [18:41:17.422] version <- ns[[".package"]][["version"]] [18:41:17.422] if (is.null(version)) [18:41:17.422] version <- utils::packageVersion("future") [18:41:17.422] } [18:41:17.422] else { [18:41:17.422] version <- NULL [18:41:17.422] } [18:41:17.422] if (!has_future || version < "1.8.0") { [18:41:17.422] info <- base::c(r_version = base::gsub("R version ", [18:41:17.422] "", base::R.version$version.string), [18:41:17.422] platform = base::sprintf("%s (%s-bit)", [18:41:17.422] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:17.422] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:17.422] "release", "version")], collapse = " "), [18:41:17.422] hostname = base::Sys.info()[["nodename"]]) [18:41:17.422] info <- base::sprintf("%s: %s", base::names(info), [18:41:17.422] info) [18:41:17.422] info <- base::paste(info, collapse = "; ") [18:41:17.422] if (!has_future) { [18:41:17.422] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:17.422] info) [18:41:17.422] } [18:41:17.422] else { [18:41:17.422] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:17.422] info, version) [18:41:17.422] } [18:41:17.422] base::stop(msg) [18:41:17.422] } [18:41:17.422] }) [18:41:17.422] } [18:41:17.422] base::local({ [18:41:17.422] for (pkg in "future") { [18:41:17.422] base::loadNamespace(pkg) [18:41:17.422] base::library(pkg, character.only = TRUE) [18:41:17.422] } [18:41:17.422] }) [18:41:17.422] } [18:41:17.422] ...future.strategy.old <- future::plan("list") [18:41:17.422] options(future.plan = NULL) [18:41:17.422] Sys.unsetenv("R_FUTURE_PLAN") [18:41:17.422] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:17.422] } [18:41:17.422] ...future.workdir <- getwd() [18:41:17.422] } [18:41:17.422] ...future.oldOptions <- base::as.list(base::.Options) [18:41:17.422] ...future.oldEnvVars <- base::Sys.getenv() [18:41:17.422] } [18:41:17.422] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:17.422] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:17.422] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:17.422] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:17.422] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:17.422] future.stdout.windows.reencode = NULL, width = 80L) [18:41:17.422] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:17.422] base::names(...future.oldOptions)) [18:41:17.422] } [18:41:17.422] if (FALSE) { [18:41:17.422] } [18:41:17.422] else { [18:41:17.422] if (TRUE) { [18:41:17.422] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:17.422] open = "w") [18:41:17.422] } [18:41:17.422] else { [18:41:17.422] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:17.422] windows = "NUL", "/dev/null"), open = "w") [18:41:17.422] } [18:41:17.422] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:17.422] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:17.422] base::sink(type = "output", split = FALSE) [18:41:17.422] base::close(...future.stdout) [18:41:17.422] }, add = TRUE) [18:41:17.422] } [18:41:17.422] ...future.frame <- base::sys.nframe() [18:41:17.422] ...future.conditions <- base::list() [18:41:17.422] ...future.rng <- base::globalenv()$.Random.seed [18:41:17.422] if (FALSE) { [18:41:17.422] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:17.422] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:17.422] } [18:41:17.422] ...future.result <- base::tryCatch({ [18:41:17.422] base::withCallingHandlers({ [18:41:17.422] ...future.value <- base::withVisible(base::local({ [18:41:17.422] do.call(function(...) { [18:41:17.422] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.422] if (!identical(...future.globals.maxSize.org, [18:41:17.422] ...future.globals.maxSize)) { [18:41:17.422] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.422] on.exit(options(oopts), add = TRUE) [18:41:17.422] } [18:41:17.422] { [18:41:17.422] lapply(seq_along(...future.elements_ii), [18:41:17.422] FUN = function(jj) { [18:41:17.422] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.422] ...future.FUN(...future.X_jj, ...) [18:41:17.422] }) [18:41:17.422] } [18:41:17.422] }, args = future.call.arguments) [18:41:17.422] })) [18:41:17.422] future::FutureResult(value = ...future.value$value, [18:41:17.422] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:17.422] ...future.rng), globalenv = if (FALSE) [18:41:17.422] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:17.422] ...future.globalenv.names)) [18:41:17.422] else NULL, started = ...future.startTime, version = "1.8") [18:41:17.422] }, condition = base::local({ [18:41:17.422] c <- base::c [18:41:17.422] inherits <- base::inherits [18:41:17.422] invokeRestart <- base::invokeRestart [18:41:17.422] length <- base::length [18:41:17.422] list <- base::list [18:41:17.422] seq.int <- base::seq.int [18:41:17.422] signalCondition <- base::signalCondition [18:41:17.422] sys.calls <- base::sys.calls [18:41:17.422] `[[` <- base::`[[` [18:41:17.422] `+` <- base::`+` [18:41:17.422] `<<-` <- base::`<<-` [18:41:17.422] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:17.422] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:17.422] 3L)] [18:41:17.422] } [18:41:17.422] function(cond) { [18:41:17.422] is_error <- inherits(cond, "error") [18:41:17.422] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:17.422] NULL) [18:41:17.422] if (is_error) { [18:41:17.422] sessionInformation <- function() { [18:41:17.422] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:17.422] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:17.422] search = base::search(), system = base::Sys.info()) [18:41:17.422] } [18:41:17.422] ...future.conditions[[length(...future.conditions) + [18:41:17.422] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:17.422] cond$call), session = sessionInformation(), [18:41:17.422] timestamp = base::Sys.time(), signaled = 0L) [18:41:17.422] signalCondition(cond) [18:41:17.422] } [18:41:17.422] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:17.422] "immediateCondition"))) { [18:41:17.422] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:17.422] ...future.conditions[[length(...future.conditions) + [18:41:17.422] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:17.422] if (TRUE && !signal) { [18:41:17.422] muffleCondition <- function (cond, pattern = "^muffle") [18:41:17.422] { [18:41:17.422] inherits <- base::inherits [18:41:17.422] invokeRestart <- base::invokeRestart [18:41:17.422] is.null <- base::is.null [18:41:17.422] muffled <- FALSE [18:41:17.422] if (inherits(cond, "message")) { [18:41:17.422] muffled <- grepl(pattern, "muffleMessage") [18:41:17.422] if (muffled) [18:41:17.422] invokeRestart("muffleMessage") [18:41:17.422] } [18:41:17.422] else if (inherits(cond, "warning")) { [18:41:17.422] muffled <- grepl(pattern, "muffleWarning") [18:41:17.422] if (muffled) [18:41:17.422] invokeRestart("muffleWarning") [18:41:17.422] } [18:41:17.422] else if (inherits(cond, "condition")) { [18:41:17.422] if (!is.null(pattern)) { [18:41:17.422] computeRestarts <- base::computeRestarts [18:41:17.422] grepl <- base::grepl [18:41:17.422] restarts <- computeRestarts(cond) [18:41:17.422] for (restart in restarts) { [18:41:17.422] name <- restart$name [18:41:17.422] if (is.null(name)) [18:41:17.422] next [18:41:17.422] if (!grepl(pattern, name)) [18:41:17.422] next [18:41:17.422] invokeRestart(restart) [18:41:17.422] muffled <- TRUE [18:41:17.422] break [18:41:17.422] } [18:41:17.422] } [18:41:17.422] } [18:41:17.422] invisible(muffled) [18:41:17.422] } [18:41:17.422] muffleCondition(cond, pattern = "^muffle") [18:41:17.422] } [18:41:17.422] } [18:41:17.422] else { [18:41:17.422] if (TRUE) { [18:41:17.422] muffleCondition <- function (cond, pattern = "^muffle") [18:41:17.422] { [18:41:17.422] inherits <- base::inherits [18:41:17.422] invokeRestart <- base::invokeRestart [18:41:17.422] is.null <- base::is.null [18:41:17.422] muffled <- FALSE [18:41:17.422] if (inherits(cond, "message")) { [18:41:17.422] muffled <- grepl(pattern, "muffleMessage") [18:41:17.422] if (muffled) [18:41:17.422] invokeRestart("muffleMessage") [18:41:17.422] } [18:41:17.422] else if (inherits(cond, "warning")) { [18:41:17.422] muffled <- grepl(pattern, "muffleWarning") [18:41:17.422] if (muffled) [18:41:17.422] invokeRestart("muffleWarning") [18:41:17.422] } [18:41:17.422] else if (inherits(cond, "condition")) { [18:41:17.422] if (!is.null(pattern)) { [18:41:17.422] computeRestarts <- base::computeRestarts [18:41:17.422] grepl <- base::grepl [18:41:17.422] restarts <- computeRestarts(cond) [18:41:17.422] for (restart in restarts) { [18:41:17.422] name <- restart$name [18:41:17.422] if (is.null(name)) [18:41:17.422] next [18:41:17.422] if (!grepl(pattern, name)) [18:41:17.422] next [18:41:17.422] invokeRestart(restart) [18:41:17.422] muffled <- TRUE [18:41:17.422] break [18:41:17.422] } [18:41:17.422] } [18:41:17.422] } [18:41:17.422] invisible(muffled) [18:41:17.422] } [18:41:17.422] muffleCondition(cond, pattern = "^muffle") [18:41:17.422] } [18:41:17.422] } [18:41:17.422] } [18:41:17.422] })) [18:41:17.422] }, error = function(ex) { [18:41:17.422] base::structure(base::list(value = NULL, visible = NULL, [18:41:17.422] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:17.422] ...future.rng), started = ...future.startTime, [18:41:17.422] finished = Sys.time(), session_uuid = NA_character_, [18:41:17.422] version = "1.8"), class = "FutureResult") [18:41:17.422] }, finally = { [18:41:17.422] if (!identical(...future.workdir, getwd())) [18:41:17.422] setwd(...future.workdir) [18:41:17.422] { [18:41:17.422] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:17.422] ...future.oldOptions$nwarnings <- NULL [18:41:17.422] } [18:41:17.422] base::options(...future.oldOptions) [18:41:17.422] if (.Platform$OS.type == "windows") { [18:41:17.422] old_names <- names(...future.oldEnvVars) [18:41:17.422] envs <- base::Sys.getenv() [18:41:17.422] names <- names(envs) [18:41:17.422] common <- intersect(names, old_names) [18:41:17.422] added <- setdiff(names, old_names) [18:41:17.422] removed <- setdiff(old_names, names) [18:41:17.422] changed <- common[...future.oldEnvVars[common] != [18:41:17.422] envs[common]] [18:41:17.422] NAMES <- toupper(changed) [18:41:17.422] args <- list() [18:41:17.422] for (kk in seq_along(NAMES)) { [18:41:17.422] name <- changed[[kk]] [18:41:17.422] NAME <- NAMES[[kk]] [18:41:17.422] if (name != NAME && is.element(NAME, old_names)) [18:41:17.422] next [18:41:17.422] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:17.422] } [18:41:17.422] NAMES <- toupper(added) [18:41:17.422] for (kk in seq_along(NAMES)) { [18:41:17.422] name <- added[[kk]] [18:41:17.422] NAME <- NAMES[[kk]] [18:41:17.422] if (name != NAME && is.element(NAME, old_names)) [18:41:17.422] next [18:41:17.422] args[[name]] <- "" [18:41:17.422] } [18:41:17.422] NAMES <- toupper(removed) [18:41:17.422] for (kk in seq_along(NAMES)) { [18:41:17.422] name <- removed[[kk]] [18:41:17.422] NAME <- NAMES[[kk]] [18:41:17.422] if (name != NAME && is.element(NAME, old_names)) [18:41:17.422] next [18:41:17.422] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:17.422] } [18:41:17.422] if (length(args) > 0) [18:41:17.422] base::do.call(base::Sys.setenv, args = args) [18:41:17.422] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:17.422] } [18:41:17.422] else { [18:41:17.422] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:17.422] } [18:41:17.422] { [18:41:17.422] if (base::length(...future.futureOptionsAdded) > [18:41:17.422] 0L) { [18:41:17.422] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:17.422] base::names(opts) <- ...future.futureOptionsAdded [18:41:17.422] base::options(opts) [18:41:17.422] } [18:41:17.422] { [18:41:17.422] { [18:41:17.422] NULL [18:41:17.422] RNGkind("Mersenne-Twister") [18:41:17.422] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:17.422] inherits = FALSE) [18:41:17.422] } [18:41:17.422] options(future.plan = NULL) [18:41:17.422] if (is.na(NA_character_)) [18:41:17.422] Sys.unsetenv("R_FUTURE_PLAN") [18:41:17.422] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:17.422] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:17.422] .init = FALSE) [18:41:17.422] } [18:41:17.422] } [18:41:17.422] } [18:41:17.422] }) [18:41:17.422] if (TRUE) { [18:41:17.422] base::sink(type = "output", split = FALSE) [18:41:17.422] if (TRUE) { [18:41:17.422] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:17.422] } [18:41:17.422] else { [18:41:17.422] ...future.result["stdout"] <- base::list(NULL) [18:41:17.422] } [18:41:17.422] base::close(...future.stdout) [18:41:17.422] ...future.stdout <- NULL [18:41:17.422] } [18:41:17.422] ...future.result$conditions <- ...future.conditions [18:41:17.422] ...future.result$finished <- base::Sys.time() [18:41:17.422] ...future.result [18:41:17.422] } [18:41:17.426] assign_globals() ... [18:41:17.426] List of 5 [18:41:17.426] $ ...future.FUN :function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [18:41:17.426] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [18:41:17.426] $ future.call.arguments :List of 2 [18:41:17.426] ..$ collapse: chr "; " [18:41:17.426] ..$ maxHead : int 3 [18:41:17.426] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:17.426] $ ...future.elements_ii :List of 1 [18:41:17.426] ..$ a: Named chr [1:101] "hello" "1" "2" "3" ... [18:41:17.426] .. ..- attr(*, "names")= chr [1:101] "" "b1" "b2" "b3" ... [18:41:17.426] $ ...future.seeds_ii : NULL [18:41:17.426] $ ...future.globals.maxSize: NULL [18:41:17.426] - attr(*, "where")=List of 5 [18:41:17.426] ..$ ...future.FUN : [18:41:17.426] ..$ future.call.arguments : [18:41:17.426] ..$ ...future.elements_ii : [18:41:17.426] ..$ ...future.seeds_ii : [18:41:17.426] ..$ ...future.globals.maxSize: [18:41:17.426] - attr(*, "resolved")= logi FALSE [18:41:17.426] - attr(*, "total_size")= num 20741 [18:41:17.426] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:17.426] - attr(*, "already-done")= logi TRUE [18:41:17.433] - copied '...future.FUN' to environment [18:41:17.433] - copied 'future.call.arguments' to environment [18:41:17.433] - copied '...future.elements_ii' to environment [18:41:17.434] - copied '...future.seeds_ii' to environment [18:41:17.434] - copied '...future.globals.maxSize' to environment [18:41:17.434] assign_globals() ... done [18:41:17.435] plan(): Setting new future strategy stack: [18:41:17.435] List of future strategies: [18:41:17.435] 1. sequential: [18:41:17.435] - args: function (..., envir = parent.frame(), workers = "") [18:41:17.435] - tweaked: FALSE [18:41:17.435] - call: NULL [18:41:17.435] plan(): nbrOfWorkers() = 1 [18:41:17.437] plan(): Setting new future strategy stack: [18:41:17.437] List of future strategies: [18:41:17.437] 1. sequential: [18:41:17.437] - args: function (..., envir = parent.frame(), workers = "") [18:41:17.437] - tweaked: FALSE [18:41:17.437] - call: plan(strategy) [18:41:17.437] plan(): nbrOfWorkers() = 1 [18:41:17.438] SequentialFuture started (and completed) [18:41:17.438] - Launch lazy future ... done [18:41:17.438] run() for 'SequentialFuture' ... done [18:41:17.438] Created future: [18:41:17.438] SequentialFuture: [18:41:17.438] Label: 'future_lapply-1' [18:41:17.438] Expression: [18:41:17.438] { [18:41:17.438] do.call(function(...) { [18:41:17.438] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.438] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:17.438] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.438] on.exit(options(oopts), add = TRUE) [18:41:17.438] } [18:41:17.438] { [18:41:17.438] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:17.438] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.438] ...future.FUN(...future.X_jj, ...) [18:41:17.438] }) [18:41:17.438] } [18:41:17.438] }, args = future.call.arguments) [18:41:17.438] } [18:41:17.438] Lazy evaluation: FALSE [18:41:17.438] Asynchronous evaluation: FALSE [18:41:17.438] Local evaluation: TRUE [18:41:17.438] Environment: R_GlobalEnv [18:41:17.438] Capture standard output: TRUE [18:41:17.438] Capture condition classes: 'condition' (excluding 'nothing') [18:41:17.438] Globals: 5 objects totaling 9.56 KiB (function '...future.FUN' of 7.17 KiB, DotDotDotList 'future.call.arguments' of 187 bytes, list '...future.elements_ii' of 2.15 KiB, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:17.438] Packages: 1 packages ('future') [18:41:17.438] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:17.438] Resolved: TRUE [18:41:17.438] Value: 68 bytes of class 'list' [18:41:17.438] Early signaling: FALSE [18:41:17.438] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:17.438] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:17.440] Chunk #1 of 1 ... DONE [18:41:17.440] Launching 1 futures (chunks) ... DONE [18:41:17.440] Resolving 1 futures (chunks) ... [18:41:17.440] resolve() on list ... [18:41:17.440] recursive: 0 [18:41:17.441] length: 1 [18:41:17.441] [18:41:17.441] resolved() for 'SequentialFuture' ... [18:41:17.441] - state: 'finished' [18:41:17.441] - run: TRUE [18:41:17.441] - result: 'FutureResult' [18:41:17.442] resolved() for 'SequentialFuture' ... done [18:41:17.442] Future #1 [18:41:17.442] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:17.442] - nx: 1 [18:41:17.442] - relay: TRUE [18:41:17.443] - stdout: TRUE [18:41:17.443] - signal: TRUE [18:41:17.443] - resignal: FALSE [18:41:17.443] - force: TRUE [18:41:17.443] - relayed: [n=1] FALSE [18:41:17.443] - queued futures: [n=1] FALSE [18:41:17.443] - until=1 [18:41:17.444] - relaying element #1 [18:41:17.444] - relayed: [n=1] TRUE [18:41:17.444] - queued futures: [n=1] TRUE [18:41:17.444] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:17.444] length: 0 (resolved future 1) [18:41:17.445] Relaying remaining futures [18:41:17.445] signalConditionsASAP(NULL, pos=0) ... [18:41:17.445] - nx: 1 [18:41:17.445] - relay: TRUE [18:41:17.445] - stdout: TRUE [18:41:17.445] - signal: TRUE [18:41:17.445] - resignal: FALSE [18:41:17.446] - force: TRUE [18:41:17.446] - relayed: [n=1] TRUE [18:41:17.446] - queued futures: [n=1] TRUE - flush all [18:41:17.446] - relayed: [n=1] TRUE [18:41:17.446] - queued futures: [n=1] TRUE [18:41:17.446] signalConditionsASAP(NULL, pos=0) ... done [18:41:17.447] resolve() on list ... DONE [18:41:17.447] - Number of value chunks collected: 1 [18:41:17.447] Resolving 1 futures (chunks) ... DONE [18:41:17.447] Reducing values from 1 chunks ... [18:41:17.447] - Number of values collected after concatenation: 1 [18:41:17.447] - Number of values expected: 1 [18:41:17.448] Reducing values from 1 chunks ... DONE [18:41:17.448] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [18:41:17.449] future_lapply() ... [18:41:17.450] Number of chunks: 1 [18:41:17.450] Index remapping (attribute 'ordering'): [n = 2] 2, 1 [18:41:17.450] getGlobalsAndPackagesXApply() ... [18:41:17.450] - future.globals: TRUE [18:41:17.450] getGlobalsAndPackages() ... [18:41:17.450] Searching for globals... [18:41:17.452] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [18:41:17.452] Searching for globals ... DONE [18:41:17.452] Resolving globals: FALSE [18:41:17.453] The total size of the 1 globals is 911 bytes (911 bytes) [18:41:17.453] The total size of the 1 globals exported for future expression ('FUN()') is 911 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (911 bytes of class 'function') [18:41:17.453] - globals: [1] 'FUN' [18:41:17.454] - packages: [1] 'listenv' [18:41:17.454] getGlobalsAndPackages() ... DONE [18:41:17.454] - globals found/used: [n=1] 'FUN' [18:41:17.454] - needed namespaces: [n=1] 'listenv' [18:41:17.454] Finding globals ... DONE [18:41:17.455] - use_args: TRUE [18:41:17.455] - Getting '...' globals ... [18:41:17.455] resolve() on list ... [18:41:17.455] recursive: 0 [18:41:17.455] length: 1 [18:41:17.456] elements: '...' [18:41:17.456] length: 0 (resolved future 1) [18:41:17.456] resolve() on list ... DONE [18:41:17.456] - '...' content: [n=0] [18:41:17.456] List of 1 [18:41:17.456] $ ...: list() [18:41:17.456] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:17.456] - attr(*, "where")=List of 1 [18:41:17.456] ..$ ...: [18:41:17.456] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:17.456] - attr(*, "resolved")= logi TRUE [18:41:17.456] - attr(*, "total_size")= num NA [18:41:17.459] - Getting '...' globals ... DONE [18:41:17.459] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:17.460] List of 2 [18:41:17.460] $ ...future.FUN:function (x, ...) [18:41:17.460] $ ... : list() [18:41:17.460] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:17.460] - attr(*, "where")=List of 2 [18:41:17.460] ..$ ...future.FUN: [18:41:17.460] ..$ ... : [18:41:17.460] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:17.460] - attr(*, "resolved")= logi FALSE [18:41:17.460] - attr(*, "total_size")= int 8620 [18:41:17.463] Packages to be attached in all futures: [n=1] 'listenv' [18:41:17.463] getGlobalsAndPackagesXApply() ... DONE [18:41:17.463] Number of futures (= number of chunks): 1 [18:41:17.463] Launching 1 futures (chunks) ... [18:41:17.464] Chunk #1 of 1 ... [18:41:17.464] - Finding globals in 'X' for chunk #1 ... [18:41:17.464] getGlobalsAndPackages() ... [18:41:17.464] Searching for globals... [18:41:17.465] [18:41:17.465] Searching for globals ... DONE [18:41:17.465] - globals: [0] [18:41:17.465] getGlobalsAndPackages() ... DONE [18:41:17.465] + additional globals found: [n=0] [18:41:17.466] + additional namespaces needed: [n=0] [18:41:17.466] - Finding globals in 'X' for chunk #1 ... DONE [18:41:17.466] - seeds: [18:41:17.466] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.466] getGlobalsAndPackages() ... [18:41:17.466] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.467] Resolving globals: FALSE [18:41:17.467] Tweak future expression to call with '...' arguments ... [18:41:17.467] { [18:41:17.467] do.call(function(...) { [18:41:17.467] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.467] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:17.467] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.467] on.exit(options(oopts), add = TRUE) [18:41:17.467] } [18:41:17.467] { [18:41:17.467] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:17.467] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.467] ...future.FUN(...future.X_jj, ...) [18:41:17.467] }) [18:41:17.467] } [18:41:17.467] }, args = future.call.arguments) [18:41:17.467] } [18:41:17.467] Tweak future expression to call with '...' arguments ... DONE [18:41:17.468] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.468] - packages: [1] 'listenv' [18:41:17.468] getGlobalsAndPackages() ... DONE [18:41:17.469] run() for 'Future' ... [18:41:17.469] - state: 'created' [18:41:17.469] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:17.469] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:17.470] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:17.470] - Field: 'label' [18:41:17.470] - Field: 'local' [18:41:17.470] - Field: 'owner' [18:41:17.470] - Field: 'envir' [18:41:17.471] - Field: 'packages' [18:41:17.471] - Field: 'gc' [18:41:17.471] - Field: 'conditions' [18:41:17.471] - Field: 'expr' [18:41:17.471] - Field: 'uuid' [18:41:17.471] - Field: 'seed' [18:41:17.472] - Field: 'version' [18:41:17.472] - Field: 'result' [18:41:17.472] - Field: 'asynchronous' [18:41:17.472] - Field: 'calls' [18:41:17.472] - Field: 'globals' [18:41:17.472] - Field: 'stdout' [18:41:17.473] - Field: 'earlySignal' [18:41:17.473] - Field: 'lazy' [18:41:17.473] - Field: 'state' [18:41:17.473] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:17.473] - Launch lazy future ... [18:41:17.474] Packages needed by the future expression (n = 1): 'listenv' [18:41:17.474] Packages needed by future strategies (n = 0): [18:41:17.474] { [18:41:17.474] { [18:41:17.474] { [18:41:17.474] ...future.startTime <- base::Sys.time() [18:41:17.474] { [18:41:17.474] { [18:41:17.474] { [18:41:17.474] { [18:41:17.474] base::local({ [18:41:17.474] has_future <- base::requireNamespace("future", [18:41:17.474] quietly = TRUE) [18:41:17.474] if (has_future) { [18:41:17.474] ns <- base::getNamespace("future") [18:41:17.474] version <- ns[[".package"]][["version"]] [18:41:17.474] if (is.null(version)) [18:41:17.474] version <- utils::packageVersion("future") [18:41:17.474] } [18:41:17.474] else { [18:41:17.474] version <- NULL [18:41:17.474] } [18:41:17.474] if (!has_future || version < "1.8.0") { [18:41:17.474] info <- base::c(r_version = base::gsub("R version ", [18:41:17.474] "", base::R.version$version.string), [18:41:17.474] platform = base::sprintf("%s (%s-bit)", [18:41:17.474] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:17.474] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:17.474] "release", "version")], collapse = " "), [18:41:17.474] hostname = base::Sys.info()[["nodename"]]) [18:41:17.474] info <- base::sprintf("%s: %s", base::names(info), [18:41:17.474] info) [18:41:17.474] info <- base::paste(info, collapse = "; ") [18:41:17.474] if (!has_future) { [18:41:17.474] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:17.474] info) [18:41:17.474] } [18:41:17.474] else { [18:41:17.474] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:17.474] info, version) [18:41:17.474] } [18:41:17.474] base::stop(msg) [18:41:17.474] } [18:41:17.474] }) [18:41:17.474] } [18:41:17.474] base::local({ [18:41:17.474] for (pkg in "listenv") { [18:41:17.474] base::loadNamespace(pkg) [18:41:17.474] base::library(pkg, character.only = TRUE) [18:41:17.474] } [18:41:17.474] }) [18:41:17.474] } [18:41:17.474] ...future.strategy.old <- future::plan("list") [18:41:17.474] options(future.plan = NULL) [18:41:17.474] Sys.unsetenv("R_FUTURE_PLAN") [18:41:17.474] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:17.474] } [18:41:17.474] ...future.workdir <- getwd() [18:41:17.474] } [18:41:17.474] ...future.oldOptions <- base::as.list(base::.Options) [18:41:17.474] ...future.oldEnvVars <- base::Sys.getenv() [18:41:17.474] } [18:41:17.474] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:17.474] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:17.474] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:17.474] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:17.474] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:17.474] future.stdout.windows.reencode = NULL, width = 80L) [18:41:17.474] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:17.474] base::names(...future.oldOptions)) [18:41:17.474] } [18:41:17.474] if (FALSE) { [18:41:17.474] } [18:41:17.474] else { [18:41:17.474] if (TRUE) { [18:41:17.474] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:17.474] open = "w") [18:41:17.474] } [18:41:17.474] else { [18:41:17.474] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:17.474] windows = "NUL", "/dev/null"), open = "w") [18:41:17.474] } [18:41:17.474] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:17.474] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:17.474] base::sink(type = "output", split = FALSE) [18:41:17.474] base::close(...future.stdout) [18:41:17.474] }, add = TRUE) [18:41:17.474] } [18:41:17.474] ...future.frame <- base::sys.nframe() [18:41:17.474] ...future.conditions <- base::list() [18:41:17.474] ...future.rng <- base::globalenv()$.Random.seed [18:41:17.474] if (FALSE) { [18:41:17.474] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:17.474] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:17.474] } [18:41:17.474] ...future.result <- base::tryCatch({ [18:41:17.474] base::withCallingHandlers({ [18:41:17.474] ...future.value <- base::withVisible(base::local({ [18:41:17.474] do.call(function(...) { [18:41:17.474] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.474] if (!identical(...future.globals.maxSize.org, [18:41:17.474] ...future.globals.maxSize)) { [18:41:17.474] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.474] on.exit(options(oopts), add = TRUE) [18:41:17.474] } [18:41:17.474] { [18:41:17.474] lapply(seq_along(...future.elements_ii), [18:41:17.474] FUN = function(jj) { [18:41:17.474] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.474] ...future.FUN(...future.X_jj, ...) [18:41:17.474] }) [18:41:17.474] } [18:41:17.474] }, args = future.call.arguments) [18:41:17.474] })) [18:41:17.474] future::FutureResult(value = ...future.value$value, [18:41:17.474] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:17.474] ...future.rng), globalenv = if (FALSE) [18:41:17.474] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:17.474] ...future.globalenv.names)) [18:41:17.474] else NULL, started = ...future.startTime, version = "1.8") [18:41:17.474] }, condition = base::local({ [18:41:17.474] c <- base::c [18:41:17.474] inherits <- base::inherits [18:41:17.474] invokeRestart <- base::invokeRestart [18:41:17.474] length <- base::length [18:41:17.474] list <- base::list [18:41:17.474] seq.int <- base::seq.int [18:41:17.474] signalCondition <- base::signalCondition [18:41:17.474] sys.calls <- base::sys.calls [18:41:17.474] `[[` <- base::`[[` [18:41:17.474] `+` <- base::`+` [18:41:17.474] `<<-` <- base::`<<-` [18:41:17.474] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:17.474] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:17.474] 3L)] [18:41:17.474] } [18:41:17.474] function(cond) { [18:41:17.474] is_error <- inherits(cond, "error") [18:41:17.474] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:17.474] NULL) [18:41:17.474] if (is_error) { [18:41:17.474] sessionInformation <- function() { [18:41:17.474] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:17.474] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:17.474] search = base::search(), system = base::Sys.info()) [18:41:17.474] } [18:41:17.474] ...future.conditions[[length(...future.conditions) + [18:41:17.474] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:17.474] cond$call), session = sessionInformation(), [18:41:17.474] timestamp = base::Sys.time(), signaled = 0L) [18:41:17.474] signalCondition(cond) [18:41:17.474] } [18:41:17.474] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:17.474] "immediateCondition"))) { [18:41:17.474] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:17.474] ...future.conditions[[length(...future.conditions) + [18:41:17.474] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:17.474] if (TRUE && !signal) { [18:41:17.474] muffleCondition <- function (cond, pattern = "^muffle") [18:41:17.474] { [18:41:17.474] inherits <- base::inherits [18:41:17.474] invokeRestart <- base::invokeRestart [18:41:17.474] is.null <- base::is.null [18:41:17.474] muffled <- FALSE [18:41:17.474] if (inherits(cond, "message")) { [18:41:17.474] muffled <- grepl(pattern, "muffleMessage") [18:41:17.474] if (muffled) [18:41:17.474] invokeRestart("muffleMessage") [18:41:17.474] } [18:41:17.474] else if (inherits(cond, "warning")) { [18:41:17.474] muffled <- grepl(pattern, "muffleWarning") [18:41:17.474] if (muffled) [18:41:17.474] invokeRestart("muffleWarning") [18:41:17.474] } [18:41:17.474] else if (inherits(cond, "condition")) { [18:41:17.474] if (!is.null(pattern)) { [18:41:17.474] computeRestarts <- base::computeRestarts [18:41:17.474] grepl <- base::grepl [18:41:17.474] restarts <- computeRestarts(cond) [18:41:17.474] for (restart in restarts) { [18:41:17.474] name <- restart$name [18:41:17.474] if (is.null(name)) [18:41:17.474] next [18:41:17.474] if (!grepl(pattern, name)) [18:41:17.474] next [18:41:17.474] invokeRestart(restart) [18:41:17.474] muffled <- TRUE [18:41:17.474] break [18:41:17.474] } [18:41:17.474] } [18:41:17.474] } [18:41:17.474] invisible(muffled) [18:41:17.474] } [18:41:17.474] muffleCondition(cond, pattern = "^muffle") [18:41:17.474] } [18:41:17.474] } [18:41:17.474] else { [18:41:17.474] if (TRUE) { [18:41:17.474] muffleCondition <- function (cond, pattern = "^muffle") [18:41:17.474] { [18:41:17.474] inherits <- base::inherits [18:41:17.474] invokeRestart <- base::invokeRestart [18:41:17.474] is.null <- base::is.null [18:41:17.474] muffled <- FALSE [18:41:17.474] if (inherits(cond, "message")) { [18:41:17.474] muffled <- grepl(pattern, "muffleMessage") [18:41:17.474] if (muffled) [18:41:17.474] invokeRestart("muffleMessage") [18:41:17.474] } [18:41:17.474] else if (inherits(cond, "warning")) { [18:41:17.474] muffled <- grepl(pattern, "muffleWarning") [18:41:17.474] if (muffled) [18:41:17.474] invokeRestart("muffleWarning") [18:41:17.474] } [18:41:17.474] else if (inherits(cond, "condition")) { [18:41:17.474] if (!is.null(pattern)) { [18:41:17.474] computeRestarts <- base::computeRestarts [18:41:17.474] grepl <- base::grepl [18:41:17.474] restarts <- computeRestarts(cond) [18:41:17.474] for (restart in restarts) { [18:41:17.474] name <- restart$name [18:41:17.474] if (is.null(name)) [18:41:17.474] next [18:41:17.474] if (!grepl(pattern, name)) [18:41:17.474] next [18:41:17.474] invokeRestart(restart) [18:41:17.474] muffled <- TRUE [18:41:17.474] break [18:41:17.474] } [18:41:17.474] } [18:41:17.474] } [18:41:17.474] invisible(muffled) [18:41:17.474] } [18:41:17.474] muffleCondition(cond, pattern = "^muffle") [18:41:17.474] } [18:41:17.474] } [18:41:17.474] } [18:41:17.474] })) [18:41:17.474] }, error = function(ex) { [18:41:17.474] base::structure(base::list(value = NULL, visible = NULL, [18:41:17.474] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:17.474] ...future.rng), started = ...future.startTime, [18:41:17.474] finished = Sys.time(), session_uuid = NA_character_, [18:41:17.474] version = "1.8"), class = "FutureResult") [18:41:17.474] }, finally = { [18:41:17.474] if (!identical(...future.workdir, getwd())) [18:41:17.474] setwd(...future.workdir) [18:41:17.474] { [18:41:17.474] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:17.474] ...future.oldOptions$nwarnings <- NULL [18:41:17.474] } [18:41:17.474] base::options(...future.oldOptions) [18:41:17.474] if (.Platform$OS.type == "windows") { [18:41:17.474] old_names <- names(...future.oldEnvVars) [18:41:17.474] envs <- base::Sys.getenv() [18:41:17.474] names <- names(envs) [18:41:17.474] common <- intersect(names, old_names) [18:41:17.474] added <- setdiff(names, old_names) [18:41:17.474] removed <- setdiff(old_names, names) [18:41:17.474] changed <- common[...future.oldEnvVars[common] != [18:41:17.474] envs[common]] [18:41:17.474] NAMES <- toupper(changed) [18:41:17.474] args <- list() [18:41:17.474] for (kk in seq_along(NAMES)) { [18:41:17.474] name <- changed[[kk]] [18:41:17.474] NAME <- NAMES[[kk]] [18:41:17.474] if (name != NAME && is.element(NAME, old_names)) [18:41:17.474] next [18:41:17.474] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:17.474] } [18:41:17.474] NAMES <- toupper(added) [18:41:17.474] for (kk in seq_along(NAMES)) { [18:41:17.474] name <- added[[kk]] [18:41:17.474] NAME <- NAMES[[kk]] [18:41:17.474] if (name != NAME && is.element(NAME, old_names)) [18:41:17.474] next [18:41:17.474] args[[name]] <- "" [18:41:17.474] } [18:41:17.474] NAMES <- toupper(removed) [18:41:17.474] for (kk in seq_along(NAMES)) { [18:41:17.474] name <- removed[[kk]] [18:41:17.474] NAME <- NAMES[[kk]] [18:41:17.474] if (name != NAME && is.element(NAME, old_names)) [18:41:17.474] next [18:41:17.474] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:17.474] } [18:41:17.474] if (length(args) > 0) [18:41:17.474] base::do.call(base::Sys.setenv, args = args) [18:41:17.474] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:17.474] } [18:41:17.474] else { [18:41:17.474] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:17.474] } [18:41:17.474] { [18:41:17.474] if (base::length(...future.futureOptionsAdded) > [18:41:17.474] 0L) { [18:41:17.474] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:17.474] base::names(opts) <- ...future.futureOptionsAdded [18:41:17.474] base::options(opts) [18:41:17.474] } [18:41:17.474] { [18:41:17.474] { [18:41:17.474] NULL [18:41:17.474] RNGkind("Mersenne-Twister") [18:41:17.474] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:17.474] inherits = FALSE) [18:41:17.474] } [18:41:17.474] options(future.plan = NULL) [18:41:17.474] if (is.na(NA_character_)) [18:41:17.474] Sys.unsetenv("R_FUTURE_PLAN") [18:41:17.474] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:17.474] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:17.474] .init = FALSE) [18:41:17.474] } [18:41:17.474] } [18:41:17.474] } [18:41:17.474] }) [18:41:17.474] if (TRUE) { [18:41:17.474] base::sink(type = "output", split = FALSE) [18:41:17.474] if (TRUE) { [18:41:17.474] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:17.474] } [18:41:17.474] else { [18:41:17.474] ...future.result["stdout"] <- base::list(NULL) [18:41:17.474] } [18:41:17.474] base::close(...future.stdout) [18:41:17.474] ...future.stdout <- NULL [18:41:17.474] } [18:41:17.474] ...future.result$conditions <- ...future.conditions [18:41:17.474] ...future.result$finished <- base::Sys.time() [18:41:17.474] ...future.result [18:41:17.474] } [18:41:17.478] assign_globals() ... [18:41:17.478] List of 5 [18:41:17.478] $ ...future.FUN :function (x, ...) [18:41:17.478] $ future.call.arguments : list() [18:41:17.478] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:17.478] $ ...future.elements_ii :List of 2 [18:41:17.478] ..$ b:Classes 'listenv', 'environment' [18:41:17.478] ..$ a:Classes 'listenv', 'environment' [18:41:17.478] $ ...future.seeds_ii : NULL [18:41:17.478] $ ...future.globals.maxSize: NULL [18:41:17.478] - attr(*, "where")=List of 5 [18:41:17.478] ..$ ...future.FUN : [18:41:17.478] ..$ future.call.arguments : [18:41:17.478] ..$ ...future.elements_ii : [18:41:17.478] ..$ ...future.seeds_ii : [18:41:17.478] ..$ ...future.globals.maxSize: [18:41:17.478] - attr(*, "resolved")= logi FALSE [18:41:17.478] - attr(*, "total_size")= num 8620 [18:41:17.478] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:17.478] - attr(*, "already-done")= logi TRUE [18:41:17.486] - copied '...future.FUN' to environment [18:41:17.487] - copied 'future.call.arguments' to environment [18:41:17.487] - copied '...future.elements_ii' to environment [18:41:17.487] - copied '...future.seeds_ii' to environment [18:41:17.487] - copied '...future.globals.maxSize' to environment [18:41:17.487] assign_globals() ... done [18:41:17.488] plan(): Setting new future strategy stack: [18:41:17.488] List of future strategies: [18:41:17.488] 1. sequential: [18:41:17.488] - args: function (..., envir = parent.frame(), workers = "") [18:41:17.488] - tweaked: FALSE [18:41:17.488] - call: NULL [18:41:17.489] plan(): nbrOfWorkers() = 1 [18:41:17.490] plan(): Setting new future strategy stack: [18:41:17.490] List of future strategies: [18:41:17.490] 1. sequential: [18:41:17.490] - args: function (..., envir = parent.frame(), workers = "") [18:41:17.490] - tweaked: FALSE [18:41:17.490] - call: plan(strategy) [18:41:17.491] plan(): nbrOfWorkers() = 1 [18:41:17.491] SequentialFuture started (and completed) [18:41:17.491] - Launch lazy future ... done [18:41:17.491] run() for 'SequentialFuture' ... done [18:41:17.492] Created future: [18:41:17.492] SequentialFuture: [18:41:17.492] Label: 'future_lapply-1' [18:41:17.492] Expression: [18:41:17.492] { [18:41:17.492] do.call(function(...) { [18:41:17.492] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.492] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:17.492] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.492] on.exit(options(oopts), add = TRUE) [18:41:17.492] } [18:41:17.492] { [18:41:17.492] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:17.492] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.492] ...future.FUN(...future.X_jj, ...) [18:41:17.492] }) [18:41:17.492] } [18:41:17.492] }, args = future.call.arguments) [18:41:17.492] } [18:41:17.492] Lazy evaluation: FALSE [18:41:17.492] Asynchronous evaluation: FALSE [18:41:17.492] Local evaluation: TRUE [18:41:17.492] Environment: R_GlobalEnv [18:41:17.492] Capture standard output: TRUE [18:41:17.492] Capture condition classes: 'condition' (excluding 'nothing') [18:41:17.492] Globals: 5 objects totaling 4.14 KiB (function '...future.FUN' of 911 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 3.10 KiB, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:17.492] Packages: 1 packages ('listenv') [18:41:17.492] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:17.492] Resolved: TRUE [18:41:17.492] Value: 154 bytes of class 'list' [18:41:17.492] Early signaling: FALSE [18:41:17.492] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:17.492] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:17.493] Chunk #1 of 1 ... DONE [18:41:17.493] Launching 1 futures (chunks) ... DONE [18:41:17.493] Resolving 1 futures (chunks) ... [18:41:17.493] resolve() on list ... [18:41:17.493] recursive: 0 [18:41:17.494] length: 1 [18:41:17.494] [18:41:17.494] resolved() for 'SequentialFuture' ... [18:41:17.494] - state: 'finished' [18:41:17.494] - run: TRUE [18:41:17.494] - result: 'FutureResult' [18:41:17.495] resolved() for 'SequentialFuture' ... done [18:41:17.495] Future #1 [18:41:17.495] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:17.495] - nx: 1 [18:41:17.495] - relay: TRUE [18:41:17.495] - stdout: TRUE [18:41:17.496] - signal: TRUE [18:41:17.496] - resignal: FALSE [18:41:17.496] - force: TRUE [18:41:17.496] - relayed: [n=1] FALSE [18:41:17.496] - queued futures: [n=1] FALSE [18:41:17.496] - until=1 [18:41:17.497] - relaying element #1 [18:41:17.497] - relayed: [n=1] TRUE [18:41:17.497] - queued futures: [n=1] TRUE [18:41:17.497] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:17.497] length: 0 (resolved future 1) [18:41:17.497] Relaying remaining futures [18:41:17.498] signalConditionsASAP(NULL, pos=0) ... [18:41:17.498] - nx: 1 [18:41:17.498] - relay: TRUE [18:41:17.498] - stdout: TRUE [18:41:17.498] - signal: TRUE [18:41:17.498] - resignal: FALSE [18:41:17.498] - force: TRUE [18:41:17.499] - relayed: [n=1] TRUE [18:41:17.499] - queued futures: [n=1] TRUE - flush all [18:41:17.499] - relayed: [n=1] TRUE [18:41:17.499] - queued futures: [n=1] TRUE [18:41:17.499] signalConditionsASAP(NULL, pos=0) ... done [18:41:17.500] resolve() on list ... DONE [18:41:17.500] - Number of value chunks collected: 1 [18:41:17.500] Resolving 1 futures (chunks) ... DONE [18:41:17.500] Reducing values from 1 chunks ... [18:41:17.500] - Number of values collected after concatenation: 2 [18:41:17.500] - Number of values expected: 2 [18:41:17.501] Reverse index remapping (attribute 'ordering'): [n = 2] 2, 1 [18:41:17.501] Reducing values from 1 chunks ... DONE [18:41:17.501] future_lapply() ... DONE List of 1 $ y:List of 2 ..$ a: Named chr "A" .. ..- attr(*, "names")= chr "A" ..$ b: Named chr [1:2] "A" "B" .. ..- attr(*, "names")= chr [1:2] "A" "B" - future_lapply(x, FUN, ...) for large length(x) ... [18:41:17.503] future_lapply() ... [18:41:17.504] Number of chunks: 1 [18:41:17.504] getGlobalsAndPackagesXApply() ... [18:41:17.504] - future.globals: TRUE [18:41:17.504] getGlobalsAndPackages() ... [18:41:17.504] Searching for globals... [18:41:17.506] - globals found: [4] 'FUN', 'sqrt', '+', 'a' [18:41:17.506] Searching for globals ... DONE [18:41:17.506] Resolving globals: FALSE [18:41:17.507] The total size of the 2 globals is 438 bytes (438 bytes) [18:41:17.507] The total size of the 2 globals exported for future expression ('FUN()') is 438 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There are two globals: 'FUN' (399 bytes of class 'function') and 'a' (39 bytes of class 'numeric') [18:41:17.507] - globals: [2] 'FUN', 'a' [18:41:17.508] [18:41:17.508] getGlobalsAndPackages() ... DONE [18:41:17.508] - globals found/used: [n=2] 'FUN', 'a' [18:41:17.508] - needed namespaces: [n=0] [18:41:17.508] Finding globals ... DONE [18:41:17.508] - use_args: TRUE [18:41:17.509] - Getting '...' globals ... [18:41:17.509] resolve() on list ... [18:41:17.509] recursive: 0 [18:41:17.509] length: 1 [18:41:17.509] elements: '...' [18:41:17.510] length: 0 (resolved future 1) [18:41:17.510] resolve() on list ... DONE [18:41:17.510] - '...' content: [n=0] [18:41:17.510] List of 1 [18:41:17.510] $ ...: list() [18:41:17.510] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:17.510] - attr(*, "where")=List of 1 [18:41:17.510] ..$ ...: [18:41:17.510] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:17.510] - attr(*, "resolved")= logi TRUE [18:41:17.510] - attr(*, "total_size")= num NA [18:41:17.513] - Getting '...' globals ... DONE [18:41:17.513] Globals to be used in all futures (chunks): [n=3] '...future.FUN', 'a', '...' [18:41:17.513] List of 3 [18:41:17.513] $ ...future.FUN:function (z) [18:41:17.513] $ a : num 3.14 [18:41:17.513] $ ... : list() [18:41:17.513] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:17.513] - attr(*, "where")=List of 3 [18:41:17.513] ..$ ...future.FUN: [18:41:17.513] ..$ a : [18:41:17.513] ..$ ... : [18:41:17.513] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:17.513] - attr(*, "resolved")= logi FALSE [18:41:17.513] - attr(*, "total_size")= int 4016 [18:41:17.517] Packages to be attached in all futures: [n=0] [18:41:17.517] getGlobalsAndPackagesXApply() ... DONE [18:41:17.518] Number of futures (= number of chunks): 1 [18:41:17.518] Launching 1 futures (chunks) ... [18:41:17.518] Chunk #1 of 1 ... [18:41:17.520] - Finding globals in 'X' for chunk #1 ... [18:41:17.520] getGlobalsAndPackages() ... [18:41:17.520] Searching for globals... [18:41:17.526] [18:41:17.526] Searching for globals ... DONE [18:41:17.527] - globals: [0] [18:41:17.527] getGlobalsAndPackages() ... DONE [18:41:17.527] + additional globals found: [n=0] [18:41:17.527] + additional namespaces needed: [n=0] [18:41:17.527] - Finding globals in 'X' for chunk #1 ... DONE [18:41:17.527] - seeds: [18:41:17.528] - All globals exported: [n=6] '...future.FUN', 'a', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.528] getGlobalsAndPackages() ... [18:41:17.528] - globals passed as-is: [6] '...future.FUN', 'a', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.528] Resolving globals: FALSE [18:41:17.528] Tweak future expression to call with '...' arguments ... [18:41:17.528] { [18:41:17.528] do.call(function(...) { [18:41:17.528] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.528] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:17.528] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.528] on.exit(options(oopts), add = TRUE) [18:41:17.528] } [18:41:17.528] { [18:41:17.528] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:17.528] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.528] ...future.FUN(...future.X_jj, ...) [18:41:17.528] }) [18:41:17.528] } [18:41:17.528] }, args = future.call.arguments) [18:41:17.528] } [18:41:17.529] Tweak future expression to call with '...' arguments ... DONE [18:41:17.529] - globals: [6] '...future.FUN', 'a', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.530] [18:41:17.530] getGlobalsAndPackages() ... DONE [18:41:17.530] run() for 'Future' ... [18:41:17.530] - state: 'created' [18:41:17.530] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:17.531] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:17.531] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:17.531] - Field: 'label' [18:41:17.531] - Field: 'local' [18:41:17.532] - Field: 'owner' [18:41:17.532] - Field: 'envir' [18:41:17.532] - Field: 'packages' [18:41:17.532] - Field: 'gc' [18:41:17.532] - Field: 'conditions' [18:41:17.532] - Field: 'expr' [18:41:17.533] - Field: 'uuid' [18:41:17.533] - Field: 'seed' [18:41:17.533] - Field: 'version' [18:41:17.533] - Field: 'result' [18:41:17.533] - Field: 'asynchronous' [18:41:17.533] - Field: 'calls' [18:41:17.534] - Field: 'globals' [18:41:17.534] - Field: 'stdout' [18:41:17.534] - Field: 'earlySignal' [18:41:17.534] - Field: 'lazy' [18:41:17.534] - Field: 'state' [18:41:17.535] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:17.535] - Launch lazy future ... [18:41:17.535] Packages needed by the future expression (n = 0): [18:41:17.535] Packages needed by future strategies (n = 0): [18:41:17.536] { [18:41:17.536] { [18:41:17.536] { [18:41:17.536] ...future.startTime <- base::Sys.time() [18:41:17.536] { [18:41:17.536] { [18:41:17.536] { [18:41:17.536] base::local({ [18:41:17.536] has_future <- base::requireNamespace("future", [18:41:17.536] quietly = TRUE) [18:41:17.536] if (has_future) { [18:41:17.536] ns <- base::getNamespace("future") [18:41:17.536] version <- ns[[".package"]][["version"]] [18:41:17.536] if (is.null(version)) [18:41:17.536] version <- utils::packageVersion("future") [18:41:17.536] } [18:41:17.536] else { [18:41:17.536] version <- NULL [18:41:17.536] } [18:41:17.536] if (!has_future || version < "1.8.0") { [18:41:17.536] info <- base::c(r_version = base::gsub("R version ", [18:41:17.536] "", base::R.version$version.string), [18:41:17.536] platform = base::sprintf("%s (%s-bit)", [18:41:17.536] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:17.536] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:17.536] "release", "version")], collapse = " "), [18:41:17.536] hostname = base::Sys.info()[["nodename"]]) [18:41:17.536] info <- base::sprintf("%s: %s", base::names(info), [18:41:17.536] info) [18:41:17.536] info <- base::paste(info, collapse = "; ") [18:41:17.536] if (!has_future) { [18:41:17.536] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:17.536] info) [18:41:17.536] } [18:41:17.536] else { [18:41:17.536] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:17.536] info, version) [18:41:17.536] } [18:41:17.536] base::stop(msg) [18:41:17.536] } [18:41:17.536] }) [18:41:17.536] } [18:41:17.536] ...future.strategy.old <- future::plan("list") [18:41:17.536] options(future.plan = NULL) [18:41:17.536] Sys.unsetenv("R_FUTURE_PLAN") [18:41:17.536] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:17.536] } [18:41:17.536] ...future.workdir <- getwd() [18:41:17.536] } [18:41:17.536] ...future.oldOptions <- base::as.list(base::.Options) [18:41:17.536] ...future.oldEnvVars <- base::Sys.getenv() [18:41:17.536] } [18:41:17.536] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:17.536] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:17.536] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:17.536] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:17.536] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:17.536] future.stdout.windows.reencode = NULL, width = 80L) [18:41:17.536] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:17.536] base::names(...future.oldOptions)) [18:41:17.536] } [18:41:17.536] if (FALSE) { [18:41:17.536] } [18:41:17.536] else { [18:41:17.536] if (TRUE) { [18:41:17.536] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:17.536] open = "w") [18:41:17.536] } [18:41:17.536] else { [18:41:17.536] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:17.536] windows = "NUL", "/dev/null"), open = "w") [18:41:17.536] } [18:41:17.536] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:17.536] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:17.536] base::sink(type = "output", split = FALSE) [18:41:17.536] base::close(...future.stdout) [18:41:17.536] }, add = TRUE) [18:41:17.536] } [18:41:17.536] ...future.frame <- base::sys.nframe() [18:41:17.536] ...future.conditions <- base::list() [18:41:17.536] ...future.rng <- base::globalenv()$.Random.seed [18:41:17.536] if (FALSE) { [18:41:17.536] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:17.536] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:17.536] } [18:41:17.536] ...future.result <- base::tryCatch({ [18:41:17.536] base::withCallingHandlers({ [18:41:17.536] ...future.value <- base::withVisible(base::local({ [18:41:17.536] do.call(function(...) { [18:41:17.536] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.536] if (!identical(...future.globals.maxSize.org, [18:41:17.536] ...future.globals.maxSize)) { [18:41:17.536] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.536] on.exit(options(oopts), add = TRUE) [18:41:17.536] } [18:41:17.536] { [18:41:17.536] lapply(seq_along(...future.elements_ii), [18:41:17.536] FUN = function(jj) { [18:41:17.536] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.536] ...future.FUN(...future.X_jj, ...) [18:41:17.536] }) [18:41:17.536] } [18:41:17.536] }, args = future.call.arguments) [18:41:17.536] })) [18:41:17.536] future::FutureResult(value = ...future.value$value, [18:41:17.536] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:17.536] ...future.rng), globalenv = if (FALSE) [18:41:17.536] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:17.536] ...future.globalenv.names)) [18:41:17.536] else NULL, started = ...future.startTime, version = "1.8") [18:41:17.536] }, condition = base::local({ [18:41:17.536] c <- base::c [18:41:17.536] inherits <- base::inherits [18:41:17.536] invokeRestart <- base::invokeRestart [18:41:17.536] length <- base::length [18:41:17.536] list <- base::list [18:41:17.536] seq.int <- base::seq.int [18:41:17.536] signalCondition <- base::signalCondition [18:41:17.536] sys.calls <- base::sys.calls [18:41:17.536] `[[` <- base::`[[` [18:41:17.536] `+` <- base::`+` [18:41:17.536] `<<-` <- base::`<<-` [18:41:17.536] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:17.536] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:17.536] 3L)] [18:41:17.536] } [18:41:17.536] function(cond) { [18:41:17.536] is_error <- inherits(cond, "error") [18:41:17.536] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:17.536] NULL) [18:41:17.536] if (is_error) { [18:41:17.536] sessionInformation <- function() { [18:41:17.536] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:17.536] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:17.536] search = base::search(), system = base::Sys.info()) [18:41:17.536] } [18:41:17.536] ...future.conditions[[length(...future.conditions) + [18:41:17.536] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:17.536] cond$call), session = sessionInformation(), [18:41:17.536] timestamp = base::Sys.time(), signaled = 0L) [18:41:17.536] signalCondition(cond) [18:41:17.536] } [18:41:17.536] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:17.536] "immediateCondition"))) { [18:41:17.536] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:17.536] ...future.conditions[[length(...future.conditions) + [18:41:17.536] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:17.536] if (TRUE && !signal) { [18:41:17.536] muffleCondition <- function (cond, pattern = "^muffle") [18:41:17.536] { [18:41:17.536] inherits <- base::inherits [18:41:17.536] invokeRestart <- base::invokeRestart [18:41:17.536] is.null <- base::is.null [18:41:17.536] muffled <- FALSE [18:41:17.536] if (inherits(cond, "message")) { [18:41:17.536] muffled <- grepl(pattern, "muffleMessage") [18:41:17.536] if (muffled) [18:41:17.536] invokeRestart("muffleMessage") [18:41:17.536] } [18:41:17.536] else if (inherits(cond, "warning")) { [18:41:17.536] muffled <- grepl(pattern, "muffleWarning") [18:41:17.536] if (muffled) [18:41:17.536] invokeRestart("muffleWarning") [18:41:17.536] } [18:41:17.536] else if (inherits(cond, "condition")) { [18:41:17.536] if (!is.null(pattern)) { [18:41:17.536] computeRestarts <- base::computeRestarts [18:41:17.536] grepl <- base::grepl [18:41:17.536] restarts <- computeRestarts(cond) [18:41:17.536] for (restart in restarts) { [18:41:17.536] name <- restart$name [18:41:17.536] if (is.null(name)) [18:41:17.536] next [18:41:17.536] if (!grepl(pattern, name)) [18:41:17.536] next [18:41:17.536] invokeRestart(restart) [18:41:17.536] muffled <- TRUE [18:41:17.536] break [18:41:17.536] } [18:41:17.536] } [18:41:17.536] } [18:41:17.536] invisible(muffled) [18:41:17.536] } [18:41:17.536] muffleCondition(cond, pattern = "^muffle") [18:41:17.536] } [18:41:17.536] } [18:41:17.536] else { [18:41:17.536] if (TRUE) { [18:41:17.536] muffleCondition <- function (cond, pattern = "^muffle") [18:41:17.536] { [18:41:17.536] inherits <- base::inherits [18:41:17.536] invokeRestart <- base::invokeRestart [18:41:17.536] is.null <- base::is.null [18:41:17.536] muffled <- FALSE [18:41:17.536] if (inherits(cond, "message")) { [18:41:17.536] muffled <- grepl(pattern, "muffleMessage") [18:41:17.536] if (muffled) [18:41:17.536] invokeRestart("muffleMessage") [18:41:17.536] } [18:41:17.536] else if (inherits(cond, "warning")) { [18:41:17.536] muffled <- grepl(pattern, "muffleWarning") [18:41:17.536] if (muffled) [18:41:17.536] invokeRestart("muffleWarning") [18:41:17.536] } [18:41:17.536] else if (inherits(cond, "condition")) { [18:41:17.536] if (!is.null(pattern)) { [18:41:17.536] computeRestarts <- base::computeRestarts [18:41:17.536] grepl <- base::grepl [18:41:17.536] restarts <- computeRestarts(cond) [18:41:17.536] for (restart in restarts) { [18:41:17.536] name <- restart$name [18:41:17.536] if (is.null(name)) [18:41:17.536] next [18:41:17.536] if (!grepl(pattern, name)) [18:41:17.536] next [18:41:17.536] invokeRestart(restart) [18:41:17.536] muffled <- TRUE [18:41:17.536] break [18:41:17.536] } [18:41:17.536] } [18:41:17.536] } [18:41:17.536] invisible(muffled) [18:41:17.536] } [18:41:17.536] muffleCondition(cond, pattern = "^muffle") [18:41:17.536] } [18:41:17.536] } [18:41:17.536] } [18:41:17.536] })) [18:41:17.536] }, error = function(ex) { [18:41:17.536] base::structure(base::list(value = NULL, visible = NULL, [18:41:17.536] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:17.536] ...future.rng), started = ...future.startTime, [18:41:17.536] finished = Sys.time(), session_uuid = NA_character_, [18:41:17.536] version = "1.8"), class = "FutureResult") [18:41:17.536] }, finally = { [18:41:17.536] if (!identical(...future.workdir, getwd())) [18:41:17.536] setwd(...future.workdir) [18:41:17.536] { [18:41:17.536] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:17.536] ...future.oldOptions$nwarnings <- NULL [18:41:17.536] } [18:41:17.536] base::options(...future.oldOptions) [18:41:17.536] if (.Platform$OS.type == "windows") { [18:41:17.536] old_names <- names(...future.oldEnvVars) [18:41:17.536] envs <- base::Sys.getenv() [18:41:17.536] names <- names(envs) [18:41:17.536] common <- intersect(names, old_names) [18:41:17.536] added <- setdiff(names, old_names) [18:41:17.536] removed <- setdiff(old_names, names) [18:41:17.536] changed <- common[...future.oldEnvVars[common] != [18:41:17.536] envs[common]] [18:41:17.536] NAMES <- toupper(changed) [18:41:17.536] args <- list() [18:41:17.536] for (kk in seq_along(NAMES)) { [18:41:17.536] name <- changed[[kk]] [18:41:17.536] NAME <- NAMES[[kk]] [18:41:17.536] if (name != NAME && is.element(NAME, old_names)) [18:41:17.536] next [18:41:17.536] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:17.536] } [18:41:17.536] NAMES <- toupper(added) [18:41:17.536] for (kk in seq_along(NAMES)) { [18:41:17.536] name <- added[[kk]] [18:41:17.536] NAME <- NAMES[[kk]] [18:41:17.536] if (name != NAME && is.element(NAME, old_names)) [18:41:17.536] next [18:41:17.536] args[[name]] <- "" [18:41:17.536] } [18:41:17.536] NAMES <- toupper(removed) [18:41:17.536] for (kk in seq_along(NAMES)) { [18:41:17.536] name <- removed[[kk]] [18:41:17.536] NAME <- NAMES[[kk]] [18:41:17.536] if (name != NAME && is.element(NAME, old_names)) [18:41:17.536] next [18:41:17.536] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:17.536] } [18:41:17.536] if (length(args) > 0) [18:41:17.536] base::do.call(base::Sys.setenv, args = args) [18:41:17.536] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:17.536] } [18:41:17.536] else { [18:41:17.536] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:17.536] } [18:41:17.536] { [18:41:17.536] if (base::length(...future.futureOptionsAdded) > [18:41:17.536] 0L) { [18:41:17.536] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:17.536] base::names(opts) <- ...future.futureOptionsAdded [18:41:17.536] base::options(opts) [18:41:17.536] } [18:41:17.536] { [18:41:17.536] { [18:41:17.536] NULL [18:41:17.536] RNGkind("Mersenne-Twister") [18:41:17.536] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:17.536] inherits = FALSE) [18:41:17.536] } [18:41:17.536] options(future.plan = NULL) [18:41:17.536] if (is.na(NA_character_)) [18:41:17.536] Sys.unsetenv("R_FUTURE_PLAN") [18:41:17.536] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:17.536] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:17.536] .init = FALSE) [18:41:17.536] } [18:41:17.536] } [18:41:17.536] } [18:41:17.536] }) [18:41:17.536] if (TRUE) { [18:41:17.536] base::sink(type = "output", split = FALSE) [18:41:17.536] if (TRUE) { [18:41:17.536] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:17.536] } [18:41:17.536] else { [18:41:17.536] ...future.result["stdout"] <- base::list(NULL) [18:41:17.536] } [18:41:17.536] base::close(...future.stdout) [18:41:17.536] ...future.stdout <- NULL [18:41:17.536] } [18:41:17.536] ...future.result$conditions <- ...future.conditions [18:41:17.536] ...future.result$finished <- base::Sys.time() [18:41:17.536] ...future.result [18:41:17.536] } [18:41:17.539] assign_globals() ... [18:41:17.540] List of 6 [18:41:17.540] $ ...future.FUN :function (z) [18:41:17.540] $ a : num 3.14 [18:41:17.540] $ future.call.arguments : list() [18:41:17.540] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:17.540] $ ...future.elements_ii :List of 10000 [18:41:17.540] ..$ : int 1 [18:41:17.540] ..$ : int 2 [18:41:17.540] ..$ : int 3 [18:41:17.540] ..$ : int 4 [18:41:17.540] ..$ : int 5 [18:41:17.540] ..$ : int 6 [18:41:17.540] ..$ : int 7 [18:41:17.540] ..$ : int 8 [18:41:17.540] ..$ : int 9 [18:41:17.540] ..$ : int 10 [18:41:17.540] ..$ : int 11 [18:41:17.540] ..$ : int 12 [18:41:17.540] ..$ : int 13 [18:41:17.540] ..$ : int 14 [18:41:17.540] ..$ : int 15 [18:41:17.540] ..$ : int 16 [18:41:17.540] ..$ : int 17 [18:41:17.540] ..$ : int 18 [18:41:17.540] ..$ : int 19 [18:41:17.540] ..$ : int 20 [18:41:17.540] ..$ : int 21 [18:41:17.540] ..$ : int 22 [18:41:17.540] ..$ : int 23 [18:41:17.540] ..$ : int 24 [18:41:17.540] ..$ : int 25 [18:41:17.540] ..$ : int 26 [18:41:17.540] ..$ : int 27 [18:41:17.540] ..$ : int 28 [18:41:17.540] ..$ : int 29 [18:41:17.540] ..$ : int 30 [18:41:17.540] ..$ : int 31 [18:41:17.540] ..$ : int 32 [18:41:17.540] ..$ : int 33 [18:41:17.540] ..$ : int 34 [18:41:17.540] ..$ : int 35 [18:41:17.540] ..$ : int 36 [18:41:17.540] ..$ : int 37 [18:41:17.540] ..$ : int 38 [18:41:17.540] ..$ : int 39 [18:41:17.540] ..$ : int 40 [18:41:17.540] ..$ : int 41 [18:41:17.540] ..$ : int 42 [18:41:17.540] ..$ : int 43 [18:41:17.540] ..$ : int 44 [18:41:17.540] ..$ : int 45 [18:41:17.540] ..$ : int 46 [18:41:17.540] ..$ : int 47 [18:41:17.540] ..$ : int 48 [18:41:17.540] ..$ : int 49 [18:41:17.540] ..$ : int 50 [18:41:17.540] ..$ : int 51 [18:41:17.540] ..$ : int 52 [18:41:17.540] ..$ : int 53 [18:41:17.540] ..$ : int 54 [18:41:17.540] ..$ : int 55 [18:41:17.540] ..$ : int 56 [18:41:17.540] ..$ : int 57 [18:41:17.540] ..$ : int 58 [18:41:17.540] ..$ : int 59 [18:41:17.540] ..$ : int 60 [18:41:17.540] ..$ : int 61 [18:41:17.540] ..$ : int 62 [18:41:17.540] ..$ : int 63 [18:41:17.540] ..$ : int 64 [18:41:17.540] ..$ : int 65 [18:41:17.540] ..$ : int 66 [18:41:17.540] ..$ : int 67 [18:41:17.540] ..$ : int 68 [18:41:17.540] ..$ : int 69 [18:41:17.540] ..$ : int 70 [18:41:17.540] ..$ : int 71 [18:41:17.540] ..$ : int 72 [18:41:17.540] ..$ : int 73 [18:41:17.540] ..$ : int 74 [18:41:17.540] ..$ : int 75 [18:41:17.540] ..$ : int 76 [18:41:17.540] ..$ : int 77 [18:41:17.540] ..$ : int 78 [18:41:17.540] ..$ : int 79 [18:41:17.540] ..$ : int 80 [18:41:17.540] ..$ : int 81 [18:41:17.540] ..$ : int 82 [18:41:17.540] ..$ : int 83 [18:41:17.540] ..$ : int 84 [18:41:17.540] ..$ : int 85 [18:41:17.540] ..$ : int 86 [18:41:17.540] ..$ : int 87 [18:41:17.540] ..$ : int 88 [18:41:17.540] ..$ : int 89 [18:41:17.540] ..$ : int 90 [18:41:17.540] ..$ : int 91 [18:41:17.540] ..$ : int 92 [18:41:17.540] ..$ : int 93 [18:41:17.540] ..$ : int 94 [18:41:17.540] ..$ : int 95 [18:41:17.540] ..$ : int 96 [18:41:17.540] ..$ : int 97 [18:41:17.540] ..$ : int 98 [18:41:17.540] ..$ : int 99 [18:41:17.540] .. [list output truncated] [18:41:17.540] $ ...future.seeds_ii : NULL [18:41:17.540] $ ...future.globals.maxSize: NULL [18:41:17.540] - attr(*, "where")=List of 6 [18:41:17.540] ..$ ...future.FUN : [18:41:17.540] ..$ a : [18:41:17.540] ..$ future.call.arguments : [18:41:17.540] ..$ ...future.elements_ii : [18:41:17.540] ..$ ...future.seeds_ii : [18:41:17.540] ..$ ...future.globals.maxSize: [18:41:17.540] - attr(*, "resolved")= logi FALSE [18:41:17.540] - attr(*, "total_size")= num 4016 [18:41:17.540] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:17.540] - attr(*, "already-done")= logi TRUE [18:41:17.588] - reassign environment for '...future.FUN' [18:41:17.588] - copied '...future.FUN' to environment [18:41:17.588] - copied 'a' to environment [18:41:17.588] - copied 'future.call.arguments' to environment [18:41:17.589] - copied '...future.elements_ii' to environment [18:41:17.589] - copied '...future.seeds_ii' to environment [18:41:17.589] - copied '...future.globals.maxSize' to environment [18:41:17.589] assign_globals() ... done [18:41:17.590] plan(): Setting new future strategy stack: [18:41:17.590] List of future strategies: [18:41:17.590] 1. sequential: [18:41:17.590] - args: function (..., envir = parent.frame(), workers = "") [18:41:17.590] - tweaked: FALSE [18:41:17.590] - call: NULL [18:41:17.590] plan(): nbrOfWorkers() = 1 [18:41:17.610] plan(): Setting new future strategy stack: [18:41:17.610] List of future strategies: [18:41:17.610] 1. sequential: [18:41:17.610] - args: function (..., envir = parent.frame(), workers = "") [18:41:17.610] - tweaked: FALSE [18:41:17.610] - call: plan(strategy) [18:41:17.611] plan(): nbrOfWorkers() = 1 [18:41:17.611] SequentialFuture started (and completed) [18:41:17.611] - Launch lazy future ... done [18:41:17.611] run() for 'SequentialFuture' ... done [18:41:17.611] Created future: [18:41:17.612] SequentialFuture: [18:41:17.612] Label: 'future_lapply-1' [18:41:17.612] Expression: [18:41:17.612] { [18:41:17.612] do.call(function(...) { [18:41:17.612] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.612] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:17.612] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.612] on.exit(options(oopts), add = TRUE) [18:41:17.612] } [18:41:17.612] { [18:41:17.612] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:17.612] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.612] ...future.FUN(...future.X_jj, ...) [18:41:17.612] }) [18:41:17.612] } [18:41:17.612] }, args = future.call.arguments) [18:41:17.612] } [18:41:17.612] Lazy evaluation: FALSE [18:41:17.612] Asynchronous evaluation: FALSE [18:41:17.612] Local evaluation: TRUE [18:41:17.612] Environment: R_GlobalEnv [18:41:17.612] Capture standard output: TRUE [18:41:17.612] Capture condition classes: 'condition' (excluding 'nothing') [18:41:17.612] Globals: 6 objects totaling 117.79 KiB (function '...future.FUN' of 399 bytes, numeric 'a' of 39 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 117.22 KiB, NULL '...future.seeds_ii' of 27 bytes, ...) [18:41:17.612] Packages: [18:41:17.612] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:17.612] Resolved: TRUE [18:41:17.612] Value: 156.28 KiB of class 'list' [18:41:17.612] Early signaling: FALSE [18:41:17.612] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:17.612] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:17.613] Chunk #1 of 1 ... DONE [18:41:17.613] Launching 1 futures (chunks) ... DONE [18:41:17.613] Resolving 1 futures (chunks) ... [18:41:17.614] resolve() on list ... [18:41:17.614] recursive: 0 [18:41:17.614] length: 1 [18:41:17.614] [18:41:17.614] resolved() for 'SequentialFuture' ... [18:41:17.614] - state: 'finished' [18:41:17.615] - run: TRUE [18:41:17.615] - result: 'FutureResult' [18:41:17.615] resolved() for 'SequentialFuture' ... done [18:41:17.615] Future #1 [18:41:17.615] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:17.616] - nx: 1 [18:41:17.616] - relay: TRUE [18:41:17.616] - stdout: TRUE [18:41:17.616] - signal: TRUE [18:41:17.616] - resignal: FALSE [18:41:17.616] - force: TRUE [18:41:17.616] - relayed: [n=1] FALSE [18:41:17.617] - queued futures: [n=1] FALSE [18:41:17.617] - until=1 [18:41:17.617] - relaying element #1 [18:41:17.617] - relayed: [n=1] TRUE [18:41:17.617] - queued futures: [n=1] TRUE [18:41:17.618] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:17.618] length: 0 (resolved future 1) [18:41:17.618] Relaying remaining futures [18:41:17.618] signalConditionsASAP(NULL, pos=0) ... [18:41:17.618] - nx: 1 [18:41:17.618] - relay: TRUE [18:41:17.619] - stdout: TRUE [18:41:17.619] - signal: TRUE [18:41:17.619] - resignal: FALSE [18:41:17.619] - force: TRUE [18:41:17.619] - relayed: [n=1] TRUE [18:41:17.619] - queued futures: [n=1] TRUE - flush all [18:41:17.619] - relayed: [n=1] TRUE [18:41:17.620] - queued futures: [n=1] TRUE [18:41:17.620] signalConditionsASAP(NULL, pos=0) ... done [18:41:17.620] resolve() on list ... DONE [18:41:17.620] - Number of value chunks collected: 1 [18:41:17.620] Resolving 1 futures (chunks) ... DONE [18:41:17.621] Reducing values from 1 chunks ... [18:41:17.621] - Number of values collected after concatenation: 10000 [18:41:17.621] - Number of values expected: 10000 [18:41:17.621] Reducing values from 1 chunks ... DONE [18:41:17.622] future_lapply() ... DONE - future_lapply(x, FUN = table, ...) ... [18:41:17.623] future_lapply() ... [18:41:17.669] Number of chunks: 1 [18:41:17.670] getGlobalsAndPackagesXApply() ... [18:41:17.670] - future.globals: TRUE [18:41:17.670] getGlobalsAndPackages() ... [18:41:17.670] Searching for globals... [18:41:17.717] - globals found: [59] 'FUN', 'if', '==', 'c', 'list.names', '{', '<-', '[', 'as.list', 'substitute', '-', '&&', 'length', 'is.list', '!', 'is.null', 'names', 'return', 'seq_along', 'vapply', 'switch', '+', 'is.symbol', 'as.character', 'deparse', '[<-', 'missing', 'match', 'match.arg', '!=', 'warning', 'list', '[[', 'paste', 'stop', 'integer', 'for', 'is.factor', 'anyNA', 'options', 'on.exit', 'factor', '(', '||', 'levels', 'as.integer', 'which', 'is.na', 'is.na<-', '>', 'prod', '$', '.Machine', '*', 'names<-', 'array', 'tabulate', 'class', 'class<-' [18:41:17.717] Searching for globals ... DONE [18:41:17.717] Resolving globals: FALSE [18:41:17.720] The total size of the 1 globals is 31.30 KiB (32048 bytes) [18:41:17.720] The total size of the 1 globals exported for future expression ('FUN()') is 31.30 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (31.30 KiB of class 'function') [18:41:17.720] - globals: [1] 'FUN' [18:41:17.721] [18:41:17.721] getGlobalsAndPackages() ... DONE [18:41:17.721] - globals found/used: [n=1] 'FUN' [18:41:17.721] - needed namespaces: [n=0] [18:41:17.721] Finding globals ... DONE [18:41:17.721] - use_args: TRUE [18:41:17.722] - Getting '...' globals ... [18:41:17.722] resolve() on list ... [18:41:17.722] recursive: 0 [18:41:17.722] length: 1 [18:41:17.723] elements: '...' [18:41:17.723] length: 0 (resolved future 1) [18:41:17.723] resolve() on list ... DONE [18:41:17.723] - '...' content: [n=0] [18:41:17.723] List of 1 [18:41:17.723] $ ...: list() [18:41:17.723] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:17.723] - attr(*, "where")=List of 1 [18:41:17.723] ..$ ...: [18:41:17.723] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:17.723] - attr(*, "resolved")= logi TRUE [18:41:17.723] - attr(*, "total_size")= num NA [18:41:17.729] - Getting '...' globals ... DONE [18:41:17.729] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:17.729] List of 2 [18:41:17.729] $ ...future.FUN:function (..., exclude = if (useNA == "no") c(NA, NaN), useNA = c("no", [18:41:17.729] "ifany", "always"), dnn = list.names(...), deparse.level = 1) [18:41:17.729] $ ... : list() [18:41:17.729] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:17.729] - attr(*, "where")=List of 2 [18:41:17.729] ..$ ...future.FUN: [18:41:17.729] ..$ ... : [18:41:17.729] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:17.729] - attr(*, "resolved")= logi FALSE [18:41:17.729] - attr(*, "total_size")= int 67153 [18:41:17.732] Packages to be attached in all futures: [n=0] [18:41:17.733] getGlobalsAndPackagesXApply() ... DONE [18:41:17.733] Number of futures (= number of chunks): 1 [18:41:17.733] Launching 1 futures (chunks) ... [18:41:17.733] Chunk #1 of 1 ... [18:41:17.733] - Finding globals in 'X' for chunk #1 ... [18:41:17.734] getGlobalsAndPackages() ... [18:41:17.734] Searching for globals... [18:41:17.734] [18:41:17.734] Searching for globals ... DONE [18:41:17.734] - globals: [0] [18:41:17.734] getGlobalsAndPackages() ... DONE [18:41:17.735] + additional globals found: [n=0] [18:41:17.735] + additional namespaces needed: [n=0] [18:41:17.735] - Finding globals in 'X' for chunk #1 ... DONE [18:41:17.735] - seeds: [18:41:17.735] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.736] getGlobalsAndPackages() ... [18:41:17.736] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.736] Resolving globals: FALSE [18:41:17.736] Tweak future expression to call with '...' arguments ... [18:41:17.736] { [18:41:17.736] do.call(function(...) { [18:41:17.736] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.736] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:17.736] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.736] on.exit(options(oopts), add = TRUE) [18:41:17.736] } [18:41:17.736] { [18:41:17.736] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:17.736] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.736] ...future.FUN(...future.X_jj, ...) [18:41:17.736] }) [18:41:17.736] } [18:41:17.736] }, args = future.call.arguments) [18:41:17.736] } [18:41:17.737] Tweak future expression to call with '...' arguments ... DONE [18:41:17.737] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.738] [18:41:17.738] getGlobalsAndPackages() ... DONE [18:41:17.738] run() for 'Future' ... [18:41:17.738] - state: 'created' [18:41:17.739] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:17.739] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:17.739] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:17.739] - Field: 'label' [18:41:17.739] - Field: 'local' [18:41:17.740] - Field: 'owner' [18:41:17.740] - Field: 'envir' [18:41:17.740] - Field: 'packages' [18:41:17.740] - Field: 'gc' [18:41:17.740] - Field: 'conditions' [18:41:17.740] - Field: 'expr' [18:41:17.741] - Field: 'uuid' [18:41:17.741] - Field: 'seed' [18:41:17.741] - Field: 'version' [18:41:17.741] - Field: 'result' [18:41:17.741] - Field: 'asynchronous' [18:41:17.741] - Field: 'calls' [18:41:17.742] - Field: 'globals' [18:41:17.742] - Field: 'stdout' [18:41:17.742] - Field: 'earlySignal' [18:41:17.742] - Field: 'lazy' [18:41:17.742] - Field: 'state' [18:41:17.743] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:17.743] - Launch lazy future ... [18:41:17.743] Packages needed by the future expression (n = 0): [18:41:17.743] Packages needed by future strategies (n = 0): [18:41:17.744] { [18:41:17.744] { [18:41:17.744] { [18:41:17.744] ...future.startTime <- base::Sys.time() [18:41:17.744] { [18:41:17.744] { [18:41:17.744] { [18:41:17.744] base::local({ [18:41:17.744] has_future <- base::requireNamespace("future", [18:41:17.744] quietly = TRUE) [18:41:17.744] if (has_future) { [18:41:17.744] ns <- base::getNamespace("future") [18:41:17.744] version <- ns[[".package"]][["version"]] [18:41:17.744] if (is.null(version)) [18:41:17.744] version <- utils::packageVersion("future") [18:41:17.744] } [18:41:17.744] else { [18:41:17.744] version <- NULL [18:41:17.744] } [18:41:17.744] if (!has_future || version < "1.8.0") { [18:41:17.744] info <- base::c(r_version = base::gsub("R version ", [18:41:17.744] "", base::R.version$version.string), [18:41:17.744] platform = base::sprintf("%s (%s-bit)", [18:41:17.744] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:17.744] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:17.744] "release", "version")], collapse = " "), [18:41:17.744] hostname = base::Sys.info()[["nodename"]]) [18:41:17.744] info <- base::sprintf("%s: %s", base::names(info), [18:41:17.744] info) [18:41:17.744] info <- base::paste(info, collapse = "; ") [18:41:17.744] if (!has_future) { [18:41:17.744] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:17.744] info) [18:41:17.744] } [18:41:17.744] else { [18:41:17.744] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:17.744] info, version) [18:41:17.744] } [18:41:17.744] base::stop(msg) [18:41:17.744] } [18:41:17.744] }) [18:41:17.744] } [18:41:17.744] ...future.strategy.old <- future::plan("list") [18:41:17.744] options(future.plan = NULL) [18:41:17.744] Sys.unsetenv("R_FUTURE_PLAN") [18:41:17.744] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:17.744] } [18:41:17.744] ...future.workdir <- getwd() [18:41:17.744] } [18:41:17.744] ...future.oldOptions <- base::as.list(base::.Options) [18:41:17.744] ...future.oldEnvVars <- base::Sys.getenv() [18:41:17.744] } [18:41:17.744] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:17.744] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:17.744] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:17.744] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:17.744] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:17.744] future.stdout.windows.reencode = NULL, width = 80L) [18:41:17.744] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:17.744] base::names(...future.oldOptions)) [18:41:17.744] } [18:41:17.744] if (FALSE) { [18:41:17.744] } [18:41:17.744] else { [18:41:17.744] if (TRUE) { [18:41:17.744] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:17.744] open = "w") [18:41:17.744] } [18:41:17.744] else { [18:41:17.744] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:17.744] windows = "NUL", "/dev/null"), open = "w") [18:41:17.744] } [18:41:17.744] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:17.744] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:17.744] base::sink(type = "output", split = FALSE) [18:41:17.744] base::close(...future.stdout) [18:41:17.744] }, add = TRUE) [18:41:17.744] } [18:41:17.744] ...future.frame <- base::sys.nframe() [18:41:17.744] ...future.conditions <- base::list() [18:41:17.744] ...future.rng <- base::globalenv()$.Random.seed [18:41:17.744] if (FALSE) { [18:41:17.744] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:17.744] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:17.744] } [18:41:17.744] ...future.result <- base::tryCatch({ [18:41:17.744] base::withCallingHandlers({ [18:41:17.744] ...future.value <- base::withVisible(base::local({ [18:41:17.744] do.call(function(...) { [18:41:17.744] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.744] if (!identical(...future.globals.maxSize.org, [18:41:17.744] ...future.globals.maxSize)) { [18:41:17.744] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.744] on.exit(options(oopts), add = TRUE) [18:41:17.744] } [18:41:17.744] { [18:41:17.744] lapply(seq_along(...future.elements_ii), [18:41:17.744] FUN = function(jj) { [18:41:17.744] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.744] ...future.FUN(...future.X_jj, ...) [18:41:17.744] }) [18:41:17.744] } [18:41:17.744] }, args = future.call.arguments) [18:41:17.744] })) [18:41:17.744] future::FutureResult(value = ...future.value$value, [18:41:17.744] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:17.744] ...future.rng), globalenv = if (FALSE) [18:41:17.744] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:17.744] ...future.globalenv.names)) [18:41:17.744] else NULL, started = ...future.startTime, version = "1.8") [18:41:17.744] }, condition = base::local({ [18:41:17.744] c <- base::c [18:41:17.744] inherits <- base::inherits [18:41:17.744] invokeRestart <- base::invokeRestart [18:41:17.744] length <- base::length [18:41:17.744] list <- base::list [18:41:17.744] seq.int <- base::seq.int [18:41:17.744] signalCondition <- base::signalCondition [18:41:17.744] sys.calls <- base::sys.calls [18:41:17.744] `[[` <- base::`[[` [18:41:17.744] `+` <- base::`+` [18:41:17.744] `<<-` <- base::`<<-` [18:41:17.744] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:17.744] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:17.744] 3L)] [18:41:17.744] } [18:41:17.744] function(cond) { [18:41:17.744] is_error <- inherits(cond, "error") [18:41:17.744] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:17.744] NULL) [18:41:17.744] if (is_error) { [18:41:17.744] sessionInformation <- function() { [18:41:17.744] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:17.744] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:17.744] search = base::search(), system = base::Sys.info()) [18:41:17.744] } [18:41:17.744] ...future.conditions[[length(...future.conditions) + [18:41:17.744] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:17.744] cond$call), session = sessionInformation(), [18:41:17.744] timestamp = base::Sys.time(), signaled = 0L) [18:41:17.744] signalCondition(cond) [18:41:17.744] } [18:41:17.744] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:17.744] "immediateCondition"))) { [18:41:17.744] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:17.744] ...future.conditions[[length(...future.conditions) + [18:41:17.744] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:17.744] if (TRUE && !signal) { [18:41:17.744] muffleCondition <- function (cond, pattern = "^muffle") [18:41:17.744] { [18:41:17.744] inherits <- base::inherits [18:41:17.744] invokeRestart <- base::invokeRestart [18:41:17.744] is.null <- base::is.null [18:41:17.744] muffled <- FALSE [18:41:17.744] if (inherits(cond, "message")) { [18:41:17.744] muffled <- grepl(pattern, "muffleMessage") [18:41:17.744] if (muffled) [18:41:17.744] invokeRestart("muffleMessage") [18:41:17.744] } [18:41:17.744] else if (inherits(cond, "warning")) { [18:41:17.744] muffled <- grepl(pattern, "muffleWarning") [18:41:17.744] if (muffled) [18:41:17.744] invokeRestart("muffleWarning") [18:41:17.744] } [18:41:17.744] else if (inherits(cond, "condition")) { [18:41:17.744] if (!is.null(pattern)) { [18:41:17.744] computeRestarts <- base::computeRestarts [18:41:17.744] grepl <- base::grepl [18:41:17.744] restarts <- computeRestarts(cond) [18:41:17.744] for (restart in restarts) { [18:41:17.744] name <- restart$name [18:41:17.744] if (is.null(name)) [18:41:17.744] next [18:41:17.744] if (!grepl(pattern, name)) [18:41:17.744] next [18:41:17.744] invokeRestart(restart) [18:41:17.744] muffled <- TRUE [18:41:17.744] break [18:41:17.744] } [18:41:17.744] } [18:41:17.744] } [18:41:17.744] invisible(muffled) [18:41:17.744] } [18:41:17.744] muffleCondition(cond, pattern = "^muffle") [18:41:17.744] } [18:41:17.744] } [18:41:17.744] else { [18:41:17.744] if (TRUE) { [18:41:17.744] muffleCondition <- function (cond, pattern = "^muffle") [18:41:17.744] { [18:41:17.744] inherits <- base::inherits [18:41:17.744] invokeRestart <- base::invokeRestart [18:41:17.744] is.null <- base::is.null [18:41:17.744] muffled <- FALSE [18:41:17.744] if (inherits(cond, "message")) { [18:41:17.744] muffled <- grepl(pattern, "muffleMessage") [18:41:17.744] if (muffled) [18:41:17.744] invokeRestart("muffleMessage") [18:41:17.744] } [18:41:17.744] else if (inherits(cond, "warning")) { [18:41:17.744] muffled <- grepl(pattern, "muffleWarning") [18:41:17.744] if (muffled) [18:41:17.744] invokeRestart("muffleWarning") [18:41:17.744] } [18:41:17.744] else if (inherits(cond, "condition")) { [18:41:17.744] if (!is.null(pattern)) { [18:41:17.744] computeRestarts <- base::computeRestarts [18:41:17.744] grepl <- base::grepl [18:41:17.744] restarts <- computeRestarts(cond) [18:41:17.744] for (restart in restarts) { [18:41:17.744] name <- restart$name [18:41:17.744] if (is.null(name)) [18:41:17.744] next [18:41:17.744] if (!grepl(pattern, name)) [18:41:17.744] next [18:41:17.744] invokeRestart(restart) [18:41:17.744] muffled <- TRUE [18:41:17.744] break [18:41:17.744] } [18:41:17.744] } [18:41:17.744] } [18:41:17.744] invisible(muffled) [18:41:17.744] } [18:41:17.744] muffleCondition(cond, pattern = "^muffle") [18:41:17.744] } [18:41:17.744] } [18:41:17.744] } [18:41:17.744] })) [18:41:17.744] }, error = function(ex) { [18:41:17.744] base::structure(base::list(value = NULL, visible = NULL, [18:41:17.744] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:17.744] ...future.rng), started = ...future.startTime, [18:41:17.744] finished = Sys.time(), session_uuid = NA_character_, [18:41:17.744] version = "1.8"), class = "FutureResult") [18:41:17.744] }, finally = { [18:41:17.744] if (!identical(...future.workdir, getwd())) [18:41:17.744] setwd(...future.workdir) [18:41:17.744] { [18:41:17.744] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:17.744] ...future.oldOptions$nwarnings <- NULL [18:41:17.744] } [18:41:17.744] base::options(...future.oldOptions) [18:41:17.744] if (.Platform$OS.type == "windows") { [18:41:17.744] old_names <- names(...future.oldEnvVars) [18:41:17.744] envs <- base::Sys.getenv() [18:41:17.744] names <- names(envs) [18:41:17.744] common <- intersect(names, old_names) [18:41:17.744] added <- setdiff(names, old_names) [18:41:17.744] removed <- setdiff(old_names, names) [18:41:17.744] changed <- common[...future.oldEnvVars[common] != [18:41:17.744] envs[common]] [18:41:17.744] NAMES <- toupper(changed) [18:41:17.744] args <- list() [18:41:17.744] for (kk in seq_along(NAMES)) { [18:41:17.744] name <- changed[[kk]] [18:41:17.744] NAME <- NAMES[[kk]] [18:41:17.744] if (name != NAME && is.element(NAME, old_names)) [18:41:17.744] next [18:41:17.744] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:17.744] } [18:41:17.744] NAMES <- toupper(added) [18:41:17.744] for (kk in seq_along(NAMES)) { [18:41:17.744] name <- added[[kk]] [18:41:17.744] NAME <- NAMES[[kk]] [18:41:17.744] if (name != NAME && is.element(NAME, old_names)) [18:41:17.744] next [18:41:17.744] args[[name]] <- "" [18:41:17.744] } [18:41:17.744] NAMES <- toupper(removed) [18:41:17.744] for (kk in seq_along(NAMES)) { [18:41:17.744] name <- removed[[kk]] [18:41:17.744] NAME <- NAMES[[kk]] [18:41:17.744] if (name != NAME && is.element(NAME, old_names)) [18:41:17.744] next [18:41:17.744] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:17.744] } [18:41:17.744] if (length(args) > 0) [18:41:17.744] base::do.call(base::Sys.setenv, args = args) [18:41:17.744] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:17.744] } [18:41:17.744] else { [18:41:17.744] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:17.744] } [18:41:17.744] { [18:41:17.744] if (base::length(...future.futureOptionsAdded) > [18:41:17.744] 0L) { [18:41:17.744] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:17.744] base::names(opts) <- ...future.futureOptionsAdded [18:41:17.744] base::options(opts) [18:41:17.744] } [18:41:17.744] { [18:41:17.744] { [18:41:17.744] NULL [18:41:17.744] RNGkind("Mersenne-Twister") [18:41:17.744] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:17.744] inherits = FALSE) [18:41:17.744] } [18:41:17.744] options(future.plan = NULL) [18:41:17.744] if (is.na(NA_character_)) [18:41:17.744] Sys.unsetenv("R_FUTURE_PLAN") [18:41:17.744] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:17.744] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:17.744] .init = FALSE) [18:41:17.744] } [18:41:17.744] } [18:41:17.744] } [18:41:17.744] }) [18:41:17.744] if (TRUE) { [18:41:17.744] base::sink(type = "output", split = FALSE) [18:41:17.744] if (TRUE) { [18:41:17.744] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:17.744] } [18:41:17.744] else { [18:41:17.744] ...future.result["stdout"] <- base::list(NULL) [18:41:17.744] } [18:41:17.744] base::close(...future.stdout) [18:41:17.744] ...future.stdout <- NULL [18:41:17.744] } [18:41:17.744] ...future.result$conditions <- ...future.conditions [18:41:17.744] ...future.result$finished <- base::Sys.time() [18:41:17.744] ...future.result [18:41:17.744] } [18:41:17.747] assign_globals() ... [18:41:17.748] List of 5 [18:41:17.748] $ ...future.FUN :function (..., exclude = if (useNA == "no") c(NA, NaN), useNA = c("no", [18:41:17.748] "ifany", "always"), dnn = list.names(...), deparse.level = 1) [18:41:17.748] $ future.call.arguments : list() [18:41:17.748] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:17.748] $ ...future.elements_ii :List of 2 [18:41:17.748] ..$ a: int [1:4] 1 2 3 4 [18:41:17.748] ..$ b: int [1:4] 5 6 7 8 [18:41:17.748] $ ...future.seeds_ii : NULL [18:41:17.748] $ ...future.globals.maxSize: NULL [18:41:17.748] - attr(*, "where")=List of 5 [18:41:17.748] ..$ ...future.FUN : [18:41:17.748] ..$ future.call.arguments : [18:41:17.748] ..$ ...future.elements_ii : [18:41:17.748] ..$ ...future.seeds_ii : [18:41:17.748] ..$ ...future.globals.maxSize: [18:41:17.748] - attr(*, "resolved")= logi FALSE [18:41:17.748] - attr(*, "total_size")= num 67153 [18:41:17.748] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:17.748] - attr(*, "already-done")= logi TRUE [18:41:17.754] - copied '...future.FUN' to environment [18:41:17.754] - copied 'future.call.arguments' to environment [18:41:17.754] - copied '...future.elements_ii' to environment [18:41:17.754] - copied '...future.seeds_ii' to environment [18:41:17.754] - copied '...future.globals.maxSize' to environment [18:41:17.754] assign_globals() ... done [18:41:17.755] plan(): Setting new future strategy stack: [18:41:17.755] List of future strategies: [18:41:17.755] 1. sequential: [18:41:17.755] - args: function (..., envir = parent.frame(), workers = "") [18:41:17.755] - tweaked: FALSE [18:41:17.755] - call: NULL [18:41:17.756] plan(): nbrOfWorkers() = 1 [18:41:17.757] plan(): Setting new future strategy stack: [18:41:17.757] List of future strategies: [18:41:17.757] 1. sequential: [18:41:17.757] - args: function (..., envir = parent.frame(), workers = "") [18:41:17.757] - tweaked: FALSE [18:41:17.757] - call: plan(strategy) [18:41:17.758] plan(): nbrOfWorkers() = 1 [18:41:17.758] SequentialFuture started (and completed) [18:41:17.758] - Launch lazy future ... done [18:41:17.759] run() for 'SequentialFuture' ... done [18:41:17.759] Created future: [18:41:17.759] SequentialFuture: [18:41:17.759] Label: 'future_lapply-1' [18:41:17.759] Expression: [18:41:17.759] { [18:41:17.759] do.call(function(...) { [18:41:17.759] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.759] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:17.759] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.759] on.exit(options(oopts), add = TRUE) [18:41:17.759] } [18:41:17.759] { [18:41:17.759] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:17.759] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.759] ...future.FUN(...future.X_jj, ...) [18:41:17.759] }) [18:41:17.759] } [18:41:17.759] }, args = future.call.arguments) [18:41:17.759] } [18:41:17.759] Lazy evaluation: FALSE [18:41:17.759] Asynchronous evaluation: FALSE [18:41:17.759] Local evaluation: TRUE [18:41:17.759] Environment: R_GlobalEnv [18:41:17.759] Capture standard output: TRUE [18:41:17.759] Capture condition classes: 'condition' (excluding 'nothing') [18:41:17.759] Globals: 5 objects totaling 31.71 KiB (function '...future.FUN' of 31.30 KiB, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 268 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:17.759] Packages: [18:41:17.759] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:17.759] Resolved: TRUE [18:41:17.759] Value: 442 bytes of class 'list' [18:41:17.759] Early signaling: FALSE [18:41:17.759] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:17.759] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:17.760] Chunk #1 of 1 ... DONE [18:41:17.760] Launching 1 futures (chunks) ... DONE [18:41:17.761] Resolving 1 futures (chunks) ... [18:41:17.761] resolve() on list ... [18:41:17.761] recursive: 0 [18:41:17.761] length: 1 [18:41:17.761] [18:41:17.761] resolved() for 'SequentialFuture' ... [18:41:17.762] - state: 'finished' [18:41:17.762] - run: TRUE [18:41:17.762] - result: 'FutureResult' [18:41:17.762] resolved() for 'SequentialFuture' ... done [18:41:17.762] Future #1 [18:41:17.763] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:17.763] - nx: 1 [18:41:17.763] - relay: TRUE [18:41:17.763] - stdout: TRUE [18:41:17.763] - signal: TRUE [18:41:17.763] - resignal: FALSE [18:41:17.763] - force: TRUE [18:41:17.764] - relayed: [n=1] FALSE [18:41:17.764] - queued futures: [n=1] FALSE [18:41:17.764] - until=1 [18:41:17.764] - relaying element #1 [18:41:17.764] - relayed: [n=1] TRUE [18:41:17.764] - queued futures: [n=1] TRUE [18:41:17.765] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:17.765] length: 0 (resolved future 1) [18:41:17.765] Relaying remaining futures [18:41:17.765] signalConditionsASAP(NULL, pos=0) ... [18:41:17.765] - nx: 1 [18:41:17.765] - relay: TRUE [18:41:17.766] - stdout: TRUE [18:41:17.766] - signal: TRUE [18:41:17.766] - resignal: FALSE [18:41:17.766] - force: TRUE [18:41:17.766] - relayed: [n=1] TRUE [18:41:17.766] - queued futures: [n=1] TRUE - flush all [18:41:17.767] - relayed: [n=1] TRUE [18:41:17.767] - queued futures: [n=1] TRUE [18:41:17.767] signalConditionsASAP(NULL, pos=0) ... done [18:41:17.767] resolve() on list ... DONE [18:41:17.767] - Number of value chunks collected: 1 [18:41:17.767] Resolving 1 futures (chunks) ... DONE [18:41:17.768] Reducing values from 1 chunks ... [18:41:17.768] - Number of values collected after concatenation: 2 [18:41:17.768] - Number of values expected: 2 [18:41:17.768] Reducing values from 1 chunks ... DONE [18:41:17.768] future_lapply() ... DONE - future_lapply(x, ...) where length(x) != length(as.list(x)) ... [18:41:17.769] future_lapply() ... [18:41:17.769] Number of chunks: 1 [18:41:17.769] getGlobalsAndPackagesXApply() ... [18:41:17.769] - future.globals: TRUE [18:41:17.770] getGlobalsAndPackages() ... [18:41:17.770] Searching for globals... [18:41:17.770] - globals found: [1] 'FUN' [18:41:17.771] Searching for globals ... DONE [18:41:17.771] Resolving globals: FALSE [18:41:17.771] The total size of the 1 globals is 37 bytes (37 bytes) [18:41:17.772] The total size of the 1 globals exported for future expression ('FUN()') is 37 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (37 bytes of class 'function') [18:41:17.772] - globals: [1] 'FUN' [18:41:17.772] [18:41:17.772] getGlobalsAndPackages() ... DONE [18:41:17.772] - globals found/used: [n=1] 'FUN' [18:41:17.772] - needed namespaces: [n=0] [18:41:17.773] Finding globals ... DONE [18:41:17.773] - use_args: TRUE [18:41:17.773] - Getting '...' globals ... [18:41:17.773] resolve() on list ... [18:41:17.773] recursive: 0 [18:41:17.774] length: 1 [18:41:17.774] elements: '...' [18:41:17.774] length: 0 (resolved future 1) [18:41:17.774] resolve() on list ... DONE [18:41:17.774] - '...' content: [n=0] [18:41:17.774] List of 1 [18:41:17.774] $ ...: list() [18:41:17.774] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:17.774] - attr(*, "where")=List of 1 [18:41:17.774] ..$ ...: [18:41:17.774] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:17.774] - attr(*, "resolved")= logi TRUE [18:41:17.774] - attr(*, "total_size")= num NA [18:41:17.777] - Getting '...' globals ... DONE [18:41:17.777] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:17.778] List of 2 [18:41:17.778] $ ...future.FUN:function (x) [18:41:17.778] $ ... : list() [18:41:17.778] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:17.778] - attr(*, "where")=List of 2 [18:41:17.778] ..$ ...future.FUN: [18:41:17.778] ..$ ... : [18:41:17.778] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:17.778] - attr(*, "resolved")= logi FALSE [18:41:17.778] - attr(*, "total_size")= int 2891 [18:41:17.781] Packages to be attached in all futures: [n=0] [18:41:17.781] getGlobalsAndPackagesXApply() ... DONE [18:41:17.781] Number of futures (= number of chunks): 1 [18:41:17.782] Launching 1 futures (chunks) ... [18:41:17.782] Chunk #1 of 1 ... [18:41:17.782] - Finding globals in 'X' for chunk #1 ... [18:41:17.782] getGlobalsAndPackages() ... [18:41:17.782] Searching for globals... [18:41:17.783] [18:41:17.783] Searching for globals ... DONE [18:41:17.783] - globals: [0] [18:41:17.783] getGlobalsAndPackages() ... DONE [18:41:17.783] + additional globals found: [n=0] [18:41:17.783] + additional namespaces needed: [n=0] [18:41:17.783] - Finding globals in 'X' for chunk #1 ... DONE [18:41:17.784] - seeds: [18:41:17.784] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.784] getGlobalsAndPackages() ... [18:41:17.784] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.784] Resolving globals: FALSE [18:41:17.784] Tweak future expression to call with '...' arguments ... [18:41:17.785] { [18:41:17.785] do.call(function(...) { [18:41:17.785] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.785] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:17.785] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.785] on.exit(options(oopts), add = TRUE) [18:41:17.785] } [18:41:17.785] { [18:41:17.785] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:17.785] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.785] ...future.FUN(...future.X_jj, ...) [18:41:17.785] }) [18:41:17.785] } [18:41:17.785] }, args = future.call.arguments) [18:41:17.785] } [18:41:17.785] Tweak future expression to call with '...' arguments ... DONE [18:41:17.786] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.786] [18:41:17.786] getGlobalsAndPackages() ... DONE [18:41:17.786] run() for 'Future' ... [18:41:17.786] - state: 'created' [18:41:17.787] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:17.787] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:17.787] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:17.787] - Field: 'label' [18:41:17.788] - Field: 'local' [18:41:17.788] - Field: 'owner' [18:41:17.788] - Field: 'envir' [18:41:17.788] - Field: 'packages' [18:41:17.788] - Field: 'gc' [18:41:17.788] - Field: 'conditions' [18:41:17.789] - Field: 'expr' [18:41:17.789] - Field: 'uuid' [18:41:17.789] - Field: 'seed' [18:41:17.789] - Field: 'version' [18:41:17.789] - Field: 'result' [18:41:17.789] - Field: 'asynchronous' [18:41:17.790] - Field: 'calls' [18:41:17.790] - Field: 'globals' [18:41:17.790] - Field: 'stdout' [18:41:17.790] - Field: 'earlySignal' [18:41:17.790] - Field: 'lazy' [18:41:17.790] - Field: 'state' [18:41:17.791] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:17.791] - Launch lazy future ... [18:41:17.791] Packages needed by the future expression (n = 0): [18:41:17.791] Packages needed by future strategies (n = 0): [18:41:17.792] { [18:41:17.792] { [18:41:17.792] { [18:41:17.792] ...future.startTime <- base::Sys.time() [18:41:17.792] { [18:41:17.792] { [18:41:17.792] { [18:41:17.792] base::local({ [18:41:17.792] has_future <- base::requireNamespace("future", [18:41:17.792] quietly = TRUE) [18:41:17.792] if (has_future) { [18:41:17.792] ns <- base::getNamespace("future") [18:41:17.792] version <- ns[[".package"]][["version"]] [18:41:17.792] if (is.null(version)) [18:41:17.792] version <- utils::packageVersion("future") [18:41:17.792] } [18:41:17.792] else { [18:41:17.792] version <- NULL [18:41:17.792] } [18:41:17.792] if (!has_future || version < "1.8.0") { [18:41:17.792] info <- base::c(r_version = base::gsub("R version ", [18:41:17.792] "", base::R.version$version.string), [18:41:17.792] platform = base::sprintf("%s (%s-bit)", [18:41:17.792] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:17.792] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:17.792] "release", "version")], collapse = " "), [18:41:17.792] hostname = base::Sys.info()[["nodename"]]) [18:41:17.792] info <- base::sprintf("%s: %s", base::names(info), [18:41:17.792] info) [18:41:17.792] info <- base::paste(info, collapse = "; ") [18:41:17.792] if (!has_future) { [18:41:17.792] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:17.792] info) [18:41:17.792] } [18:41:17.792] else { [18:41:17.792] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:17.792] info, version) [18:41:17.792] } [18:41:17.792] base::stop(msg) [18:41:17.792] } [18:41:17.792] }) [18:41:17.792] } [18:41:17.792] ...future.strategy.old <- future::plan("list") [18:41:17.792] options(future.plan = NULL) [18:41:17.792] Sys.unsetenv("R_FUTURE_PLAN") [18:41:17.792] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:17.792] } [18:41:17.792] ...future.workdir <- getwd() [18:41:17.792] } [18:41:17.792] ...future.oldOptions <- base::as.list(base::.Options) [18:41:17.792] ...future.oldEnvVars <- base::Sys.getenv() [18:41:17.792] } [18:41:17.792] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:17.792] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:17.792] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:17.792] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:17.792] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:17.792] future.stdout.windows.reencode = NULL, width = 80L) [18:41:17.792] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:17.792] base::names(...future.oldOptions)) [18:41:17.792] } [18:41:17.792] if (FALSE) { [18:41:17.792] } [18:41:17.792] else { [18:41:17.792] if (TRUE) { [18:41:17.792] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:17.792] open = "w") [18:41:17.792] } [18:41:17.792] else { [18:41:17.792] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:17.792] windows = "NUL", "/dev/null"), open = "w") [18:41:17.792] } [18:41:17.792] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:17.792] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:17.792] base::sink(type = "output", split = FALSE) [18:41:17.792] base::close(...future.stdout) [18:41:17.792] }, add = TRUE) [18:41:17.792] } [18:41:17.792] ...future.frame <- base::sys.nframe() [18:41:17.792] ...future.conditions <- base::list() [18:41:17.792] ...future.rng <- base::globalenv()$.Random.seed [18:41:17.792] if (FALSE) { [18:41:17.792] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:17.792] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:17.792] } [18:41:17.792] ...future.result <- base::tryCatch({ [18:41:17.792] base::withCallingHandlers({ [18:41:17.792] ...future.value <- base::withVisible(base::local({ [18:41:17.792] do.call(function(...) { [18:41:17.792] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.792] if (!identical(...future.globals.maxSize.org, [18:41:17.792] ...future.globals.maxSize)) { [18:41:17.792] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.792] on.exit(options(oopts), add = TRUE) [18:41:17.792] } [18:41:17.792] { [18:41:17.792] lapply(seq_along(...future.elements_ii), [18:41:17.792] FUN = function(jj) { [18:41:17.792] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.792] ...future.FUN(...future.X_jj, ...) [18:41:17.792] }) [18:41:17.792] } [18:41:17.792] }, args = future.call.arguments) [18:41:17.792] })) [18:41:17.792] future::FutureResult(value = ...future.value$value, [18:41:17.792] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:17.792] ...future.rng), globalenv = if (FALSE) [18:41:17.792] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:17.792] ...future.globalenv.names)) [18:41:17.792] else NULL, started = ...future.startTime, version = "1.8") [18:41:17.792] }, condition = base::local({ [18:41:17.792] c <- base::c [18:41:17.792] inherits <- base::inherits [18:41:17.792] invokeRestart <- base::invokeRestart [18:41:17.792] length <- base::length [18:41:17.792] list <- base::list [18:41:17.792] seq.int <- base::seq.int [18:41:17.792] signalCondition <- base::signalCondition [18:41:17.792] sys.calls <- base::sys.calls [18:41:17.792] `[[` <- base::`[[` [18:41:17.792] `+` <- base::`+` [18:41:17.792] `<<-` <- base::`<<-` [18:41:17.792] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:17.792] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:17.792] 3L)] [18:41:17.792] } [18:41:17.792] function(cond) { [18:41:17.792] is_error <- inherits(cond, "error") [18:41:17.792] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:17.792] NULL) [18:41:17.792] if (is_error) { [18:41:17.792] sessionInformation <- function() { [18:41:17.792] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:17.792] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:17.792] search = base::search(), system = base::Sys.info()) [18:41:17.792] } [18:41:17.792] ...future.conditions[[length(...future.conditions) + [18:41:17.792] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:17.792] cond$call), session = sessionInformation(), [18:41:17.792] timestamp = base::Sys.time(), signaled = 0L) [18:41:17.792] signalCondition(cond) [18:41:17.792] } [18:41:17.792] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:17.792] "immediateCondition"))) { [18:41:17.792] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:17.792] ...future.conditions[[length(...future.conditions) + [18:41:17.792] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:17.792] if (TRUE && !signal) { [18:41:17.792] muffleCondition <- function (cond, pattern = "^muffle") [18:41:17.792] { [18:41:17.792] inherits <- base::inherits [18:41:17.792] invokeRestart <- base::invokeRestart [18:41:17.792] is.null <- base::is.null [18:41:17.792] muffled <- FALSE [18:41:17.792] if (inherits(cond, "message")) { [18:41:17.792] muffled <- grepl(pattern, "muffleMessage") [18:41:17.792] if (muffled) [18:41:17.792] invokeRestart("muffleMessage") [18:41:17.792] } [18:41:17.792] else if (inherits(cond, "warning")) { [18:41:17.792] muffled <- grepl(pattern, "muffleWarning") [18:41:17.792] if (muffled) [18:41:17.792] invokeRestart("muffleWarning") [18:41:17.792] } [18:41:17.792] else if (inherits(cond, "condition")) { [18:41:17.792] if (!is.null(pattern)) { [18:41:17.792] computeRestarts <- base::computeRestarts [18:41:17.792] grepl <- base::grepl [18:41:17.792] restarts <- computeRestarts(cond) [18:41:17.792] for (restart in restarts) { [18:41:17.792] name <- restart$name [18:41:17.792] if (is.null(name)) [18:41:17.792] next [18:41:17.792] if (!grepl(pattern, name)) [18:41:17.792] next [18:41:17.792] invokeRestart(restart) [18:41:17.792] muffled <- TRUE [18:41:17.792] break [18:41:17.792] } [18:41:17.792] } [18:41:17.792] } [18:41:17.792] invisible(muffled) [18:41:17.792] } [18:41:17.792] muffleCondition(cond, pattern = "^muffle") [18:41:17.792] } [18:41:17.792] } [18:41:17.792] else { [18:41:17.792] if (TRUE) { [18:41:17.792] muffleCondition <- function (cond, pattern = "^muffle") [18:41:17.792] { [18:41:17.792] inherits <- base::inherits [18:41:17.792] invokeRestart <- base::invokeRestart [18:41:17.792] is.null <- base::is.null [18:41:17.792] muffled <- FALSE [18:41:17.792] if (inherits(cond, "message")) { [18:41:17.792] muffled <- grepl(pattern, "muffleMessage") [18:41:17.792] if (muffled) [18:41:17.792] invokeRestart("muffleMessage") [18:41:17.792] } [18:41:17.792] else if (inherits(cond, "warning")) { [18:41:17.792] muffled <- grepl(pattern, "muffleWarning") [18:41:17.792] if (muffled) [18:41:17.792] invokeRestart("muffleWarning") [18:41:17.792] } [18:41:17.792] else if (inherits(cond, "condition")) { [18:41:17.792] if (!is.null(pattern)) { [18:41:17.792] computeRestarts <- base::computeRestarts [18:41:17.792] grepl <- base::grepl [18:41:17.792] restarts <- computeRestarts(cond) [18:41:17.792] for (restart in restarts) { [18:41:17.792] name <- restart$name [18:41:17.792] if (is.null(name)) [18:41:17.792] next [18:41:17.792] if (!grepl(pattern, name)) [18:41:17.792] next [18:41:17.792] invokeRestart(restart) [18:41:17.792] muffled <- TRUE [18:41:17.792] break [18:41:17.792] } [18:41:17.792] } [18:41:17.792] } [18:41:17.792] invisible(muffled) [18:41:17.792] } [18:41:17.792] muffleCondition(cond, pattern = "^muffle") [18:41:17.792] } [18:41:17.792] } [18:41:17.792] } [18:41:17.792] })) [18:41:17.792] }, error = function(ex) { [18:41:17.792] base::structure(base::list(value = NULL, visible = NULL, [18:41:17.792] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:17.792] ...future.rng), started = ...future.startTime, [18:41:17.792] finished = Sys.time(), session_uuid = NA_character_, [18:41:17.792] version = "1.8"), class = "FutureResult") [18:41:17.792] }, finally = { [18:41:17.792] if (!identical(...future.workdir, getwd())) [18:41:17.792] setwd(...future.workdir) [18:41:17.792] { [18:41:17.792] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:17.792] ...future.oldOptions$nwarnings <- NULL [18:41:17.792] } [18:41:17.792] base::options(...future.oldOptions) [18:41:17.792] if (.Platform$OS.type == "windows") { [18:41:17.792] old_names <- names(...future.oldEnvVars) [18:41:17.792] envs <- base::Sys.getenv() [18:41:17.792] names <- names(envs) [18:41:17.792] common <- intersect(names, old_names) [18:41:17.792] added <- setdiff(names, old_names) [18:41:17.792] removed <- setdiff(old_names, names) [18:41:17.792] changed <- common[...future.oldEnvVars[common] != [18:41:17.792] envs[common]] [18:41:17.792] NAMES <- toupper(changed) [18:41:17.792] args <- list() [18:41:17.792] for (kk in seq_along(NAMES)) { [18:41:17.792] name <- changed[[kk]] [18:41:17.792] NAME <- NAMES[[kk]] [18:41:17.792] if (name != NAME && is.element(NAME, old_names)) [18:41:17.792] next [18:41:17.792] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:17.792] } [18:41:17.792] NAMES <- toupper(added) [18:41:17.792] for (kk in seq_along(NAMES)) { [18:41:17.792] name <- added[[kk]] [18:41:17.792] NAME <- NAMES[[kk]] [18:41:17.792] if (name != NAME && is.element(NAME, old_names)) [18:41:17.792] next [18:41:17.792] args[[name]] <- "" [18:41:17.792] } [18:41:17.792] NAMES <- toupper(removed) [18:41:17.792] for (kk in seq_along(NAMES)) { [18:41:17.792] name <- removed[[kk]] [18:41:17.792] NAME <- NAMES[[kk]] [18:41:17.792] if (name != NAME && is.element(NAME, old_names)) [18:41:17.792] next [18:41:17.792] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:17.792] } [18:41:17.792] if (length(args) > 0) [18:41:17.792] base::do.call(base::Sys.setenv, args = args) [18:41:17.792] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:17.792] } [18:41:17.792] else { [18:41:17.792] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:17.792] } [18:41:17.792] { [18:41:17.792] if (base::length(...future.futureOptionsAdded) > [18:41:17.792] 0L) { [18:41:17.792] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:17.792] base::names(opts) <- ...future.futureOptionsAdded [18:41:17.792] base::options(opts) [18:41:17.792] } [18:41:17.792] { [18:41:17.792] { [18:41:17.792] NULL [18:41:17.792] RNGkind("Mersenne-Twister") [18:41:17.792] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:17.792] inherits = FALSE) [18:41:17.792] } [18:41:17.792] options(future.plan = NULL) [18:41:17.792] if (is.na(NA_character_)) [18:41:17.792] Sys.unsetenv("R_FUTURE_PLAN") [18:41:17.792] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:17.792] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:17.792] .init = FALSE) [18:41:17.792] } [18:41:17.792] } [18:41:17.792] } [18:41:17.792] }) [18:41:17.792] if (TRUE) { [18:41:17.792] base::sink(type = "output", split = FALSE) [18:41:17.792] if (TRUE) { [18:41:17.792] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:17.792] } [18:41:17.792] else { [18:41:17.792] ...future.result["stdout"] <- base::list(NULL) [18:41:17.792] } [18:41:17.792] base::close(...future.stdout) [18:41:17.792] ...future.stdout <- NULL [18:41:17.792] } [18:41:17.792] ...future.result$conditions <- ...future.conditions [18:41:17.792] ...future.result$finished <- base::Sys.time() [18:41:17.792] ...future.result [18:41:17.792] } [18:41:17.796] assign_globals() ... [18:41:17.796] List of 5 [18:41:17.796] $ ...future.FUN :function (x) [18:41:17.796] $ future.call.arguments : list() [18:41:17.796] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:17.796] $ ...future.elements_ii :List of 3 [18:41:17.796] ..$ a: num 1 [18:41:17.796] ..$ b: num 2 [18:41:17.796] ..$ c: num 3 [18:41:17.796] $ ...future.seeds_ii : NULL [18:41:17.796] $ ...future.globals.maxSize: NULL [18:41:17.796] - attr(*, "where")=List of 5 [18:41:17.796] ..$ ...future.FUN : [18:41:17.796] ..$ future.call.arguments : [18:41:17.796] ..$ ...future.elements_ii : [18:41:17.796] ..$ ...future.seeds_ii : [18:41:17.796] ..$ ...future.globals.maxSize: [18:41:17.796] - attr(*, "resolved")= logi FALSE [18:41:17.796] - attr(*, "total_size")= num 2891 [18:41:17.796] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:17.796] - attr(*, "already-done")= logi TRUE [18:41:17.802] - copied '...future.FUN' to environment [18:41:17.802] - copied 'future.call.arguments' to environment [18:41:17.803] - copied '...future.elements_ii' to environment [18:41:17.803] - copied '...future.seeds_ii' to environment [18:41:17.803] - copied '...future.globals.maxSize' to environment [18:41:17.803] assign_globals() ... done [18:41:17.803] plan(): Setting new future strategy stack: [18:41:17.804] List of future strategies: [18:41:17.804] 1. sequential: [18:41:17.804] - args: function (..., envir = parent.frame(), workers = "") [18:41:17.804] - tweaked: FALSE [18:41:17.804] - call: NULL [18:41:17.804] plan(): nbrOfWorkers() = 1 [18:41:17.805] plan(): Setting new future strategy stack: [18:41:17.806] List of future strategies: [18:41:17.806] 1. sequential: [18:41:17.806] - args: function (..., envir = parent.frame(), workers = "") [18:41:17.806] - tweaked: FALSE [18:41:17.806] - call: plan(strategy) [18:41:17.806] plan(): nbrOfWorkers() = 1 [18:41:17.806] SequentialFuture started (and completed) [18:41:17.807] - Launch lazy future ... done [18:41:17.807] run() for 'SequentialFuture' ... done [18:41:17.807] Created future: [18:41:17.807] SequentialFuture: [18:41:17.807] Label: 'future_lapply-1' [18:41:17.807] Expression: [18:41:17.807] { [18:41:17.807] do.call(function(...) { [18:41:17.807] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.807] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:17.807] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.807] on.exit(options(oopts), add = TRUE) [18:41:17.807] } [18:41:17.807] { [18:41:17.807] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:17.807] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.807] ...future.FUN(...future.X_jj, ...) [18:41:17.807] }) [18:41:17.807] } [18:41:17.807] }, args = future.call.arguments) [18:41:17.807] } [18:41:17.807] Lazy evaluation: FALSE [18:41:17.807] Asynchronous evaluation: FALSE [18:41:17.807] Local evaluation: TRUE [18:41:17.807] Environment: R_GlobalEnv [18:41:17.807] Capture standard output: TRUE [18:41:17.807] Capture condition classes: 'condition' (excluding 'nothing') [18:41:17.807] Globals: 5 objects totaling 327 bytes (function '...future.FUN' of 37 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 139 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:17.807] Packages: [18:41:17.807] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:17.807] Resolved: TRUE [18:41:17.807] Value: 67 bytes of class 'list' [18:41:17.807] Early signaling: FALSE [18:41:17.807] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:17.807] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:17.808] Chunk #1 of 1 ... DONE [18:41:17.808] Launching 1 futures (chunks) ... DONE [18:41:17.808] Resolving 1 futures (chunks) ... [18:41:17.809] resolve() on list ... [18:41:17.809] recursive: 0 [18:41:17.809] length: 1 [18:41:17.809] [18:41:17.809] resolved() for 'SequentialFuture' ... [18:41:17.809] - state: 'finished' [18:41:17.810] - run: TRUE [18:41:17.810] - result: 'FutureResult' [18:41:17.810] resolved() for 'SequentialFuture' ... done [18:41:17.810] Future #1 [18:41:17.810] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:17.811] - nx: 1 [18:41:17.811] - relay: TRUE [18:41:17.811] - stdout: TRUE [18:41:17.811] - signal: TRUE [18:41:17.811] - resignal: FALSE [18:41:17.811] - force: TRUE [18:41:17.811] - relayed: [n=1] FALSE [18:41:17.812] - queued futures: [n=1] FALSE [18:41:17.812] - until=1 [18:41:17.812] - relaying element #1 [18:41:17.812] - relayed: [n=1] TRUE [18:41:17.812] - queued futures: [n=1] TRUE [18:41:17.813] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:17.813] length: 0 (resolved future 1) [18:41:17.813] Relaying remaining futures [18:41:17.813] signalConditionsASAP(NULL, pos=0) ... [18:41:17.813] - nx: 1 [18:41:17.813] - relay: TRUE [18:41:17.814] - stdout: TRUE [18:41:17.814] - signal: TRUE [18:41:17.814] - resignal: FALSE [18:41:17.814] - force: TRUE [18:41:17.814] - relayed: [n=1] TRUE [18:41:17.814] - queued futures: [n=1] TRUE - flush all [18:41:17.815] - relayed: [n=1] TRUE [18:41:17.815] - queued futures: [n=1] TRUE [18:41:17.815] signalConditionsASAP(NULL, pos=0) ... done [18:41:17.815] resolve() on list ... DONE [18:41:17.815] - Number of value chunks collected: 1 [18:41:17.815] Resolving 1 futures (chunks) ... DONE [18:41:17.816] Reducing values from 1 chunks ... [18:41:17.816] - Number of values collected after concatenation: 3 [18:41:17.816] - Number of values expected: 3 [18:41:17.816] Reducing values from 1 chunks ... DONE [18:41:17.816] future_lapply() ... DONE - future_lapply(x, ...) where x[[i]] subsets via S3 method ... [18:41:17.816] future_lapply() ... [18:41:17.817] Number of chunks: 1 [18:41:17.817] getGlobalsAndPackagesXApply() ... [18:41:17.817] - future.globals: TRUE [18:41:17.817] getGlobalsAndPackages() ... [18:41:17.818] Searching for globals... [18:41:17.819] - globals found: [1] 'FUN' [18:41:17.819] Searching for globals ... DONE [18:41:17.820] Resolving globals: FALSE [18:41:17.820] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:17.820] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:17.821] - globals: [1] 'FUN' [18:41:17.821] [18:41:17.821] getGlobalsAndPackages() ... DONE [18:41:17.821] - globals found/used: [n=1] 'FUN' [18:41:17.821] - needed namespaces: [n=0] [18:41:17.821] Finding globals ... DONE [18:41:17.822] - use_args: TRUE [18:41:17.822] - Getting '...' globals ... [18:41:17.822] resolve() on list ... [18:41:17.822] recursive: 0 [18:41:17.822] length: 1 [18:41:17.823] elements: '...' [18:41:17.823] length: 0 (resolved future 1) [18:41:17.823] resolve() on list ... DONE [18:41:17.823] - '...' content: [n=0] [18:41:17.823] List of 1 [18:41:17.823] $ ...: list() [18:41:17.823] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:17.823] - attr(*, "where")=List of 1 [18:41:17.823] ..$ ...: [18:41:17.823] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:17.823] - attr(*, "resolved")= logi TRUE [18:41:17.823] - attr(*, "total_size")= num NA [18:41:17.826] - Getting '...' globals ... DONE [18:41:17.826] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:17.827] List of 2 [18:41:17.827] $ ...future.FUN:function (x) [18:41:17.827] $ ... : list() [18:41:17.827] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:17.827] - attr(*, "where")=List of 2 [18:41:17.827] ..$ ...future.FUN: [18:41:17.827] ..$ ... : [18:41:17.827] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:17.827] - attr(*, "resolved")= logi FALSE [18:41:17.827] - attr(*, "total_size")= int 3176 [18:41:17.830] Packages to be attached in all futures: [n=0] [18:41:17.830] getGlobalsAndPackagesXApply() ... DONE [18:41:17.831] Number of futures (= number of chunks): 1 [18:41:17.831] Launching 1 futures (chunks) ... [18:41:17.831] Chunk #1 of 1 ... [18:41:17.831] - Finding globals in 'X' for chunk #1 ... [18:41:17.831] getGlobalsAndPackages() ... [18:41:17.832] Searching for globals... [18:41:17.832] [18:41:17.832] Searching for globals ... DONE [18:41:17.832] - globals: [0] [18:41:17.832] getGlobalsAndPackages() ... DONE [18:41:17.833] + additional globals found: [n=0] [18:41:17.833] + additional namespaces needed: [n=0] [18:41:17.833] - Finding globals in 'X' for chunk #1 ... DONE [18:41:17.833] - seeds: [18:41:17.833] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.833] getGlobalsAndPackages() ... [18:41:17.834] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.834] Resolving globals: FALSE [18:41:17.834] Tweak future expression to call with '...' arguments ... [18:41:17.834] { [18:41:17.834] do.call(function(...) { [18:41:17.834] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.834] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:17.834] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.834] on.exit(options(oopts), add = TRUE) [18:41:17.834] } [18:41:17.834] { [18:41:17.834] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:17.834] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.834] ...future.FUN(...future.X_jj, ...) [18:41:17.834] }) [18:41:17.834] } [18:41:17.834] }, args = future.call.arguments) [18:41:17.834] } [18:41:17.835] Tweak future expression to call with '...' arguments ... DONE [18:41:17.837] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.837] [18:41:17.837] getGlobalsAndPackages() ... DONE [18:41:17.838] run() for 'Future' ... [18:41:17.838] - state: 'created' [18:41:17.838] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:17.838] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:17.839] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:17.839] - Field: 'label' [18:41:17.839] - Field: 'local' [18:41:17.839] - Field: 'owner' [18:41:17.839] - Field: 'envir' [18:41:17.840] - Field: 'packages' [18:41:17.840] - Field: 'gc' [18:41:17.840] - Field: 'conditions' [18:41:17.840] - Field: 'expr' [18:41:17.840] - Field: 'uuid' [18:41:17.840] - Field: 'seed' [18:41:17.841] - Field: 'version' [18:41:17.841] - Field: 'result' [18:41:17.841] - Field: 'asynchronous' [18:41:17.841] - Field: 'calls' [18:41:17.841] - Field: 'globals' [18:41:17.841] - Field: 'stdout' [18:41:17.842] - Field: 'earlySignal' [18:41:17.842] - Field: 'lazy' [18:41:17.842] - Field: 'state' [18:41:17.842] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:17.842] - Launch lazy future ... [18:41:17.842] Packages needed by the future expression (n = 0): [18:41:17.843] Packages needed by future strategies (n = 0): [18:41:17.843] { [18:41:17.843] { [18:41:17.843] { [18:41:17.843] ...future.startTime <- base::Sys.time() [18:41:17.843] { [18:41:17.843] { [18:41:17.843] { [18:41:17.843] base::local({ [18:41:17.843] has_future <- base::requireNamespace("future", [18:41:17.843] quietly = TRUE) [18:41:17.843] if (has_future) { [18:41:17.843] ns <- base::getNamespace("future") [18:41:17.843] version <- ns[[".package"]][["version"]] [18:41:17.843] if (is.null(version)) [18:41:17.843] version <- utils::packageVersion("future") [18:41:17.843] } [18:41:17.843] else { [18:41:17.843] version <- NULL [18:41:17.843] } [18:41:17.843] if (!has_future || version < "1.8.0") { [18:41:17.843] info <- base::c(r_version = base::gsub("R version ", [18:41:17.843] "", base::R.version$version.string), [18:41:17.843] platform = base::sprintf("%s (%s-bit)", [18:41:17.843] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:17.843] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:17.843] "release", "version")], collapse = " "), [18:41:17.843] hostname = base::Sys.info()[["nodename"]]) [18:41:17.843] info <- base::sprintf("%s: %s", base::names(info), [18:41:17.843] info) [18:41:17.843] info <- base::paste(info, collapse = "; ") [18:41:17.843] if (!has_future) { [18:41:17.843] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:17.843] info) [18:41:17.843] } [18:41:17.843] else { [18:41:17.843] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:17.843] info, version) [18:41:17.843] } [18:41:17.843] base::stop(msg) [18:41:17.843] } [18:41:17.843] }) [18:41:17.843] } [18:41:17.843] ...future.strategy.old <- future::plan("list") [18:41:17.843] options(future.plan = NULL) [18:41:17.843] Sys.unsetenv("R_FUTURE_PLAN") [18:41:17.843] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:17.843] } [18:41:17.843] ...future.workdir <- getwd() [18:41:17.843] } [18:41:17.843] ...future.oldOptions <- base::as.list(base::.Options) [18:41:17.843] ...future.oldEnvVars <- base::Sys.getenv() [18:41:17.843] } [18:41:17.843] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:17.843] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:17.843] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:17.843] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:17.843] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:17.843] future.stdout.windows.reencode = NULL, width = 80L) [18:41:17.843] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:17.843] base::names(...future.oldOptions)) [18:41:17.843] } [18:41:17.843] if (FALSE) { [18:41:17.843] } [18:41:17.843] else { [18:41:17.843] if (TRUE) { [18:41:17.843] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:17.843] open = "w") [18:41:17.843] } [18:41:17.843] else { [18:41:17.843] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:17.843] windows = "NUL", "/dev/null"), open = "w") [18:41:17.843] } [18:41:17.843] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:17.843] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:17.843] base::sink(type = "output", split = FALSE) [18:41:17.843] base::close(...future.stdout) [18:41:17.843] }, add = TRUE) [18:41:17.843] } [18:41:17.843] ...future.frame <- base::sys.nframe() [18:41:17.843] ...future.conditions <- base::list() [18:41:17.843] ...future.rng <- base::globalenv()$.Random.seed [18:41:17.843] if (FALSE) { [18:41:17.843] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:17.843] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:17.843] } [18:41:17.843] ...future.result <- base::tryCatch({ [18:41:17.843] base::withCallingHandlers({ [18:41:17.843] ...future.value <- base::withVisible(base::local({ [18:41:17.843] do.call(function(...) { [18:41:17.843] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.843] if (!identical(...future.globals.maxSize.org, [18:41:17.843] ...future.globals.maxSize)) { [18:41:17.843] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.843] on.exit(options(oopts), add = TRUE) [18:41:17.843] } [18:41:17.843] { [18:41:17.843] lapply(seq_along(...future.elements_ii), [18:41:17.843] FUN = function(jj) { [18:41:17.843] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.843] ...future.FUN(...future.X_jj, ...) [18:41:17.843] }) [18:41:17.843] } [18:41:17.843] }, args = future.call.arguments) [18:41:17.843] })) [18:41:17.843] future::FutureResult(value = ...future.value$value, [18:41:17.843] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:17.843] ...future.rng), globalenv = if (FALSE) [18:41:17.843] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:17.843] ...future.globalenv.names)) [18:41:17.843] else NULL, started = ...future.startTime, version = "1.8") [18:41:17.843] }, condition = base::local({ [18:41:17.843] c <- base::c [18:41:17.843] inherits <- base::inherits [18:41:17.843] invokeRestart <- base::invokeRestart [18:41:17.843] length <- base::length [18:41:17.843] list <- base::list [18:41:17.843] seq.int <- base::seq.int [18:41:17.843] signalCondition <- base::signalCondition [18:41:17.843] sys.calls <- base::sys.calls [18:41:17.843] `[[` <- base::`[[` [18:41:17.843] `+` <- base::`+` [18:41:17.843] `<<-` <- base::`<<-` [18:41:17.843] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:17.843] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:17.843] 3L)] [18:41:17.843] } [18:41:17.843] function(cond) { [18:41:17.843] is_error <- inherits(cond, "error") [18:41:17.843] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:17.843] NULL) [18:41:17.843] if (is_error) { [18:41:17.843] sessionInformation <- function() { [18:41:17.843] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:17.843] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:17.843] search = base::search(), system = base::Sys.info()) [18:41:17.843] } [18:41:17.843] ...future.conditions[[length(...future.conditions) + [18:41:17.843] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:17.843] cond$call), session = sessionInformation(), [18:41:17.843] timestamp = base::Sys.time(), signaled = 0L) [18:41:17.843] signalCondition(cond) [18:41:17.843] } [18:41:17.843] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:17.843] "immediateCondition"))) { [18:41:17.843] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:17.843] ...future.conditions[[length(...future.conditions) + [18:41:17.843] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:17.843] if (TRUE && !signal) { [18:41:17.843] muffleCondition <- function (cond, pattern = "^muffle") [18:41:17.843] { [18:41:17.843] inherits <- base::inherits [18:41:17.843] invokeRestart <- base::invokeRestart [18:41:17.843] is.null <- base::is.null [18:41:17.843] muffled <- FALSE [18:41:17.843] if (inherits(cond, "message")) { [18:41:17.843] muffled <- grepl(pattern, "muffleMessage") [18:41:17.843] if (muffled) [18:41:17.843] invokeRestart("muffleMessage") [18:41:17.843] } [18:41:17.843] else if (inherits(cond, "warning")) { [18:41:17.843] muffled <- grepl(pattern, "muffleWarning") [18:41:17.843] if (muffled) [18:41:17.843] invokeRestart("muffleWarning") [18:41:17.843] } [18:41:17.843] else if (inherits(cond, "condition")) { [18:41:17.843] if (!is.null(pattern)) { [18:41:17.843] computeRestarts <- base::computeRestarts [18:41:17.843] grepl <- base::grepl [18:41:17.843] restarts <- computeRestarts(cond) [18:41:17.843] for (restart in restarts) { [18:41:17.843] name <- restart$name [18:41:17.843] if (is.null(name)) [18:41:17.843] next [18:41:17.843] if (!grepl(pattern, name)) [18:41:17.843] next [18:41:17.843] invokeRestart(restart) [18:41:17.843] muffled <- TRUE [18:41:17.843] break [18:41:17.843] } [18:41:17.843] } [18:41:17.843] } [18:41:17.843] invisible(muffled) [18:41:17.843] } [18:41:17.843] muffleCondition(cond, pattern = "^muffle") [18:41:17.843] } [18:41:17.843] } [18:41:17.843] else { [18:41:17.843] if (TRUE) { [18:41:17.843] muffleCondition <- function (cond, pattern = "^muffle") [18:41:17.843] { [18:41:17.843] inherits <- base::inherits [18:41:17.843] invokeRestart <- base::invokeRestart [18:41:17.843] is.null <- base::is.null [18:41:17.843] muffled <- FALSE [18:41:17.843] if (inherits(cond, "message")) { [18:41:17.843] muffled <- grepl(pattern, "muffleMessage") [18:41:17.843] if (muffled) [18:41:17.843] invokeRestart("muffleMessage") [18:41:17.843] } [18:41:17.843] else if (inherits(cond, "warning")) { [18:41:17.843] muffled <- grepl(pattern, "muffleWarning") [18:41:17.843] if (muffled) [18:41:17.843] invokeRestart("muffleWarning") [18:41:17.843] } [18:41:17.843] else if (inherits(cond, "condition")) { [18:41:17.843] if (!is.null(pattern)) { [18:41:17.843] computeRestarts <- base::computeRestarts [18:41:17.843] grepl <- base::grepl [18:41:17.843] restarts <- computeRestarts(cond) [18:41:17.843] for (restart in restarts) { [18:41:17.843] name <- restart$name [18:41:17.843] if (is.null(name)) [18:41:17.843] next [18:41:17.843] if (!grepl(pattern, name)) [18:41:17.843] next [18:41:17.843] invokeRestart(restart) [18:41:17.843] muffled <- TRUE [18:41:17.843] break [18:41:17.843] } [18:41:17.843] } [18:41:17.843] } [18:41:17.843] invisible(muffled) [18:41:17.843] } [18:41:17.843] muffleCondition(cond, pattern = "^muffle") [18:41:17.843] } [18:41:17.843] } [18:41:17.843] } [18:41:17.843] })) [18:41:17.843] }, error = function(ex) { [18:41:17.843] base::structure(base::list(value = NULL, visible = NULL, [18:41:17.843] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:17.843] ...future.rng), started = ...future.startTime, [18:41:17.843] finished = Sys.time(), session_uuid = NA_character_, [18:41:17.843] version = "1.8"), class = "FutureResult") [18:41:17.843] }, finally = { [18:41:17.843] if (!identical(...future.workdir, getwd())) [18:41:17.843] setwd(...future.workdir) [18:41:17.843] { [18:41:17.843] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:17.843] ...future.oldOptions$nwarnings <- NULL [18:41:17.843] } [18:41:17.843] base::options(...future.oldOptions) [18:41:17.843] if (.Platform$OS.type == "windows") { [18:41:17.843] old_names <- names(...future.oldEnvVars) [18:41:17.843] envs <- base::Sys.getenv() [18:41:17.843] names <- names(envs) [18:41:17.843] common <- intersect(names, old_names) [18:41:17.843] added <- setdiff(names, old_names) [18:41:17.843] removed <- setdiff(old_names, names) [18:41:17.843] changed <- common[...future.oldEnvVars[common] != [18:41:17.843] envs[common]] [18:41:17.843] NAMES <- toupper(changed) [18:41:17.843] args <- list() [18:41:17.843] for (kk in seq_along(NAMES)) { [18:41:17.843] name <- changed[[kk]] [18:41:17.843] NAME <- NAMES[[kk]] [18:41:17.843] if (name != NAME && is.element(NAME, old_names)) [18:41:17.843] next [18:41:17.843] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:17.843] } [18:41:17.843] NAMES <- toupper(added) [18:41:17.843] for (kk in seq_along(NAMES)) { [18:41:17.843] name <- added[[kk]] [18:41:17.843] NAME <- NAMES[[kk]] [18:41:17.843] if (name != NAME && is.element(NAME, old_names)) [18:41:17.843] next [18:41:17.843] args[[name]] <- "" [18:41:17.843] } [18:41:17.843] NAMES <- toupper(removed) [18:41:17.843] for (kk in seq_along(NAMES)) { [18:41:17.843] name <- removed[[kk]] [18:41:17.843] NAME <- NAMES[[kk]] [18:41:17.843] if (name != NAME && is.element(NAME, old_names)) [18:41:17.843] next [18:41:17.843] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:17.843] } [18:41:17.843] if (length(args) > 0) [18:41:17.843] base::do.call(base::Sys.setenv, args = args) [18:41:17.843] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:17.843] } [18:41:17.843] else { [18:41:17.843] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:17.843] } [18:41:17.843] { [18:41:17.843] if (base::length(...future.futureOptionsAdded) > [18:41:17.843] 0L) { [18:41:17.843] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:17.843] base::names(opts) <- ...future.futureOptionsAdded [18:41:17.843] base::options(opts) [18:41:17.843] } [18:41:17.843] { [18:41:17.843] { [18:41:17.843] NULL [18:41:17.843] RNGkind("Mersenne-Twister") [18:41:17.843] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:17.843] inherits = FALSE) [18:41:17.843] } [18:41:17.843] options(future.plan = NULL) [18:41:17.843] if (is.na(NA_character_)) [18:41:17.843] Sys.unsetenv("R_FUTURE_PLAN") [18:41:17.843] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:17.843] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:17.843] .init = FALSE) [18:41:17.843] } [18:41:17.843] } [18:41:17.843] } [18:41:17.843] }) [18:41:17.843] if (TRUE) { [18:41:17.843] base::sink(type = "output", split = FALSE) [18:41:17.843] if (TRUE) { [18:41:17.843] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:17.843] } [18:41:17.843] else { [18:41:17.843] ...future.result["stdout"] <- base::list(NULL) [18:41:17.843] } [18:41:17.843] base::close(...future.stdout) [18:41:17.843] ...future.stdout <- NULL [18:41:17.843] } [18:41:17.843] ...future.result$conditions <- ...future.conditions [18:41:17.843] ...future.result$finished <- base::Sys.time() [18:41:17.843] ...future.result [18:41:17.843] } [18:41:17.847] assign_globals() ... [18:41:17.847] List of 5 [18:41:17.847] $ ...future.FUN :function (x) [18:41:17.847] $ future.call.arguments : list() [18:41:17.847] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:17.847] $ ...future.elements_ii :List of 2 [18:41:17.847] ..$ a: num 0 [18:41:17.847] ..$ b: num 0 [18:41:17.847] $ ...future.seeds_ii : NULL [18:41:17.847] $ ...future.globals.maxSize: NULL [18:41:17.847] - attr(*, "where")=List of 5 [18:41:17.847] ..$ ...future.FUN : [18:41:17.847] ..$ future.call.arguments : [18:41:17.847] ..$ ...future.elements_ii : [18:41:17.847] ..$ ...future.seeds_ii : [18:41:17.847] ..$ ...future.globals.maxSize: [18:41:17.847] - attr(*, "resolved")= logi FALSE [18:41:17.847] - attr(*, "total_size")= num 3176 [18:41:17.847] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:17.847] - attr(*, "already-done")= logi TRUE [18:41:17.853] - copied '...future.FUN' to environment [18:41:17.853] - copied 'future.call.arguments' to environment [18:41:17.854] - copied '...future.elements_ii' to environment [18:41:17.854] - copied '...future.seeds_ii' to environment [18:41:17.854] - copied '...future.globals.maxSize' to environment [18:41:17.854] assign_globals() ... done [18:41:17.854] plan(): Setting new future strategy stack: [18:41:17.855] List of future strategies: [18:41:17.855] 1. sequential: [18:41:17.855] - args: function (..., envir = parent.frame(), workers = "") [18:41:17.855] - tweaked: FALSE [18:41:17.855] - call: NULL [18:41:17.855] plan(): nbrOfWorkers() = 1 [18:41:17.856] plan(): Setting new future strategy stack: [18:41:17.857] List of future strategies: [18:41:17.857] 1. sequential: [18:41:17.857] - args: function (..., envir = parent.frame(), workers = "") [18:41:17.857] - tweaked: FALSE [18:41:17.857] - call: plan(strategy) [18:41:17.857] plan(): nbrOfWorkers() = 1 [18:41:17.857] SequentialFuture started (and completed) [18:41:17.858] - Launch lazy future ... done [18:41:17.858] run() for 'SequentialFuture' ... done [18:41:17.858] Created future: [18:41:17.858] SequentialFuture: [18:41:17.858] Label: 'future_lapply-1' [18:41:17.858] Expression: [18:41:17.858] { [18:41:17.858] do.call(function(...) { [18:41:17.858] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.858] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:17.858] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.858] on.exit(options(oopts), add = TRUE) [18:41:17.858] } [18:41:17.858] { [18:41:17.858] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:17.858] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.858] ...future.FUN(...future.X_jj, ...) [18:41:17.858] }) [18:41:17.858] } [18:41:17.858] }, args = future.call.arguments) [18:41:17.858] } [18:41:17.858] Lazy evaluation: FALSE [18:41:17.858] Asynchronous evaluation: FALSE [18:41:17.858] Local evaluation: TRUE [18:41:17.858] Environment: R_GlobalEnv [18:41:17.858] Capture standard output: TRUE [18:41:17.858] Capture condition classes: 'condition' (excluding 'nothing') [18:41:17.858] Globals: 5 objects totaling 450 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:17.858] Packages: [18:41:17.858] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:17.858] Resolved: TRUE [18:41:17.858] Value: 63 bytes of class 'list' [18:41:17.858] Early signaling: FALSE [18:41:17.858] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:17.858] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:17.859] Chunk #1 of 1 ... DONE [18:41:17.859] Launching 1 futures (chunks) ... DONE [18:41:17.859] Resolving 1 futures (chunks) ... [18:41:17.860] resolve() on list ... [18:41:17.860] recursive: 0 [18:41:17.860] length: 1 [18:41:17.860] [18:41:17.860] resolved() for 'SequentialFuture' ... [18:41:17.860] - state: 'finished' [18:41:17.861] - run: TRUE [18:41:17.861] - result: 'FutureResult' [18:41:17.861] resolved() for 'SequentialFuture' ... done [18:41:17.861] Future #1 [18:41:17.861] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:17.862] - nx: 1 [18:41:17.862] - relay: TRUE [18:41:17.862] - stdout: TRUE [18:41:17.862] - signal: TRUE [18:41:17.862] - resignal: FALSE [18:41:17.862] - force: TRUE [18:41:17.862] - relayed: [n=1] FALSE [18:41:17.863] - queued futures: [n=1] FALSE [18:41:17.863] - until=1 [18:41:17.863] - relaying element #1 [18:41:17.863] - relayed: [n=1] TRUE [18:41:17.863] - queued futures: [n=1] TRUE [18:41:17.864] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:17.864] length: 0 (resolved future 1) [18:41:17.864] Relaying remaining futures [18:41:17.864] signalConditionsASAP(NULL, pos=0) ... [18:41:17.864] - nx: 1 [18:41:17.864] - relay: TRUE [18:41:17.864] - stdout: TRUE [18:41:17.865] - signal: TRUE [18:41:17.865] - resignal: FALSE [18:41:17.865] - force: TRUE [18:41:17.865] - relayed: [n=1] TRUE [18:41:17.865] - queued futures: [n=1] TRUE - flush all [18:41:17.865] - relayed: [n=1] TRUE [18:41:17.866] - queued futures: [n=1] TRUE [18:41:17.866] signalConditionsASAP(NULL, pos=0) ... done [18:41:17.866] resolve() on list ... DONE [18:41:17.866] - Number of value chunks collected: 1 [18:41:17.866] Resolving 1 futures (chunks) ... DONE [18:41:17.866] Reducing values from 1 chunks ... [18:41:17.867] - Number of values collected after concatenation: 2 [18:41:17.867] - Number of values expected: 2 [18:41:17.867] Reducing values from 1 chunks ... DONE [18:41:17.867] future_lapply() ... DONE - plan('multisession') ... [18:41:17.867] plan(): Setting new future strategy stack: [18:41:17.868] List of future strategies: [18:41:17.868] 1. multisession: [18:41:17.868] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:41:17.868] - tweaked: FALSE [18:41:17.868] - call: plan(strategy) [18:41:17.868] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... [18:41:17.868] multisession: [18:41:17.868] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:41:17.868] - tweaked: FALSE [18:41:17.868] - call: plan(strategy) [18:41:17.871] getGlobalsAndPackages() ... [18:41:17.871] Not searching for globals [18:41:17.871] - globals: [0] [18:41:17.871] getGlobalsAndPackages() ... DONE [18:41:17.872] Packages needed by the future expression (n = 0): [18:41:17.872] Packages needed by future strategies (n = 0): [18:41:17.873] { [18:41:17.873] { [18:41:17.873] { [18:41:17.873] ...future.startTime <- base::Sys.time() [18:41:17.873] { [18:41:17.873] { [18:41:17.873] { [18:41:17.873] base::local({ [18:41:17.873] has_future <- base::requireNamespace("future", [18:41:17.873] quietly = TRUE) [18:41:17.873] if (has_future) { [18:41:17.873] ns <- base::getNamespace("future") [18:41:17.873] version <- ns[[".package"]][["version"]] [18:41:17.873] if (is.null(version)) [18:41:17.873] version <- utils::packageVersion("future") [18:41:17.873] } [18:41:17.873] else { [18:41:17.873] version <- NULL [18:41:17.873] } [18:41:17.873] if (!has_future || version < "1.8.0") { [18:41:17.873] info <- base::c(r_version = base::gsub("R version ", [18:41:17.873] "", base::R.version$version.string), [18:41:17.873] platform = base::sprintf("%s (%s-bit)", [18:41:17.873] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:17.873] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:17.873] "release", "version")], collapse = " "), [18:41:17.873] hostname = base::Sys.info()[["nodename"]]) [18:41:17.873] info <- base::sprintf("%s: %s", base::names(info), [18:41:17.873] info) [18:41:17.873] info <- base::paste(info, collapse = "; ") [18:41:17.873] if (!has_future) { [18:41:17.873] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:17.873] info) [18:41:17.873] } [18:41:17.873] else { [18:41:17.873] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:17.873] info, version) [18:41:17.873] } [18:41:17.873] base::stop(msg) [18:41:17.873] } [18:41:17.873] }) [18:41:17.873] } [18:41:17.873] ...future.strategy.old <- future::plan("list") [18:41:17.873] options(future.plan = NULL) [18:41:17.873] Sys.unsetenv("R_FUTURE_PLAN") [18:41:17.873] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:17.873] } [18:41:17.873] ...future.workdir <- getwd() [18:41:17.873] } [18:41:17.873] ...future.oldOptions <- base::as.list(base::.Options) [18:41:17.873] ...future.oldEnvVars <- base::Sys.getenv() [18:41:17.873] } [18:41:17.873] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:17.873] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:17.873] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:17.873] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:17.873] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:17.873] future.stdout.windows.reencode = NULL, width = 80L) [18:41:17.873] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:17.873] base::names(...future.oldOptions)) [18:41:17.873] } [18:41:17.873] if (FALSE) { [18:41:17.873] } [18:41:17.873] else { [18:41:17.873] if (TRUE) { [18:41:17.873] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:17.873] open = "w") [18:41:17.873] } [18:41:17.873] else { [18:41:17.873] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:17.873] windows = "NUL", "/dev/null"), open = "w") [18:41:17.873] } [18:41:17.873] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:17.873] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:17.873] base::sink(type = "output", split = FALSE) [18:41:17.873] base::close(...future.stdout) [18:41:17.873] }, add = TRUE) [18:41:17.873] } [18:41:17.873] ...future.frame <- base::sys.nframe() [18:41:17.873] ...future.conditions <- base::list() [18:41:17.873] ...future.rng <- base::globalenv()$.Random.seed [18:41:17.873] if (FALSE) { [18:41:17.873] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:17.873] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:17.873] } [18:41:17.873] ...future.result <- base::tryCatch({ [18:41:17.873] base::withCallingHandlers({ [18:41:17.873] ...future.value <- base::withVisible(base::local(NA)) [18:41:17.873] future::FutureResult(value = ...future.value$value, [18:41:17.873] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:17.873] ...future.rng), globalenv = if (FALSE) [18:41:17.873] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:17.873] ...future.globalenv.names)) [18:41:17.873] else NULL, started = ...future.startTime, version = "1.8") [18:41:17.873] }, condition = base::local({ [18:41:17.873] c <- base::c [18:41:17.873] inherits <- base::inherits [18:41:17.873] invokeRestart <- base::invokeRestart [18:41:17.873] length <- base::length [18:41:17.873] list <- base::list [18:41:17.873] seq.int <- base::seq.int [18:41:17.873] signalCondition <- base::signalCondition [18:41:17.873] sys.calls <- base::sys.calls [18:41:17.873] `[[` <- base::`[[` [18:41:17.873] `+` <- base::`+` [18:41:17.873] `<<-` <- base::`<<-` [18:41:17.873] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:17.873] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:17.873] 3L)] [18:41:17.873] } [18:41:17.873] function(cond) { [18:41:17.873] is_error <- inherits(cond, "error") [18:41:17.873] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:17.873] NULL) [18:41:17.873] if (is_error) { [18:41:17.873] sessionInformation <- function() { [18:41:17.873] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:17.873] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:17.873] search = base::search(), system = base::Sys.info()) [18:41:17.873] } [18:41:17.873] ...future.conditions[[length(...future.conditions) + [18:41:17.873] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:17.873] cond$call), session = sessionInformation(), [18:41:17.873] timestamp = base::Sys.time(), signaled = 0L) [18:41:17.873] signalCondition(cond) [18:41:17.873] } [18:41:17.873] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:17.873] "immediateCondition"))) { [18:41:17.873] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:17.873] ...future.conditions[[length(...future.conditions) + [18:41:17.873] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:17.873] if (TRUE && !signal) { [18:41:17.873] muffleCondition <- function (cond, pattern = "^muffle") [18:41:17.873] { [18:41:17.873] inherits <- base::inherits [18:41:17.873] invokeRestart <- base::invokeRestart [18:41:17.873] is.null <- base::is.null [18:41:17.873] muffled <- FALSE [18:41:17.873] if (inherits(cond, "message")) { [18:41:17.873] muffled <- grepl(pattern, "muffleMessage") [18:41:17.873] if (muffled) [18:41:17.873] invokeRestart("muffleMessage") [18:41:17.873] } [18:41:17.873] else if (inherits(cond, "warning")) { [18:41:17.873] muffled <- grepl(pattern, "muffleWarning") [18:41:17.873] if (muffled) [18:41:17.873] invokeRestart("muffleWarning") [18:41:17.873] } [18:41:17.873] else if (inherits(cond, "condition")) { [18:41:17.873] if (!is.null(pattern)) { [18:41:17.873] computeRestarts <- base::computeRestarts [18:41:17.873] grepl <- base::grepl [18:41:17.873] restarts <- computeRestarts(cond) [18:41:17.873] for (restart in restarts) { [18:41:17.873] name <- restart$name [18:41:17.873] if (is.null(name)) [18:41:17.873] next [18:41:17.873] if (!grepl(pattern, name)) [18:41:17.873] next [18:41:17.873] invokeRestart(restart) [18:41:17.873] muffled <- TRUE [18:41:17.873] break [18:41:17.873] } [18:41:17.873] } [18:41:17.873] } [18:41:17.873] invisible(muffled) [18:41:17.873] } [18:41:17.873] muffleCondition(cond, pattern = "^muffle") [18:41:17.873] } [18:41:17.873] } [18:41:17.873] else { [18:41:17.873] if (TRUE) { [18:41:17.873] muffleCondition <- function (cond, pattern = "^muffle") [18:41:17.873] { [18:41:17.873] inherits <- base::inherits [18:41:17.873] invokeRestart <- base::invokeRestart [18:41:17.873] is.null <- base::is.null [18:41:17.873] muffled <- FALSE [18:41:17.873] if (inherits(cond, "message")) { [18:41:17.873] muffled <- grepl(pattern, "muffleMessage") [18:41:17.873] if (muffled) [18:41:17.873] invokeRestart("muffleMessage") [18:41:17.873] } [18:41:17.873] else if (inherits(cond, "warning")) { [18:41:17.873] muffled <- grepl(pattern, "muffleWarning") [18:41:17.873] if (muffled) [18:41:17.873] invokeRestart("muffleWarning") [18:41:17.873] } [18:41:17.873] else if (inherits(cond, "condition")) { [18:41:17.873] if (!is.null(pattern)) { [18:41:17.873] computeRestarts <- base::computeRestarts [18:41:17.873] grepl <- base::grepl [18:41:17.873] restarts <- computeRestarts(cond) [18:41:17.873] for (restart in restarts) { [18:41:17.873] name <- restart$name [18:41:17.873] if (is.null(name)) [18:41:17.873] next [18:41:17.873] if (!grepl(pattern, name)) [18:41:17.873] next [18:41:17.873] invokeRestart(restart) [18:41:17.873] muffled <- TRUE [18:41:17.873] break [18:41:17.873] } [18:41:17.873] } [18:41:17.873] } [18:41:17.873] invisible(muffled) [18:41:17.873] } [18:41:17.873] muffleCondition(cond, pattern = "^muffle") [18:41:17.873] } [18:41:17.873] } [18:41:17.873] } [18:41:17.873] })) [18:41:17.873] }, error = function(ex) { [18:41:17.873] base::structure(base::list(value = NULL, visible = NULL, [18:41:17.873] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:17.873] ...future.rng), started = ...future.startTime, [18:41:17.873] finished = Sys.time(), session_uuid = NA_character_, [18:41:17.873] version = "1.8"), class = "FutureResult") [18:41:17.873] }, finally = { [18:41:17.873] if (!identical(...future.workdir, getwd())) [18:41:17.873] setwd(...future.workdir) [18:41:17.873] { [18:41:17.873] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:17.873] ...future.oldOptions$nwarnings <- NULL [18:41:17.873] } [18:41:17.873] base::options(...future.oldOptions) [18:41:17.873] if (.Platform$OS.type == "windows") { [18:41:17.873] old_names <- names(...future.oldEnvVars) [18:41:17.873] envs <- base::Sys.getenv() [18:41:17.873] names <- names(envs) [18:41:17.873] common <- intersect(names, old_names) [18:41:17.873] added <- setdiff(names, old_names) [18:41:17.873] removed <- setdiff(old_names, names) [18:41:17.873] changed <- common[...future.oldEnvVars[common] != [18:41:17.873] envs[common]] [18:41:17.873] NAMES <- toupper(changed) [18:41:17.873] args <- list() [18:41:17.873] for (kk in seq_along(NAMES)) { [18:41:17.873] name <- changed[[kk]] [18:41:17.873] NAME <- NAMES[[kk]] [18:41:17.873] if (name != NAME && is.element(NAME, old_names)) [18:41:17.873] next [18:41:17.873] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:17.873] } [18:41:17.873] NAMES <- toupper(added) [18:41:17.873] for (kk in seq_along(NAMES)) { [18:41:17.873] name <- added[[kk]] [18:41:17.873] NAME <- NAMES[[kk]] [18:41:17.873] if (name != NAME && is.element(NAME, old_names)) [18:41:17.873] next [18:41:17.873] args[[name]] <- "" [18:41:17.873] } [18:41:17.873] NAMES <- toupper(removed) [18:41:17.873] for (kk in seq_along(NAMES)) { [18:41:17.873] name <- removed[[kk]] [18:41:17.873] NAME <- NAMES[[kk]] [18:41:17.873] if (name != NAME && is.element(NAME, old_names)) [18:41:17.873] next [18:41:17.873] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:17.873] } [18:41:17.873] if (length(args) > 0) [18:41:17.873] base::do.call(base::Sys.setenv, args = args) [18:41:17.873] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:17.873] } [18:41:17.873] else { [18:41:17.873] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:17.873] } [18:41:17.873] { [18:41:17.873] if (base::length(...future.futureOptionsAdded) > [18:41:17.873] 0L) { [18:41:17.873] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:17.873] base::names(opts) <- ...future.futureOptionsAdded [18:41:17.873] base::options(opts) [18:41:17.873] } [18:41:17.873] { [18:41:17.873] { [18:41:17.873] NULL [18:41:17.873] RNGkind("Mersenne-Twister") [18:41:17.873] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:17.873] inherits = FALSE) [18:41:17.873] } [18:41:17.873] options(future.plan = NULL) [18:41:17.873] if (is.na(NA_character_)) [18:41:17.873] Sys.unsetenv("R_FUTURE_PLAN") [18:41:17.873] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:17.873] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:17.873] .init = FALSE) [18:41:17.873] } [18:41:17.873] } [18:41:17.873] } [18:41:17.873] }) [18:41:17.873] if (TRUE) { [18:41:17.873] base::sink(type = "output", split = FALSE) [18:41:17.873] if (TRUE) { [18:41:17.873] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:17.873] } [18:41:17.873] else { [18:41:17.873] ...future.result["stdout"] <- base::list(NULL) [18:41:17.873] } [18:41:17.873] base::close(...future.stdout) [18:41:17.873] ...future.stdout <- NULL [18:41:17.873] } [18:41:17.873] ...future.result$conditions <- ...future.conditions [18:41:17.873] ...future.result$finished <- base::Sys.time() [18:41:17.873] ...future.result [18:41:17.873] } [18:41:17.876] plan(): Setting new future strategy stack: [18:41:17.877] List of future strategies: [18:41:17.877] 1. sequential: [18:41:17.877] - args: function (..., envir = parent.frame(), workers = "") [18:41:17.877] - tweaked: FALSE [18:41:17.877] - call: NULL [18:41:17.877] plan(): nbrOfWorkers() = 1 [18:41:17.878] plan(): Setting new future strategy stack: [18:41:17.879] List of future strategies: [18:41:17.879] 1. multisession: [18:41:17.879] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:41:17.879] - tweaked: FALSE [18:41:17.879] - call: plan(strategy) [18:41:17.881] plan(): nbrOfWorkers() = 1 [18:41:17.881] SequentialFuture started (and completed) [18:41:17.882] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... DONE [18:41:17.884] plan(): nbrOfWorkers() = 1 - future_lapply(x, FUN = vector, ...) ... [18:41:17.884] future_lapply() ... [18:41:17.887] Number of chunks: 4 [18:41:17.887] getGlobalsAndPackagesXApply() ... [18:41:17.887] - future.globals: TRUE [18:41:17.887] getGlobalsAndPackages() ... [18:41:17.887] Searching for globals... [18:41:17.889] - globals found: [2] 'FUN', '.Internal' [18:41:17.889] Searching for globals ... DONE [18:41:17.889] Resolving globals: FALSE [18:41:17.890] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:17.890] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:17.890] - globals: [1] 'FUN' [18:41:17.890] [18:41:17.891] getGlobalsAndPackages() ... DONE [18:41:17.891] - globals found/used: [n=1] 'FUN' [18:41:17.891] - needed namespaces: [n=0] [18:41:17.891] Finding globals ... DONE [18:41:17.891] - use_args: TRUE [18:41:17.891] - Getting '...' globals ... [18:41:17.892] resolve() on list ... [18:41:17.892] recursive: 0 [18:41:17.892] length: 1 [18:41:17.892] elements: '...' [18:41:17.893] length: 0 (resolved future 1) [18:41:17.893] resolve() on list ... DONE [18:41:17.893] - '...' content: [n=1] 'length' [18:41:17.893] List of 1 [18:41:17.893] $ ...:List of 1 [18:41:17.893] ..$ length: int 2 [18:41:17.893] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:17.893] - attr(*, "where")=List of 1 [18:41:17.893] ..$ ...: [18:41:17.893] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:17.893] - attr(*, "resolved")= logi TRUE [18:41:17.893] - attr(*, "total_size")= num NA [18:41:17.896] - Getting '...' globals ... DONE [18:41:17.897] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:17.897] List of 2 [18:41:17.897] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:17.897] $ ... :List of 1 [18:41:17.897] ..$ length: int 2 [18:41:17.897] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:17.897] - attr(*, "where")=List of 2 [18:41:17.897] ..$ ...future.FUN: [18:41:17.897] ..$ ... : [18:41:17.897] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:17.897] - attr(*, "resolved")= logi FALSE [18:41:17.897] - attr(*, "total_size")= int 4288 [18:41:17.901] Packages to be attached in all futures: [n=0] [18:41:17.901] getGlobalsAndPackagesXApply() ... DONE [18:41:17.901] Number of futures (= number of chunks): 4 [18:41:17.901] Launching 4 futures (chunks) ... [18:41:17.901] Chunk #1 of 4 ... [18:41:17.902] - Finding globals in 'X' for chunk #1 ... [18:41:17.902] getGlobalsAndPackages() ... [18:41:17.902] Searching for globals... [18:41:17.902] [18:41:17.902] Searching for globals ... DONE [18:41:17.903] - globals: [0] [18:41:17.903] getGlobalsAndPackages() ... DONE [18:41:17.903] + additional globals found: [n=0] [18:41:17.903] + additional namespaces needed: [n=0] [18:41:17.903] - Finding globals in 'X' for chunk #1 ... DONE [18:41:17.903] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:17.903] - seeds: [18:41:17.904] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.904] getGlobalsAndPackages() ... [18:41:17.904] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.904] Resolving globals: FALSE [18:41:17.904] Tweak future expression to call with '...' arguments ... [18:41:17.904] { [18:41:17.904] do.call(function(...) { [18:41:17.904] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.904] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:17.904] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.904] on.exit(options(oopts), add = TRUE) [18:41:17.904] } [18:41:17.904] { [18:41:17.904] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:17.904] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.904] ...future.FUN(...future.X_jj, ...) [18:41:17.904] }) [18:41:17.904] } [18:41:17.904] }, args = future.call.arguments) [18:41:17.904] } [18:41:17.905] Tweak future expression to call with '...' arguments ... DONE [18:41:17.905] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.906] [18:41:17.906] getGlobalsAndPackages() ... DONE [18:41:17.906] run() for 'Future' ... [18:41:17.906] - state: 'created' [18:41:17.907] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:17.909] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:17.909] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:17.909] - Field: 'label' [18:41:17.909] - Field: 'local' [18:41:17.910] - Field: 'owner' [18:41:17.910] - Field: 'envir' [18:41:17.910] - Field: 'packages' [18:41:17.910] - Field: 'gc' [18:41:17.910] - Field: 'conditions' [18:41:17.910] - Field: 'expr' [18:41:17.911] - Field: 'uuid' [18:41:17.911] - Field: 'seed' [18:41:17.911] - Field: 'version' [18:41:17.911] - Field: 'result' [18:41:17.911] - Field: 'asynchronous' [18:41:17.911] - Field: 'calls' [18:41:17.912] - Field: 'globals' [18:41:17.912] - Field: 'stdout' [18:41:17.912] - Field: 'earlySignal' [18:41:17.912] - Field: 'lazy' [18:41:17.912] - Field: 'state' [18:41:17.912] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:17.913] - Launch lazy future ... [18:41:17.913] Packages needed by the future expression (n = 0): [18:41:17.913] Packages needed by future strategies (n = 0): [18:41:17.914] { [18:41:17.914] { [18:41:17.914] { [18:41:17.914] ...future.startTime <- base::Sys.time() [18:41:17.914] { [18:41:17.914] { [18:41:17.914] { [18:41:17.914] base::local({ [18:41:17.914] has_future <- base::requireNamespace("future", [18:41:17.914] quietly = TRUE) [18:41:17.914] if (has_future) { [18:41:17.914] ns <- base::getNamespace("future") [18:41:17.914] version <- ns[[".package"]][["version"]] [18:41:17.914] if (is.null(version)) [18:41:17.914] version <- utils::packageVersion("future") [18:41:17.914] } [18:41:17.914] else { [18:41:17.914] version <- NULL [18:41:17.914] } [18:41:17.914] if (!has_future || version < "1.8.0") { [18:41:17.914] info <- base::c(r_version = base::gsub("R version ", [18:41:17.914] "", base::R.version$version.string), [18:41:17.914] platform = base::sprintf("%s (%s-bit)", [18:41:17.914] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:17.914] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:17.914] "release", "version")], collapse = " "), [18:41:17.914] hostname = base::Sys.info()[["nodename"]]) [18:41:17.914] info <- base::sprintf("%s: %s", base::names(info), [18:41:17.914] info) [18:41:17.914] info <- base::paste(info, collapse = "; ") [18:41:17.914] if (!has_future) { [18:41:17.914] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:17.914] info) [18:41:17.914] } [18:41:17.914] else { [18:41:17.914] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:17.914] info, version) [18:41:17.914] } [18:41:17.914] base::stop(msg) [18:41:17.914] } [18:41:17.914] }) [18:41:17.914] } [18:41:17.914] ...future.strategy.old <- future::plan("list") [18:41:17.914] options(future.plan = NULL) [18:41:17.914] Sys.unsetenv("R_FUTURE_PLAN") [18:41:17.914] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:17.914] } [18:41:17.914] ...future.workdir <- getwd() [18:41:17.914] } [18:41:17.914] ...future.oldOptions <- base::as.list(base::.Options) [18:41:17.914] ...future.oldEnvVars <- base::Sys.getenv() [18:41:17.914] } [18:41:17.914] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:17.914] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:17.914] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:17.914] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:17.914] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:17.914] future.stdout.windows.reencode = NULL, width = 80L) [18:41:17.914] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:17.914] base::names(...future.oldOptions)) [18:41:17.914] } [18:41:17.914] if (FALSE) { [18:41:17.914] } [18:41:17.914] else { [18:41:17.914] if (TRUE) { [18:41:17.914] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:17.914] open = "w") [18:41:17.914] } [18:41:17.914] else { [18:41:17.914] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:17.914] windows = "NUL", "/dev/null"), open = "w") [18:41:17.914] } [18:41:17.914] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:17.914] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:17.914] base::sink(type = "output", split = FALSE) [18:41:17.914] base::close(...future.stdout) [18:41:17.914] }, add = TRUE) [18:41:17.914] } [18:41:17.914] ...future.frame <- base::sys.nframe() [18:41:17.914] ...future.conditions <- base::list() [18:41:17.914] ...future.rng <- base::globalenv()$.Random.seed [18:41:17.914] if (FALSE) { [18:41:17.914] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:17.914] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:17.914] } [18:41:17.914] ...future.result <- base::tryCatch({ [18:41:17.914] base::withCallingHandlers({ [18:41:17.914] ...future.value <- base::withVisible(base::local({ [18:41:17.914] do.call(function(...) { [18:41:17.914] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.914] if (!identical(...future.globals.maxSize.org, [18:41:17.914] ...future.globals.maxSize)) { [18:41:17.914] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.914] on.exit(options(oopts), add = TRUE) [18:41:17.914] } [18:41:17.914] { [18:41:17.914] lapply(seq_along(...future.elements_ii), [18:41:17.914] FUN = function(jj) { [18:41:17.914] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.914] ...future.FUN(...future.X_jj, ...) [18:41:17.914] }) [18:41:17.914] } [18:41:17.914] }, args = future.call.arguments) [18:41:17.914] })) [18:41:17.914] future::FutureResult(value = ...future.value$value, [18:41:17.914] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:17.914] ...future.rng), globalenv = if (FALSE) [18:41:17.914] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:17.914] ...future.globalenv.names)) [18:41:17.914] else NULL, started = ...future.startTime, version = "1.8") [18:41:17.914] }, condition = base::local({ [18:41:17.914] c <- base::c [18:41:17.914] inherits <- base::inherits [18:41:17.914] invokeRestart <- base::invokeRestart [18:41:17.914] length <- base::length [18:41:17.914] list <- base::list [18:41:17.914] seq.int <- base::seq.int [18:41:17.914] signalCondition <- base::signalCondition [18:41:17.914] sys.calls <- base::sys.calls [18:41:17.914] `[[` <- base::`[[` [18:41:17.914] `+` <- base::`+` [18:41:17.914] `<<-` <- base::`<<-` [18:41:17.914] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:17.914] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:17.914] 3L)] [18:41:17.914] } [18:41:17.914] function(cond) { [18:41:17.914] is_error <- inherits(cond, "error") [18:41:17.914] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:17.914] NULL) [18:41:17.914] if (is_error) { [18:41:17.914] sessionInformation <- function() { [18:41:17.914] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:17.914] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:17.914] search = base::search(), system = base::Sys.info()) [18:41:17.914] } [18:41:17.914] ...future.conditions[[length(...future.conditions) + [18:41:17.914] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:17.914] cond$call), session = sessionInformation(), [18:41:17.914] timestamp = base::Sys.time(), signaled = 0L) [18:41:17.914] signalCondition(cond) [18:41:17.914] } [18:41:17.914] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:17.914] "immediateCondition"))) { [18:41:17.914] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:17.914] ...future.conditions[[length(...future.conditions) + [18:41:17.914] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:17.914] if (TRUE && !signal) { [18:41:17.914] muffleCondition <- function (cond, pattern = "^muffle") [18:41:17.914] { [18:41:17.914] inherits <- base::inherits [18:41:17.914] invokeRestart <- base::invokeRestart [18:41:17.914] is.null <- base::is.null [18:41:17.914] muffled <- FALSE [18:41:17.914] if (inherits(cond, "message")) { [18:41:17.914] muffled <- grepl(pattern, "muffleMessage") [18:41:17.914] if (muffled) [18:41:17.914] invokeRestart("muffleMessage") [18:41:17.914] } [18:41:17.914] else if (inherits(cond, "warning")) { [18:41:17.914] muffled <- grepl(pattern, "muffleWarning") [18:41:17.914] if (muffled) [18:41:17.914] invokeRestart("muffleWarning") [18:41:17.914] } [18:41:17.914] else if (inherits(cond, "condition")) { [18:41:17.914] if (!is.null(pattern)) { [18:41:17.914] computeRestarts <- base::computeRestarts [18:41:17.914] grepl <- base::grepl [18:41:17.914] restarts <- computeRestarts(cond) [18:41:17.914] for (restart in restarts) { [18:41:17.914] name <- restart$name [18:41:17.914] if (is.null(name)) [18:41:17.914] next [18:41:17.914] if (!grepl(pattern, name)) [18:41:17.914] next [18:41:17.914] invokeRestart(restart) [18:41:17.914] muffled <- TRUE [18:41:17.914] break [18:41:17.914] } [18:41:17.914] } [18:41:17.914] } [18:41:17.914] invisible(muffled) [18:41:17.914] } [18:41:17.914] muffleCondition(cond, pattern = "^muffle") [18:41:17.914] } [18:41:17.914] } [18:41:17.914] else { [18:41:17.914] if (TRUE) { [18:41:17.914] muffleCondition <- function (cond, pattern = "^muffle") [18:41:17.914] { [18:41:17.914] inherits <- base::inherits [18:41:17.914] invokeRestart <- base::invokeRestart [18:41:17.914] is.null <- base::is.null [18:41:17.914] muffled <- FALSE [18:41:17.914] if (inherits(cond, "message")) { [18:41:17.914] muffled <- grepl(pattern, "muffleMessage") [18:41:17.914] if (muffled) [18:41:17.914] invokeRestart("muffleMessage") [18:41:17.914] } [18:41:17.914] else if (inherits(cond, "warning")) { [18:41:17.914] muffled <- grepl(pattern, "muffleWarning") [18:41:17.914] if (muffled) [18:41:17.914] invokeRestart("muffleWarning") [18:41:17.914] } [18:41:17.914] else if (inherits(cond, "condition")) { [18:41:17.914] if (!is.null(pattern)) { [18:41:17.914] computeRestarts <- base::computeRestarts [18:41:17.914] grepl <- base::grepl [18:41:17.914] restarts <- computeRestarts(cond) [18:41:17.914] for (restart in restarts) { [18:41:17.914] name <- restart$name [18:41:17.914] if (is.null(name)) [18:41:17.914] next [18:41:17.914] if (!grepl(pattern, name)) [18:41:17.914] next [18:41:17.914] invokeRestart(restart) [18:41:17.914] muffled <- TRUE [18:41:17.914] break [18:41:17.914] } [18:41:17.914] } [18:41:17.914] } [18:41:17.914] invisible(muffled) [18:41:17.914] } [18:41:17.914] muffleCondition(cond, pattern = "^muffle") [18:41:17.914] } [18:41:17.914] } [18:41:17.914] } [18:41:17.914] })) [18:41:17.914] }, error = function(ex) { [18:41:17.914] base::structure(base::list(value = NULL, visible = NULL, [18:41:17.914] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:17.914] ...future.rng), started = ...future.startTime, [18:41:17.914] finished = Sys.time(), session_uuid = NA_character_, [18:41:17.914] version = "1.8"), class = "FutureResult") [18:41:17.914] }, finally = { [18:41:17.914] if (!identical(...future.workdir, getwd())) [18:41:17.914] setwd(...future.workdir) [18:41:17.914] { [18:41:17.914] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:17.914] ...future.oldOptions$nwarnings <- NULL [18:41:17.914] } [18:41:17.914] base::options(...future.oldOptions) [18:41:17.914] if (.Platform$OS.type == "windows") { [18:41:17.914] old_names <- names(...future.oldEnvVars) [18:41:17.914] envs <- base::Sys.getenv() [18:41:17.914] names <- names(envs) [18:41:17.914] common <- intersect(names, old_names) [18:41:17.914] added <- setdiff(names, old_names) [18:41:17.914] removed <- setdiff(old_names, names) [18:41:17.914] changed <- common[...future.oldEnvVars[common] != [18:41:17.914] envs[common]] [18:41:17.914] NAMES <- toupper(changed) [18:41:17.914] args <- list() [18:41:17.914] for (kk in seq_along(NAMES)) { [18:41:17.914] name <- changed[[kk]] [18:41:17.914] NAME <- NAMES[[kk]] [18:41:17.914] if (name != NAME && is.element(NAME, old_names)) [18:41:17.914] next [18:41:17.914] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:17.914] } [18:41:17.914] NAMES <- toupper(added) [18:41:17.914] for (kk in seq_along(NAMES)) { [18:41:17.914] name <- added[[kk]] [18:41:17.914] NAME <- NAMES[[kk]] [18:41:17.914] if (name != NAME && is.element(NAME, old_names)) [18:41:17.914] next [18:41:17.914] args[[name]] <- "" [18:41:17.914] } [18:41:17.914] NAMES <- toupper(removed) [18:41:17.914] for (kk in seq_along(NAMES)) { [18:41:17.914] name <- removed[[kk]] [18:41:17.914] NAME <- NAMES[[kk]] [18:41:17.914] if (name != NAME && is.element(NAME, old_names)) [18:41:17.914] next [18:41:17.914] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:17.914] } [18:41:17.914] if (length(args) > 0) [18:41:17.914] base::do.call(base::Sys.setenv, args = args) [18:41:17.914] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:17.914] } [18:41:17.914] else { [18:41:17.914] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:17.914] } [18:41:17.914] { [18:41:17.914] if (base::length(...future.futureOptionsAdded) > [18:41:17.914] 0L) { [18:41:17.914] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:17.914] base::names(opts) <- ...future.futureOptionsAdded [18:41:17.914] base::options(opts) [18:41:17.914] } [18:41:17.914] { [18:41:17.914] { [18:41:17.914] NULL [18:41:17.914] RNGkind("Mersenne-Twister") [18:41:17.914] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:17.914] inherits = FALSE) [18:41:17.914] } [18:41:17.914] options(future.plan = NULL) [18:41:17.914] if (is.na(NA_character_)) [18:41:17.914] Sys.unsetenv("R_FUTURE_PLAN") [18:41:17.914] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:17.914] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:17.914] .init = FALSE) [18:41:17.914] } [18:41:17.914] } [18:41:17.914] } [18:41:17.914] }) [18:41:17.914] if (TRUE) { [18:41:17.914] base::sink(type = "output", split = FALSE) [18:41:17.914] if (TRUE) { [18:41:17.914] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:17.914] } [18:41:17.914] else { [18:41:17.914] ...future.result["stdout"] <- base::list(NULL) [18:41:17.914] } [18:41:17.914] base::close(...future.stdout) [18:41:17.914] ...future.stdout <- NULL [18:41:17.914] } [18:41:17.914] ...future.result$conditions <- ...future.conditions [18:41:17.914] ...future.result$finished <- base::Sys.time() [18:41:17.914] ...future.result [18:41:17.914] } [18:41:17.917] assign_globals() ... [18:41:17.918] List of 5 [18:41:17.918] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:17.918] $ future.call.arguments :List of 1 [18:41:17.918] ..$ length: int 2 [18:41:17.918] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:17.918] $ ...future.elements_ii :List of 1 [18:41:17.918] ..$ a: chr "integer" [18:41:17.918] $ ...future.seeds_ii : NULL [18:41:17.918] $ ...future.globals.maxSize: NULL [18:41:17.918] - attr(*, "where")=List of 5 [18:41:17.918] ..$ ...future.FUN : [18:41:17.918] ..$ future.call.arguments : [18:41:17.918] ..$ ...future.elements_ii : [18:41:17.918] ..$ ...future.seeds_ii : [18:41:17.918] ..$ ...future.globals.maxSize: [18:41:17.918] - attr(*, "resolved")= logi FALSE [18:41:17.918] - attr(*, "total_size")= num 4288 [18:41:17.918] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:17.918] - attr(*, "already-done")= logi TRUE [18:41:17.924] - copied '...future.FUN' to environment [18:41:17.924] - copied 'future.call.arguments' to environment [18:41:17.924] - copied '...future.elements_ii' to environment [18:41:17.924] - copied '...future.seeds_ii' to environment [18:41:17.924] - copied '...future.globals.maxSize' to environment [18:41:17.925] assign_globals() ... done [18:41:17.925] plan(): Setting new future strategy stack: [18:41:17.925] List of future strategies: [18:41:17.925] 1. sequential: [18:41:17.925] - args: function (..., envir = parent.frame(), workers = "") [18:41:17.925] - tweaked: FALSE [18:41:17.925] - call: NULL [18:41:17.926] plan(): nbrOfWorkers() = 1 [18:41:17.927] plan(): Setting new future strategy stack: [18:41:17.927] List of future strategies: [18:41:17.927] 1. multisession: [18:41:17.927] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:41:17.927] - tweaked: FALSE [18:41:17.927] - call: plan(strategy) [18:41:17.930] plan(): nbrOfWorkers() = 1 [18:41:17.930] SequentialFuture started (and completed) [18:41:17.930] - Launch lazy future ... done [18:41:17.930] run() for 'SequentialFuture' ... done [18:41:17.930] Created future: [18:41:17.931] SequentialFuture: [18:41:17.931] Label: 'future_lapply-1' [18:41:17.931] Expression: [18:41:17.931] { [18:41:17.931] do.call(function(...) { [18:41:17.931] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.931] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:17.931] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.931] on.exit(options(oopts), add = TRUE) [18:41:17.931] } [18:41:17.931] { [18:41:17.931] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:17.931] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.931] ...future.FUN(...future.X_jj, ...) [18:41:17.931] }) [18:41:17.931] } [18:41:17.931] }, args = future.call.arguments) [18:41:17.931] } [18:41:17.931] Lazy evaluation: FALSE [18:41:17.931] Asynchronous evaluation: FALSE [18:41:17.931] Local evaluation: TRUE [18:41:17.931] Environment: R_GlobalEnv [18:41:17.931] Capture standard output: TRUE [18:41:17.931] Capture condition classes: 'condition' (excluding 'nothing') [18:41:17.931] Globals: 5 objects totaling 758 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 96 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:17.931] Packages: [18:41:17.931] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:17.931] Resolved: TRUE [18:41:17.931] Value: 47 bytes of class 'list' [18:41:17.931] Early signaling: FALSE [18:41:17.931] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:17.931] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:17.932] Chunk #1 of 4 ... DONE [18:41:17.932] Chunk #2 of 4 ... [18:41:17.932] - Finding globals in 'X' for chunk #2 ... [18:41:17.932] getGlobalsAndPackages() ... [18:41:17.932] Searching for globals... [18:41:17.933] [18:41:17.933] Searching for globals ... DONE [18:41:17.933] - globals: [0] [18:41:17.933] getGlobalsAndPackages() ... DONE [18:41:17.933] + additional globals found: [n=0] [18:41:17.934] + additional namespaces needed: [n=0] [18:41:17.934] - Finding globals in 'X' for chunk #2 ... DONE [18:41:17.934] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:17.934] - seeds: [18:41:17.934] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.934] getGlobalsAndPackages() ... [18:41:17.934] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.935] Resolving globals: FALSE [18:41:17.935] Tweak future expression to call with '...' arguments ... [18:41:17.935] { [18:41:17.935] do.call(function(...) { [18:41:17.935] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.935] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:17.935] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.935] on.exit(options(oopts), add = TRUE) [18:41:17.935] } [18:41:17.935] { [18:41:17.935] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:17.935] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.935] ...future.FUN(...future.X_jj, ...) [18:41:17.935] }) [18:41:17.935] } [18:41:17.935] }, args = future.call.arguments) [18:41:17.935] } [18:41:17.935] Tweak future expression to call with '...' arguments ... DONE [18:41:17.936] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.936] [18:41:17.936] getGlobalsAndPackages() ... DONE [18:41:17.937] run() for 'Future' ... [18:41:17.937] - state: 'created' [18:41:17.937] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:17.939] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:17.940] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:17.940] - Field: 'label' [18:41:17.940] - Field: 'local' [18:41:17.940] - Field: 'owner' [18:41:17.940] - Field: 'envir' [18:41:17.941] - Field: 'packages' [18:41:17.941] - Field: 'gc' [18:41:17.941] - Field: 'conditions' [18:41:17.941] - Field: 'expr' [18:41:17.941] - Field: 'uuid' [18:41:17.941] - Field: 'seed' [18:41:17.942] - Field: 'version' [18:41:17.942] - Field: 'result' [18:41:17.942] - Field: 'asynchronous' [18:41:17.942] - Field: 'calls' [18:41:17.942] - Field: 'globals' [18:41:17.942] - Field: 'stdout' [18:41:17.943] - Field: 'earlySignal' [18:41:17.943] - Field: 'lazy' [18:41:17.943] - Field: 'state' [18:41:17.943] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:17.943] - Launch lazy future ... [18:41:17.944] Packages needed by the future expression (n = 0): [18:41:17.944] Packages needed by future strategies (n = 0): [18:41:17.944] { [18:41:17.944] { [18:41:17.944] { [18:41:17.944] ...future.startTime <- base::Sys.time() [18:41:17.944] { [18:41:17.944] { [18:41:17.944] { [18:41:17.944] base::local({ [18:41:17.944] has_future <- base::requireNamespace("future", [18:41:17.944] quietly = TRUE) [18:41:17.944] if (has_future) { [18:41:17.944] ns <- base::getNamespace("future") [18:41:17.944] version <- ns[[".package"]][["version"]] [18:41:17.944] if (is.null(version)) [18:41:17.944] version <- utils::packageVersion("future") [18:41:17.944] } [18:41:17.944] else { [18:41:17.944] version <- NULL [18:41:17.944] } [18:41:17.944] if (!has_future || version < "1.8.0") { [18:41:17.944] info <- base::c(r_version = base::gsub("R version ", [18:41:17.944] "", base::R.version$version.string), [18:41:17.944] platform = base::sprintf("%s (%s-bit)", [18:41:17.944] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:17.944] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:17.944] "release", "version")], collapse = " "), [18:41:17.944] hostname = base::Sys.info()[["nodename"]]) [18:41:17.944] info <- base::sprintf("%s: %s", base::names(info), [18:41:17.944] info) [18:41:17.944] info <- base::paste(info, collapse = "; ") [18:41:17.944] if (!has_future) { [18:41:17.944] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:17.944] info) [18:41:17.944] } [18:41:17.944] else { [18:41:17.944] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:17.944] info, version) [18:41:17.944] } [18:41:17.944] base::stop(msg) [18:41:17.944] } [18:41:17.944] }) [18:41:17.944] } [18:41:17.944] ...future.strategy.old <- future::plan("list") [18:41:17.944] options(future.plan = NULL) [18:41:17.944] Sys.unsetenv("R_FUTURE_PLAN") [18:41:17.944] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:17.944] } [18:41:17.944] ...future.workdir <- getwd() [18:41:17.944] } [18:41:17.944] ...future.oldOptions <- base::as.list(base::.Options) [18:41:17.944] ...future.oldEnvVars <- base::Sys.getenv() [18:41:17.944] } [18:41:17.944] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:17.944] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:17.944] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:17.944] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:17.944] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:17.944] future.stdout.windows.reencode = NULL, width = 80L) [18:41:17.944] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:17.944] base::names(...future.oldOptions)) [18:41:17.944] } [18:41:17.944] if (FALSE) { [18:41:17.944] } [18:41:17.944] else { [18:41:17.944] if (TRUE) { [18:41:17.944] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:17.944] open = "w") [18:41:17.944] } [18:41:17.944] else { [18:41:17.944] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:17.944] windows = "NUL", "/dev/null"), open = "w") [18:41:17.944] } [18:41:17.944] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:17.944] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:17.944] base::sink(type = "output", split = FALSE) [18:41:17.944] base::close(...future.stdout) [18:41:17.944] }, add = TRUE) [18:41:17.944] } [18:41:17.944] ...future.frame <- base::sys.nframe() [18:41:17.944] ...future.conditions <- base::list() [18:41:17.944] ...future.rng <- base::globalenv()$.Random.seed [18:41:17.944] if (FALSE) { [18:41:17.944] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:17.944] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:17.944] } [18:41:17.944] ...future.result <- base::tryCatch({ [18:41:17.944] base::withCallingHandlers({ [18:41:17.944] ...future.value <- base::withVisible(base::local({ [18:41:17.944] do.call(function(...) { [18:41:17.944] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.944] if (!identical(...future.globals.maxSize.org, [18:41:17.944] ...future.globals.maxSize)) { [18:41:17.944] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.944] on.exit(options(oopts), add = TRUE) [18:41:17.944] } [18:41:17.944] { [18:41:17.944] lapply(seq_along(...future.elements_ii), [18:41:17.944] FUN = function(jj) { [18:41:17.944] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.944] ...future.FUN(...future.X_jj, ...) [18:41:17.944] }) [18:41:17.944] } [18:41:17.944] }, args = future.call.arguments) [18:41:17.944] })) [18:41:17.944] future::FutureResult(value = ...future.value$value, [18:41:17.944] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:17.944] ...future.rng), globalenv = if (FALSE) [18:41:17.944] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:17.944] ...future.globalenv.names)) [18:41:17.944] else NULL, started = ...future.startTime, version = "1.8") [18:41:17.944] }, condition = base::local({ [18:41:17.944] c <- base::c [18:41:17.944] inherits <- base::inherits [18:41:17.944] invokeRestart <- base::invokeRestart [18:41:17.944] length <- base::length [18:41:17.944] list <- base::list [18:41:17.944] seq.int <- base::seq.int [18:41:17.944] signalCondition <- base::signalCondition [18:41:17.944] sys.calls <- base::sys.calls [18:41:17.944] `[[` <- base::`[[` [18:41:17.944] `+` <- base::`+` [18:41:17.944] `<<-` <- base::`<<-` [18:41:17.944] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:17.944] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:17.944] 3L)] [18:41:17.944] } [18:41:17.944] function(cond) { [18:41:17.944] is_error <- inherits(cond, "error") [18:41:17.944] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:17.944] NULL) [18:41:17.944] if (is_error) { [18:41:17.944] sessionInformation <- function() { [18:41:17.944] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:17.944] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:17.944] search = base::search(), system = base::Sys.info()) [18:41:17.944] } [18:41:17.944] ...future.conditions[[length(...future.conditions) + [18:41:17.944] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:17.944] cond$call), session = sessionInformation(), [18:41:17.944] timestamp = base::Sys.time(), signaled = 0L) [18:41:17.944] signalCondition(cond) [18:41:17.944] } [18:41:17.944] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:17.944] "immediateCondition"))) { [18:41:17.944] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:17.944] ...future.conditions[[length(...future.conditions) + [18:41:17.944] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:17.944] if (TRUE && !signal) { [18:41:17.944] muffleCondition <- function (cond, pattern = "^muffle") [18:41:17.944] { [18:41:17.944] inherits <- base::inherits [18:41:17.944] invokeRestart <- base::invokeRestart [18:41:17.944] is.null <- base::is.null [18:41:17.944] muffled <- FALSE [18:41:17.944] if (inherits(cond, "message")) { [18:41:17.944] muffled <- grepl(pattern, "muffleMessage") [18:41:17.944] if (muffled) [18:41:17.944] invokeRestart("muffleMessage") [18:41:17.944] } [18:41:17.944] else if (inherits(cond, "warning")) { [18:41:17.944] muffled <- grepl(pattern, "muffleWarning") [18:41:17.944] if (muffled) [18:41:17.944] invokeRestart("muffleWarning") [18:41:17.944] } [18:41:17.944] else if (inherits(cond, "condition")) { [18:41:17.944] if (!is.null(pattern)) { [18:41:17.944] computeRestarts <- base::computeRestarts [18:41:17.944] grepl <- base::grepl [18:41:17.944] restarts <- computeRestarts(cond) [18:41:17.944] for (restart in restarts) { [18:41:17.944] name <- restart$name [18:41:17.944] if (is.null(name)) [18:41:17.944] next [18:41:17.944] if (!grepl(pattern, name)) [18:41:17.944] next [18:41:17.944] invokeRestart(restart) [18:41:17.944] muffled <- TRUE [18:41:17.944] break [18:41:17.944] } [18:41:17.944] } [18:41:17.944] } [18:41:17.944] invisible(muffled) [18:41:17.944] } [18:41:17.944] muffleCondition(cond, pattern = "^muffle") [18:41:17.944] } [18:41:17.944] } [18:41:17.944] else { [18:41:17.944] if (TRUE) { [18:41:17.944] muffleCondition <- function (cond, pattern = "^muffle") [18:41:17.944] { [18:41:17.944] inherits <- base::inherits [18:41:17.944] invokeRestart <- base::invokeRestart [18:41:17.944] is.null <- base::is.null [18:41:17.944] muffled <- FALSE [18:41:17.944] if (inherits(cond, "message")) { [18:41:17.944] muffled <- grepl(pattern, "muffleMessage") [18:41:17.944] if (muffled) [18:41:17.944] invokeRestart("muffleMessage") [18:41:17.944] } [18:41:17.944] else if (inherits(cond, "warning")) { [18:41:17.944] muffled <- grepl(pattern, "muffleWarning") [18:41:17.944] if (muffled) [18:41:17.944] invokeRestart("muffleWarning") [18:41:17.944] } [18:41:17.944] else if (inherits(cond, "condition")) { [18:41:17.944] if (!is.null(pattern)) { [18:41:17.944] computeRestarts <- base::computeRestarts [18:41:17.944] grepl <- base::grepl [18:41:17.944] restarts <- computeRestarts(cond) [18:41:17.944] for (restart in restarts) { [18:41:17.944] name <- restart$name [18:41:17.944] if (is.null(name)) [18:41:17.944] next [18:41:17.944] if (!grepl(pattern, name)) [18:41:17.944] next [18:41:17.944] invokeRestart(restart) [18:41:17.944] muffled <- TRUE [18:41:17.944] break [18:41:17.944] } [18:41:17.944] } [18:41:17.944] } [18:41:17.944] invisible(muffled) [18:41:17.944] } [18:41:17.944] muffleCondition(cond, pattern = "^muffle") [18:41:17.944] } [18:41:17.944] } [18:41:17.944] } [18:41:17.944] })) [18:41:17.944] }, error = function(ex) { [18:41:17.944] base::structure(base::list(value = NULL, visible = NULL, [18:41:17.944] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:17.944] ...future.rng), started = ...future.startTime, [18:41:17.944] finished = Sys.time(), session_uuid = NA_character_, [18:41:17.944] version = "1.8"), class = "FutureResult") [18:41:17.944] }, finally = { [18:41:17.944] if (!identical(...future.workdir, getwd())) [18:41:17.944] setwd(...future.workdir) [18:41:17.944] { [18:41:17.944] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:17.944] ...future.oldOptions$nwarnings <- NULL [18:41:17.944] } [18:41:17.944] base::options(...future.oldOptions) [18:41:17.944] if (.Platform$OS.type == "windows") { [18:41:17.944] old_names <- names(...future.oldEnvVars) [18:41:17.944] envs <- base::Sys.getenv() [18:41:17.944] names <- names(envs) [18:41:17.944] common <- intersect(names, old_names) [18:41:17.944] added <- setdiff(names, old_names) [18:41:17.944] removed <- setdiff(old_names, names) [18:41:17.944] changed <- common[...future.oldEnvVars[common] != [18:41:17.944] envs[common]] [18:41:17.944] NAMES <- toupper(changed) [18:41:17.944] args <- list() [18:41:17.944] for (kk in seq_along(NAMES)) { [18:41:17.944] name <- changed[[kk]] [18:41:17.944] NAME <- NAMES[[kk]] [18:41:17.944] if (name != NAME && is.element(NAME, old_names)) [18:41:17.944] next [18:41:17.944] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:17.944] } [18:41:17.944] NAMES <- toupper(added) [18:41:17.944] for (kk in seq_along(NAMES)) { [18:41:17.944] name <- added[[kk]] [18:41:17.944] NAME <- NAMES[[kk]] [18:41:17.944] if (name != NAME && is.element(NAME, old_names)) [18:41:17.944] next [18:41:17.944] args[[name]] <- "" [18:41:17.944] } [18:41:17.944] NAMES <- toupper(removed) [18:41:17.944] for (kk in seq_along(NAMES)) { [18:41:17.944] name <- removed[[kk]] [18:41:17.944] NAME <- NAMES[[kk]] [18:41:17.944] if (name != NAME && is.element(NAME, old_names)) [18:41:17.944] next [18:41:17.944] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:17.944] } [18:41:17.944] if (length(args) > 0) [18:41:17.944] base::do.call(base::Sys.setenv, args = args) [18:41:17.944] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:17.944] } [18:41:17.944] else { [18:41:17.944] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:17.944] } [18:41:17.944] { [18:41:17.944] if (base::length(...future.futureOptionsAdded) > [18:41:17.944] 0L) { [18:41:17.944] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:17.944] base::names(opts) <- ...future.futureOptionsAdded [18:41:17.944] base::options(opts) [18:41:17.944] } [18:41:17.944] { [18:41:17.944] { [18:41:17.944] NULL [18:41:17.944] RNGkind("Mersenne-Twister") [18:41:17.944] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:17.944] inherits = FALSE) [18:41:17.944] } [18:41:17.944] options(future.plan = NULL) [18:41:17.944] if (is.na(NA_character_)) [18:41:17.944] Sys.unsetenv("R_FUTURE_PLAN") [18:41:17.944] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:17.944] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:17.944] .init = FALSE) [18:41:17.944] } [18:41:17.944] } [18:41:17.944] } [18:41:17.944] }) [18:41:17.944] if (TRUE) { [18:41:17.944] base::sink(type = "output", split = FALSE) [18:41:17.944] if (TRUE) { [18:41:17.944] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:17.944] } [18:41:17.944] else { [18:41:17.944] ...future.result["stdout"] <- base::list(NULL) [18:41:17.944] } [18:41:17.944] base::close(...future.stdout) [18:41:17.944] ...future.stdout <- NULL [18:41:17.944] } [18:41:17.944] ...future.result$conditions <- ...future.conditions [18:41:17.944] ...future.result$finished <- base::Sys.time() [18:41:17.944] ...future.result [18:41:17.944] } [18:41:17.948] assign_globals() ... [18:41:17.948] List of 5 [18:41:17.948] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:17.948] $ future.call.arguments :List of 1 [18:41:17.948] ..$ length: int 2 [18:41:17.948] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:17.948] $ ...future.elements_ii :List of 1 [18:41:17.948] ..$ b: chr "numeric" [18:41:17.948] $ ...future.seeds_ii : NULL [18:41:17.948] $ ...future.globals.maxSize: NULL [18:41:17.948] - attr(*, "where")=List of 5 [18:41:17.948] ..$ ...future.FUN : [18:41:17.948] ..$ future.call.arguments : [18:41:17.948] ..$ ...future.elements_ii : [18:41:17.948] ..$ ...future.seeds_ii : [18:41:17.948] ..$ ...future.globals.maxSize: [18:41:17.948] - attr(*, "resolved")= logi FALSE [18:41:17.948] - attr(*, "total_size")= num 4288 [18:41:17.948] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:17.948] - attr(*, "already-done")= logi TRUE [18:41:17.956] - copied '...future.FUN' to environment [18:41:17.957] - copied 'future.call.arguments' to environment [18:41:17.957] - copied '...future.elements_ii' to environment [18:41:17.957] - copied '...future.seeds_ii' to environment [18:41:17.957] - copied '...future.globals.maxSize' to environment [18:41:17.957] assign_globals() ... done [18:41:17.958] plan(): Setting new future strategy stack: [18:41:17.958] List of future strategies: [18:41:17.958] 1. sequential: [18:41:17.958] - args: function (..., envir = parent.frame(), workers = "") [18:41:17.958] - tweaked: FALSE [18:41:17.958] - call: NULL [18:41:17.958] plan(): nbrOfWorkers() = 1 [18:41:17.960] plan(): Setting new future strategy stack: [18:41:17.960] List of future strategies: [18:41:17.960] 1. multisession: [18:41:17.960] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:41:17.960] - tweaked: FALSE [18:41:17.960] - call: plan(strategy) [18:41:17.962] plan(): nbrOfWorkers() = 1 [18:41:17.962] SequentialFuture started (and completed) [18:41:17.963] - Launch lazy future ... done [18:41:17.963] run() for 'SequentialFuture' ... done [18:41:17.963] Created future: [18:41:17.963] SequentialFuture: [18:41:17.963] Label: 'future_lapply-2' [18:41:17.963] Expression: [18:41:17.963] { [18:41:17.963] do.call(function(...) { [18:41:17.963] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.963] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:17.963] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.963] on.exit(options(oopts), add = TRUE) [18:41:17.963] } [18:41:17.963] { [18:41:17.963] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:17.963] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.963] ...future.FUN(...future.X_jj, ...) [18:41:17.963] }) [18:41:17.963] } [18:41:17.963] }, args = future.call.arguments) [18:41:17.963] } [18:41:17.963] Lazy evaluation: FALSE [18:41:17.963] Asynchronous evaluation: FALSE [18:41:17.963] Local evaluation: TRUE [18:41:17.963] Environment: R_GlobalEnv [18:41:17.963] Capture standard output: TRUE [18:41:17.963] Capture condition classes: 'condition' (excluding 'nothing') [18:41:17.963] Globals: 5 objects totaling 758 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 96 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:17.963] Packages: [18:41:17.963] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:17.963] Resolved: TRUE [18:41:17.963] Value: 55 bytes of class 'list' [18:41:17.963] Early signaling: FALSE [18:41:17.963] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:17.963] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:17.964] Chunk #2 of 4 ... DONE [18:41:17.964] Chunk #3 of 4 ... [18:41:17.965] - Finding globals in 'X' for chunk #3 ... [18:41:17.965] getGlobalsAndPackages() ... [18:41:17.965] Searching for globals... [18:41:17.965] [18:41:17.965] Searching for globals ... DONE [18:41:17.965] - globals: [0] [18:41:17.966] getGlobalsAndPackages() ... DONE [18:41:17.966] + additional globals found: [n=0] [18:41:17.966] + additional namespaces needed: [n=0] [18:41:17.966] - Finding globals in 'X' for chunk #3 ... DONE [18:41:17.966] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:17.966] - seeds: [18:41:17.967] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.967] getGlobalsAndPackages() ... [18:41:17.967] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.967] Resolving globals: FALSE [18:41:17.967] Tweak future expression to call with '...' arguments ... [18:41:17.967] { [18:41:17.967] do.call(function(...) { [18:41:17.967] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.967] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:17.967] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.967] on.exit(options(oopts), add = TRUE) [18:41:17.967] } [18:41:17.967] { [18:41:17.967] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:17.967] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.967] ...future.FUN(...future.X_jj, ...) [18:41:17.967] }) [18:41:17.967] } [18:41:17.967] }, args = future.call.arguments) [18:41:17.967] } [18:41:17.968] Tweak future expression to call with '...' arguments ... DONE [18:41:17.968] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.968] [18:41:17.969] getGlobalsAndPackages() ... DONE [18:41:17.969] run() for 'Future' ... [18:41:17.969] - state: 'created' [18:41:17.969] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:17.972] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:17.972] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:17.972] - Field: 'label' [18:41:17.972] - Field: 'local' [18:41:17.972] - Field: 'owner' [18:41:17.973] - Field: 'envir' [18:41:17.973] - Field: 'packages' [18:41:17.973] - Field: 'gc' [18:41:17.973] - Field: 'conditions' [18:41:17.973] - Field: 'expr' [18:41:17.973] - Field: 'uuid' [18:41:17.974] - Field: 'seed' [18:41:17.974] - Field: 'version' [18:41:17.974] - Field: 'result' [18:41:17.974] - Field: 'asynchronous' [18:41:17.974] - Field: 'calls' [18:41:17.974] - Field: 'globals' [18:41:17.975] - Field: 'stdout' [18:41:17.975] - Field: 'earlySignal' [18:41:17.975] - Field: 'lazy' [18:41:17.975] - Field: 'state' [18:41:17.975] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:17.975] - Launch lazy future ... [18:41:17.976] Packages needed by the future expression (n = 0): [18:41:17.976] Packages needed by future strategies (n = 0): [18:41:17.976] { [18:41:17.976] { [18:41:17.976] { [18:41:17.976] ...future.startTime <- base::Sys.time() [18:41:17.976] { [18:41:17.976] { [18:41:17.976] { [18:41:17.976] base::local({ [18:41:17.976] has_future <- base::requireNamespace("future", [18:41:17.976] quietly = TRUE) [18:41:17.976] if (has_future) { [18:41:17.976] ns <- base::getNamespace("future") [18:41:17.976] version <- ns[[".package"]][["version"]] [18:41:17.976] if (is.null(version)) [18:41:17.976] version <- utils::packageVersion("future") [18:41:17.976] } [18:41:17.976] else { [18:41:17.976] version <- NULL [18:41:17.976] } [18:41:17.976] if (!has_future || version < "1.8.0") { [18:41:17.976] info <- base::c(r_version = base::gsub("R version ", [18:41:17.976] "", base::R.version$version.string), [18:41:17.976] platform = base::sprintf("%s (%s-bit)", [18:41:17.976] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:17.976] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:17.976] "release", "version")], collapse = " "), [18:41:17.976] hostname = base::Sys.info()[["nodename"]]) [18:41:17.976] info <- base::sprintf("%s: %s", base::names(info), [18:41:17.976] info) [18:41:17.976] info <- base::paste(info, collapse = "; ") [18:41:17.976] if (!has_future) { [18:41:17.976] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:17.976] info) [18:41:17.976] } [18:41:17.976] else { [18:41:17.976] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:17.976] info, version) [18:41:17.976] } [18:41:17.976] base::stop(msg) [18:41:17.976] } [18:41:17.976] }) [18:41:17.976] } [18:41:17.976] ...future.strategy.old <- future::plan("list") [18:41:17.976] options(future.plan = NULL) [18:41:17.976] Sys.unsetenv("R_FUTURE_PLAN") [18:41:17.976] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:17.976] } [18:41:17.976] ...future.workdir <- getwd() [18:41:17.976] } [18:41:17.976] ...future.oldOptions <- base::as.list(base::.Options) [18:41:17.976] ...future.oldEnvVars <- base::Sys.getenv() [18:41:17.976] } [18:41:17.976] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:17.976] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:17.976] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:17.976] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:17.976] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:17.976] future.stdout.windows.reencode = NULL, width = 80L) [18:41:17.976] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:17.976] base::names(...future.oldOptions)) [18:41:17.976] } [18:41:17.976] if (FALSE) { [18:41:17.976] } [18:41:17.976] else { [18:41:17.976] if (TRUE) { [18:41:17.976] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:17.976] open = "w") [18:41:17.976] } [18:41:17.976] else { [18:41:17.976] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:17.976] windows = "NUL", "/dev/null"), open = "w") [18:41:17.976] } [18:41:17.976] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:17.976] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:17.976] base::sink(type = "output", split = FALSE) [18:41:17.976] base::close(...future.stdout) [18:41:17.976] }, add = TRUE) [18:41:17.976] } [18:41:17.976] ...future.frame <- base::sys.nframe() [18:41:17.976] ...future.conditions <- base::list() [18:41:17.976] ...future.rng <- base::globalenv()$.Random.seed [18:41:17.976] if (FALSE) { [18:41:17.976] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:17.976] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:17.976] } [18:41:17.976] ...future.result <- base::tryCatch({ [18:41:17.976] base::withCallingHandlers({ [18:41:17.976] ...future.value <- base::withVisible(base::local({ [18:41:17.976] do.call(function(...) { [18:41:17.976] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.976] if (!identical(...future.globals.maxSize.org, [18:41:17.976] ...future.globals.maxSize)) { [18:41:17.976] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.976] on.exit(options(oopts), add = TRUE) [18:41:17.976] } [18:41:17.976] { [18:41:17.976] lapply(seq_along(...future.elements_ii), [18:41:17.976] FUN = function(jj) { [18:41:17.976] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.976] ...future.FUN(...future.X_jj, ...) [18:41:17.976] }) [18:41:17.976] } [18:41:17.976] }, args = future.call.arguments) [18:41:17.976] })) [18:41:17.976] future::FutureResult(value = ...future.value$value, [18:41:17.976] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:17.976] ...future.rng), globalenv = if (FALSE) [18:41:17.976] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:17.976] ...future.globalenv.names)) [18:41:17.976] else NULL, started = ...future.startTime, version = "1.8") [18:41:17.976] }, condition = base::local({ [18:41:17.976] c <- base::c [18:41:17.976] inherits <- base::inherits [18:41:17.976] invokeRestart <- base::invokeRestart [18:41:17.976] length <- base::length [18:41:17.976] list <- base::list [18:41:17.976] seq.int <- base::seq.int [18:41:17.976] signalCondition <- base::signalCondition [18:41:17.976] sys.calls <- base::sys.calls [18:41:17.976] `[[` <- base::`[[` [18:41:17.976] `+` <- base::`+` [18:41:17.976] `<<-` <- base::`<<-` [18:41:17.976] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:17.976] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:17.976] 3L)] [18:41:17.976] } [18:41:17.976] function(cond) { [18:41:17.976] is_error <- inherits(cond, "error") [18:41:17.976] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:17.976] NULL) [18:41:17.976] if (is_error) { [18:41:17.976] sessionInformation <- function() { [18:41:17.976] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:17.976] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:17.976] search = base::search(), system = base::Sys.info()) [18:41:17.976] } [18:41:17.976] ...future.conditions[[length(...future.conditions) + [18:41:17.976] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:17.976] cond$call), session = sessionInformation(), [18:41:17.976] timestamp = base::Sys.time(), signaled = 0L) [18:41:17.976] signalCondition(cond) [18:41:17.976] } [18:41:17.976] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:17.976] "immediateCondition"))) { [18:41:17.976] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:17.976] ...future.conditions[[length(...future.conditions) + [18:41:17.976] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:17.976] if (TRUE && !signal) { [18:41:17.976] muffleCondition <- function (cond, pattern = "^muffle") [18:41:17.976] { [18:41:17.976] inherits <- base::inherits [18:41:17.976] invokeRestart <- base::invokeRestart [18:41:17.976] is.null <- base::is.null [18:41:17.976] muffled <- FALSE [18:41:17.976] if (inherits(cond, "message")) { [18:41:17.976] muffled <- grepl(pattern, "muffleMessage") [18:41:17.976] if (muffled) [18:41:17.976] invokeRestart("muffleMessage") [18:41:17.976] } [18:41:17.976] else if (inherits(cond, "warning")) { [18:41:17.976] muffled <- grepl(pattern, "muffleWarning") [18:41:17.976] if (muffled) [18:41:17.976] invokeRestart("muffleWarning") [18:41:17.976] } [18:41:17.976] else if (inherits(cond, "condition")) { [18:41:17.976] if (!is.null(pattern)) { [18:41:17.976] computeRestarts <- base::computeRestarts [18:41:17.976] grepl <- base::grepl [18:41:17.976] restarts <- computeRestarts(cond) [18:41:17.976] for (restart in restarts) { [18:41:17.976] name <- restart$name [18:41:17.976] if (is.null(name)) [18:41:17.976] next [18:41:17.976] if (!grepl(pattern, name)) [18:41:17.976] next [18:41:17.976] invokeRestart(restart) [18:41:17.976] muffled <- TRUE [18:41:17.976] break [18:41:17.976] } [18:41:17.976] } [18:41:17.976] } [18:41:17.976] invisible(muffled) [18:41:17.976] } [18:41:17.976] muffleCondition(cond, pattern = "^muffle") [18:41:17.976] } [18:41:17.976] } [18:41:17.976] else { [18:41:17.976] if (TRUE) { [18:41:17.976] muffleCondition <- function (cond, pattern = "^muffle") [18:41:17.976] { [18:41:17.976] inherits <- base::inherits [18:41:17.976] invokeRestart <- base::invokeRestart [18:41:17.976] is.null <- base::is.null [18:41:17.976] muffled <- FALSE [18:41:17.976] if (inherits(cond, "message")) { [18:41:17.976] muffled <- grepl(pattern, "muffleMessage") [18:41:17.976] if (muffled) [18:41:17.976] invokeRestart("muffleMessage") [18:41:17.976] } [18:41:17.976] else if (inherits(cond, "warning")) { [18:41:17.976] muffled <- grepl(pattern, "muffleWarning") [18:41:17.976] if (muffled) [18:41:17.976] invokeRestart("muffleWarning") [18:41:17.976] } [18:41:17.976] else if (inherits(cond, "condition")) { [18:41:17.976] if (!is.null(pattern)) { [18:41:17.976] computeRestarts <- base::computeRestarts [18:41:17.976] grepl <- base::grepl [18:41:17.976] restarts <- computeRestarts(cond) [18:41:17.976] for (restart in restarts) { [18:41:17.976] name <- restart$name [18:41:17.976] if (is.null(name)) [18:41:17.976] next [18:41:17.976] if (!grepl(pattern, name)) [18:41:17.976] next [18:41:17.976] invokeRestart(restart) [18:41:17.976] muffled <- TRUE [18:41:17.976] break [18:41:17.976] } [18:41:17.976] } [18:41:17.976] } [18:41:17.976] invisible(muffled) [18:41:17.976] } [18:41:17.976] muffleCondition(cond, pattern = "^muffle") [18:41:17.976] } [18:41:17.976] } [18:41:17.976] } [18:41:17.976] })) [18:41:17.976] }, error = function(ex) { [18:41:17.976] base::structure(base::list(value = NULL, visible = NULL, [18:41:17.976] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:17.976] ...future.rng), started = ...future.startTime, [18:41:17.976] finished = Sys.time(), session_uuid = NA_character_, [18:41:17.976] version = "1.8"), class = "FutureResult") [18:41:17.976] }, finally = { [18:41:17.976] if (!identical(...future.workdir, getwd())) [18:41:17.976] setwd(...future.workdir) [18:41:17.976] { [18:41:17.976] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:17.976] ...future.oldOptions$nwarnings <- NULL [18:41:17.976] } [18:41:17.976] base::options(...future.oldOptions) [18:41:17.976] if (.Platform$OS.type == "windows") { [18:41:17.976] old_names <- names(...future.oldEnvVars) [18:41:17.976] envs <- base::Sys.getenv() [18:41:17.976] names <- names(envs) [18:41:17.976] common <- intersect(names, old_names) [18:41:17.976] added <- setdiff(names, old_names) [18:41:17.976] removed <- setdiff(old_names, names) [18:41:17.976] changed <- common[...future.oldEnvVars[common] != [18:41:17.976] envs[common]] [18:41:17.976] NAMES <- toupper(changed) [18:41:17.976] args <- list() [18:41:17.976] for (kk in seq_along(NAMES)) { [18:41:17.976] name <- changed[[kk]] [18:41:17.976] NAME <- NAMES[[kk]] [18:41:17.976] if (name != NAME && is.element(NAME, old_names)) [18:41:17.976] next [18:41:17.976] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:17.976] } [18:41:17.976] NAMES <- toupper(added) [18:41:17.976] for (kk in seq_along(NAMES)) { [18:41:17.976] name <- added[[kk]] [18:41:17.976] NAME <- NAMES[[kk]] [18:41:17.976] if (name != NAME && is.element(NAME, old_names)) [18:41:17.976] next [18:41:17.976] args[[name]] <- "" [18:41:17.976] } [18:41:17.976] NAMES <- toupper(removed) [18:41:17.976] for (kk in seq_along(NAMES)) { [18:41:17.976] name <- removed[[kk]] [18:41:17.976] NAME <- NAMES[[kk]] [18:41:17.976] if (name != NAME && is.element(NAME, old_names)) [18:41:17.976] next [18:41:17.976] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:17.976] } [18:41:17.976] if (length(args) > 0) [18:41:17.976] base::do.call(base::Sys.setenv, args = args) [18:41:17.976] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:17.976] } [18:41:17.976] else { [18:41:17.976] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:17.976] } [18:41:17.976] { [18:41:17.976] if (base::length(...future.futureOptionsAdded) > [18:41:17.976] 0L) { [18:41:17.976] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:17.976] base::names(opts) <- ...future.futureOptionsAdded [18:41:17.976] base::options(opts) [18:41:17.976] } [18:41:17.976] { [18:41:17.976] { [18:41:17.976] NULL [18:41:17.976] RNGkind("Mersenne-Twister") [18:41:17.976] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:17.976] inherits = FALSE) [18:41:17.976] } [18:41:17.976] options(future.plan = NULL) [18:41:17.976] if (is.na(NA_character_)) [18:41:17.976] Sys.unsetenv("R_FUTURE_PLAN") [18:41:17.976] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:17.976] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:17.976] .init = FALSE) [18:41:17.976] } [18:41:17.976] } [18:41:17.976] } [18:41:17.976] }) [18:41:17.976] if (TRUE) { [18:41:17.976] base::sink(type = "output", split = FALSE) [18:41:17.976] if (TRUE) { [18:41:17.976] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:17.976] } [18:41:17.976] else { [18:41:17.976] ...future.result["stdout"] <- base::list(NULL) [18:41:17.976] } [18:41:17.976] base::close(...future.stdout) [18:41:17.976] ...future.stdout <- NULL [18:41:17.976] } [18:41:17.976] ...future.result$conditions <- ...future.conditions [18:41:17.976] ...future.result$finished <- base::Sys.time() [18:41:17.976] ...future.result [18:41:17.976] } [18:41:17.980] assign_globals() ... [18:41:17.980] List of 5 [18:41:17.980] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:17.980] $ future.call.arguments :List of 1 [18:41:17.980] ..$ length: int 2 [18:41:17.980] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:17.980] $ ...future.elements_ii :List of 1 [18:41:17.980] ..$ c: chr "character" [18:41:17.980] $ ...future.seeds_ii : NULL [18:41:17.980] $ ...future.globals.maxSize: NULL [18:41:17.980] - attr(*, "where")=List of 5 [18:41:17.980] ..$ ...future.FUN : [18:41:17.980] ..$ future.call.arguments : [18:41:17.980] ..$ ...future.elements_ii : [18:41:17.980] ..$ ...future.seeds_ii : [18:41:17.980] ..$ ...future.globals.maxSize: [18:41:17.980] - attr(*, "resolved")= logi FALSE [18:41:17.980] - attr(*, "total_size")= num 4288 [18:41:17.980] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:17.980] - attr(*, "already-done")= logi TRUE [18:41:17.987] - copied '...future.FUN' to environment [18:41:17.987] - copied 'future.call.arguments' to environment [18:41:17.987] - copied '...future.elements_ii' to environment [18:41:17.987] - copied '...future.seeds_ii' to environment [18:41:17.987] - copied '...future.globals.maxSize' to environment [18:41:17.988] assign_globals() ... done [18:41:17.988] plan(): Setting new future strategy stack: [18:41:17.988] List of future strategies: [18:41:17.988] 1. sequential: [18:41:17.988] - args: function (..., envir = parent.frame(), workers = "") [18:41:17.988] - tweaked: FALSE [18:41:17.988] - call: NULL [18:41:17.989] plan(): nbrOfWorkers() = 1 [18:41:17.990] plan(): Setting new future strategy stack: [18:41:17.990] List of future strategies: [18:41:17.990] 1. multisession: [18:41:17.990] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:41:17.990] - tweaked: FALSE [18:41:17.990] - call: plan(strategy) [18:41:17.993] plan(): nbrOfWorkers() = 1 [18:41:17.993] SequentialFuture started (and completed) [18:41:17.993] - Launch lazy future ... done [18:41:17.993] run() for 'SequentialFuture' ... done [18:41:17.993] Created future: [18:41:17.994] SequentialFuture: [18:41:17.994] Label: 'future_lapply-3' [18:41:17.994] Expression: [18:41:17.994] { [18:41:17.994] do.call(function(...) { [18:41:17.994] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.994] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:17.994] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.994] on.exit(options(oopts), add = TRUE) [18:41:17.994] } [18:41:17.994] { [18:41:17.994] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:17.994] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.994] ...future.FUN(...future.X_jj, ...) [18:41:17.994] }) [18:41:17.994] } [18:41:17.994] }, args = future.call.arguments) [18:41:17.994] } [18:41:17.994] Lazy evaluation: FALSE [18:41:17.994] Asynchronous evaluation: FALSE [18:41:17.994] Local evaluation: TRUE [18:41:17.994] Environment: R_GlobalEnv [18:41:17.994] Capture standard output: TRUE [18:41:17.994] Capture condition classes: 'condition' (excluding 'nothing') [18:41:17.994] Globals: 5 objects totaling 760 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 98 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:17.994] Packages: [18:41:17.994] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:17.994] Resolved: TRUE [18:41:17.994] Value: 55 bytes of class 'list' [18:41:17.994] Early signaling: FALSE [18:41:17.994] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:17.994] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:17.995] Chunk #3 of 4 ... DONE [18:41:17.995] Chunk #4 of 4 ... [18:41:17.995] - Finding globals in 'X' for chunk #4 ... [18:41:17.995] getGlobalsAndPackages() ... [18:41:17.995] Searching for globals... [18:41:17.996] [18:41:17.996] Searching for globals ... DONE [18:41:17.996] - globals: [0] [18:41:17.996] getGlobalsAndPackages() ... DONE [18:41:17.996] + additional globals found: [n=0] [18:41:17.996] + additional namespaces needed: [n=0] [18:41:17.997] - Finding globals in 'X' for chunk #4 ... DONE [18:41:17.997] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:17.997] - seeds: [18:41:17.997] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.997] getGlobalsAndPackages() ... [18:41:17.997] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.998] Resolving globals: FALSE [18:41:17.998] Tweak future expression to call with '...' arguments ... [18:41:17.998] { [18:41:17.998] do.call(function(...) { [18:41:17.998] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:17.998] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:17.998] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:17.998] on.exit(options(oopts), add = TRUE) [18:41:17.998] } [18:41:17.998] { [18:41:17.998] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:17.998] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:17.998] ...future.FUN(...future.X_jj, ...) [18:41:17.998] }) [18:41:17.998] } [18:41:17.998] }, args = future.call.arguments) [18:41:17.998] } [18:41:17.998] Tweak future expression to call with '...' arguments ... DONE [18:41:17.999] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:17.999] [18:41:17.999] getGlobalsAndPackages() ... DONE [18:41:17.999] run() for 'Future' ... [18:41:18.000] - state: 'created' [18:41:18.000] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:18.002] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:18.002] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:18.003] - Field: 'label' [18:41:18.003] - Field: 'local' [18:41:18.003] - Field: 'owner' [18:41:18.003] - Field: 'envir' [18:41:18.003] - Field: 'packages' [18:41:18.003] - Field: 'gc' [18:41:18.004] - Field: 'conditions' [18:41:18.004] - Field: 'expr' [18:41:18.004] - Field: 'uuid' [18:41:18.004] - Field: 'seed' [18:41:18.004] - Field: 'version' [18:41:18.004] - Field: 'result' [18:41:18.005] - Field: 'asynchronous' [18:41:18.005] - Field: 'calls' [18:41:18.005] - Field: 'globals' [18:41:18.005] - Field: 'stdout' [18:41:18.005] - Field: 'earlySignal' [18:41:18.005] - Field: 'lazy' [18:41:18.006] - Field: 'state' [18:41:18.006] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:18.006] - Launch lazy future ... [18:41:18.006] Packages needed by the future expression (n = 0): [18:41:18.006] Packages needed by future strategies (n = 0): [18:41:18.007] { [18:41:18.007] { [18:41:18.007] { [18:41:18.007] ...future.startTime <- base::Sys.time() [18:41:18.007] { [18:41:18.007] { [18:41:18.007] { [18:41:18.007] base::local({ [18:41:18.007] has_future <- base::requireNamespace("future", [18:41:18.007] quietly = TRUE) [18:41:18.007] if (has_future) { [18:41:18.007] ns <- base::getNamespace("future") [18:41:18.007] version <- ns[[".package"]][["version"]] [18:41:18.007] if (is.null(version)) [18:41:18.007] version <- utils::packageVersion("future") [18:41:18.007] } [18:41:18.007] else { [18:41:18.007] version <- NULL [18:41:18.007] } [18:41:18.007] if (!has_future || version < "1.8.0") { [18:41:18.007] info <- base::c(r_version = base::gsub("R version ", [18:41:18.007] "", base::R.version$version.string), [18:41:18.007] platform = base::sprintf("%s (%s-bit)", [18:41:18.007] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:18.007] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:18.007] "release", "version")], collapse = " "), [18:41:18.007] hostname = base::Sys.info()[["nodename"]]) [18:41:18.007] info <- base::sprintf("%s: %s", base::names(info), [18:41:18.007] info) [18:41:18.007] info <- base::paste(info, collapse = "; ") [18:41:18.007] if (!has_future) { [18:41:18.007] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:18.007] info) [18:41:18.007] } [18:41:18.007] else { [18:41:18.007] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:18.007] info, version) [18:41:18.007] } [18:41:18.007] base::stop(msg) [18:41:18.007] } [18:41:18.007] }) [18:41:18.007] } [18:41:18.007] ...future.strategy.old <- future::plan("list") [18:41:18.007] options(future.plan = NULL) [18:41:18.007] Sys.unsetenv("R_FUTURE_PLAN") [18:41:18.007] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:18.007] } [18:41:18.007] ...future.workdir <- getwd() [18:41:18.007] } [18:41:18.007] ...future.oldOptions <- base::as.list(base::.Options) [18:41:18.007] ...future.oldEnvVars <- base::Sys.getenv() [18:41:18.007] } [18:41:18.007] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:18.007] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:18.007] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:18.007] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:18.007] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:18.007] future.stdout.windows.reencode = NULL, width = 80L) [18:41:18.007] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:18.007] base::names(...future.oldOptions)) [18:41:18.007] } [18:41:18.007] if (FALSE) { [18:41:18.007] } [18:41:18.007] else { [18:41:18.007] if (TRUE) { [18:41:18.007] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:18.007] open = "w") [18:41:18.007] } [18:41:18.007] else { [18:41:18.007] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:18.007] windows = "NUL", "/dev/null"), open = "w") [18:41:18.007] } [18:41:18.007] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:18.007] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:18.007] base::sink(type = "output", split = FALSE) [18:41:18.007] base::close(...future.stdout) [18:41:18.007] }, add = TRUE) [18:41:18.007] } [18:41:18.007] ...future.frame <- base::sys.nframe() [18:41:18.007] ...future.conditions <- base::list() [18:41:18.007] ...future.rng <- base::globalenv()$.Random.seed [18:41:18.007] if (FALSE) { [18:41:18.007] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:18.007] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:18.007] } [18:41:18.007] ...future.result <- base::tryCatch({ [18:41:18.007] base::withCallingHandlers({ [18:41:18.007] ...future.value <- base::withVisible(base::local({ [18:41:18.007] do.call(function(...) { [18:41:18.007] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.007] if (!identical(...future.globals.maxSize.org, [18:41:18.007] ...future.globals.maxSize)) { [18:41:18.007] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.007] on.exit(options(oopts), add = TRUE) [18:41:18.007] } [18:41:18.007] { [18:41:18.007] lapply(seq_along(...future.elements_ii), [18:41:18.007] FUN = function(jj) { [18:41:18.007] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.007] ...future.FUN(...future.X_jj, ...) [18:41:18.007] }) [18:41:18.007] } [18:41:18.007] }, args = future.call.arguments) [18:41:18.007] })) [18:41:18.007] future::FutureResult(value = ...future.value$value, [18:41:18.007] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:18.007] ...future.rng), globalenv = if (FALSE) [18:41:18.007] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:18.007] ...future.globalenv.names)) [18:41:18.007] else NULL, started = ...future.startTime, version = "1.8") [18:41:18.007] }, condition = base::local({ [18:41:18.007] c <- base::c [18:41:18.007] inherits <- base::inherits [18:41:18.007] invokeRestart <- base::invokeRestart [18:41:18.007] length <- base::length [18:41:18.007] list <- base::list [18:41:18.007] seq.int <- base::seq.int [18:41:18.007] signalCondition <- base::signalCondition [18:41:18.007] sys.calls <- base::sys.calls [18:41:18.007] `[[` <- base::`[[` [18:41:18.007] `+` <- base::`+` [18:41:18.007] `<<-` <- base::`<<-` [18:41:18.007] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:18.007] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:18.007] 3L)] [18:41:18.007] } [18:41:18.007] function(cond) { [18:41:18.007] is_error <- inherits(cond, "error") [18:41:18.007] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:18.007] NULL) [18:41:18.007] if (is_error) { [18:41:18.007] sessionInformation <- function() { [18:41:18.007] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:18.007] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:18.007] search = base::search(), system = base::Sys.info()) [18:41:18.007] } [18:41:18.007] ...future.conditions[[length(...future.conditions) + [18:41:18.007] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:18.007] cond$call), session = sessionInformation(), [18:41:18.007] timestamp = base::Sys.time(), signaled = 0L) [18:41:18.007] signalCondition(cond) [18:41:18.007] } [18:41:18.007] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:18.007] "immediateCondition"))) { [18:41:18.007] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:18.007] ...future.conditions[[length(...future.conditions) + [18:41:18.007] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:18.007] if (TRUE && !signal) { [18:41:18.007] muffleCondition <- function (cond, pattern = "^muffle") [18:41:18.007] { [18:41:18.007] inherits <- base::inherits [18:41:18.007] invokeRestart <- base::invokeRestart [18:41:18.007] is.null <- base::is.null [18:41:18.007] muffled <- FALSE [18:41:18.007] if (inherits(cond, "message")) { [18:41:18.007] muffled <- grepl(pattern, "muffleMessage") [18:41:18.007] if (muffled) [18:41:18.007] invokeRestart("muffleMessage") [18:41:18.007] } [18:41:18.007] else if (inherits(cond, "warning")) { [18:41:18.007] muffled <- grepl(pattern, "muffleWarning") [18:41:18.007] if (muffled) [18:41:18.007] invokeRestart("muffleWarning") [18:41:18.007] } [18:41:18.007] else if (inherits(cond, "condition")) { [18:41:18.007] if (!is.null(pattern)) { [18:41:18.007] computeRestarts <- base::computeRestarts [18:41:18.007] grepl <- base::grepl [18:41:18.007] restarts <- computeRestarts(cond) [18:41:18.007] for (restart in restarts) { [18:41:18.007] name <- restart$name [18:41:18.007] if (is.null(name)) [18:41:18.007] next [18:41:18.007] if (!grepl(pattern, name)) [18:41:18.007] next [18:41:18.007] invokeRestart(restart) [18:41:18.007] muffled <- TRUE [18:41:18.007] break [18:41:18.007] } [18:41:18.007] } [18:41:18.007] } [18:41:18.007] invisible(muffled) [18:41:18.007] } [18:41:18.007] muffleCondition(cond, pattern = "^muffle") [18:41:18.007] } [18:41:18.007] } [18:41:18.007] else { [18:41:18.007] if (TRUE) { [18:41:18.007] muffleCondition <- function (cond, pattern = "^muffle") [18:41:18.007] { [18:41:18.007] inherits <- base::inherits [18:41:18.007] invokeRestart <- base::invokeRestart [18:41:18.007] is.null <- base::is.null [18:41:18.007] muffled <- FALSE [18:41:18.007] if (inherits(cond, "message")) { [18:41:18.007] muffled <- grepl(pattern, "muffleMessage") [18:41:18.007] if (muffled) [18:41:18.007] invokeRestart("muffleMessage") [18:41:18.007] } [18:41:18.007] else if (inherits(cond, "warning")) { [18:41:18.007] muffled <- grepl(pattern, "muffleWarning") [18:41:18.007] if (muffled) [18:41:18.007] invokeRestart("muffleWarning") [18:41:18.007] } [18:41:18.007] else if (inherits(cond, "condition")) { [18:41:18.007] if (!is.null(pattern)) { [18:41:18.007] computeRestarts <- base::computeRestarts [18:41:18.007] grepl <- base::grepl [18:41:18.007] restarts <- computeRestarts(cond) [18:41:18.007] for (restart in restarts) { [18:41:18.007] name <- restart$name [18:41:18.007] if (is.null(name)) [18:41:18.007] next [18:41:18.007] if (!grepl(pattern, name)) [18:41:18.007] next [18:41:18.007] invokeRestart(restart) [18:41:18.007] muffled <- TRUE [18:41:18.007] break [18:41:18.007] } [18:41:18.007] } [18:41:18.007] } [18:41:18.007] invisible(muffled) [18:41:18.007] } [18:41:18.007] muffleCondition(cond, pattern = "^muffle") [18:41:18.007] } [18:41:18.007] } [18:41:18.007] } [18:41:18.007] })) [18:41:18.007] }, error = function(ex) { [18:41:18.007] base::structure(base::list(value = NULL, visible = NULL, [18:41:18.007] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:18.007] ...future.rng), started = ...future.startTime, [18:41:18.007] finished = Sys.time(), session_uuid = NA_character_, [18:41:18.007] version = "1.8"), class = "FutureResult") [18:41:18.007] }, finally = { [18:41:18.007] if (!identical(...future.workdir, getwd())) [18:41:18.007] setwd(...future.workdir) [18:41:18.007] { [18:41:18.007] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:18.007] ...future.oldOptions$nwarnings <- NULL [18:41:18.007] } [18:41:18.007] base::options(...future.oldOptions) [18:41:18.007] if (.Platform$OS.type == "windows") { [18:41:18.007] old_names <- names(...future.oldEnvVars) [18:41:18.007] envs <- base::Sys.getenv() [18:41:18.007] names <- names(envs) [18:41:18.007] common <- intersect(names, old_names) [18:41:18.007] added <- setdiff(names, old_names) [18:41:18.007] removed <- setdiff(old_names, names) [18:41:18.007] changed <- common[...future.oldEnvVars[common] != [18:41:18.007] envs[common]] [18:41:18.007] NAMES <- toupper(changed) [18:41:18.007] args <- list() [18:41:18.007] for (kk in seq_along(NAMES)) { [18:41:18.007] name <- changed[[kk]] [18:41:18.007] NAME <- NAMES[[kk]] [18:41:18.007] if (name != NAME && is.element(NAME, old_names)) [18:41:18.007] next [18:41:18.007] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:18.007] } [18:41:18.007] NAMES <- toupper(added) [18:41:18.007] for (kk in seq_along(NAMES)) { [18:41:18.007] name <- added[[kk]] [18:41:18.007] NAME <- NAMES[[kk]] [18:41:18.007] if (name != NAME && is.element(NAME, old_names)) [18:41:18.007] next [18:41:18.007] args[[name]] <- "" [18:41:18.007] } [18:41:18.007] NAMES <- toupper(removed) [18:41:18.007] for (kk in seq_along(NAMES)) { [18:41:18.007] name <- removed[[kk]] [18:41:18.007] NAME <- NAMES[[kk]] [18:41:18.007] if (name != NAME && is.element(NAME, old_names)) [18:41:18.007] next [18:41:18.007] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:18.007] } [18:41:18.007] if (length(args) > 0) [18:41:18.007] base::do.call(base::Sys.setenv, args = args) [18:41:18.007] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:18.007] } [18:41:18.007] else { [18:41:18.007] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:18.007] } [18:41:18.007] { [18:41:18.007] if (base::length(...future.futureOptionsAdded) > [18:41:18.007] 0L) { [18:41:18.007] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:18.007] base::names(opts) <- ...future.futureOptionsAdded [18:41:18.007] base::options(opts) [18:41:18.007] } [18:41:18.007] { [18:41:18.007] { [18:41:18.007] NULL [18:41:18.007] RNGkind("Mersenne-Twister") [18:41:18.007] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:18.007] inherits = FALSE) [18:41:18.007] } [18:41:18.007] options(future.plan = NULL) [18:41:18.007] if (is.na(NA_character_)) [18:41:18.007] Sys.unsetenv("R_FUTURE_PLAN") [18:41:18.007] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:18.007] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:18.007] .init = FALSE) [18:41:18.007] } [18:41:18.007] } [18:41:18.007] } [18:41:18.007] }) [18:41:18.007] if (TRUE) { [18:41:18.007] base::sink(type = "output", split = FALSE) [18:41:18.007] if (TRUE) { [18:41:18.007] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:18.007] } [18:41:18.007] else { [18:41:18.007] ...future.result["stdout"] <- base::list(NULL) [18:41:18.007] } [18:41:18.007] base::close(...future.stdout) [18:41:18.007] ...future.stdout <- NULL [18:41:18.007] } [18:41:18.007] ...future.result$conditions <- ...future.conditions [18:41:18.007] ...future.result$finished <- base::Sys.time() [18:41:18.007] ...future.result [18:41:18.007] } [18:41:18.011] assign_globals() ... [18:41:18.011] List of 5 [18:41:18.011] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:18.011] $ future.call.arguments :List of 1 [18:41:18.011] ..$ length: int 2 [18:41:18.011] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:18.011] $ ...future.elements_ii :List of 1 [18:41:18.011] ..$ c: chr "list" [18:41:18.011] $ ...future.seeds_ii : NULL [18:41:18.011] $ ...future.globals.maxSize: NULL [18:41:18.011] - attr(*, "where")=List of 5 [18:41:18.011] ..$ ...future.FUN : [18:41:18.011] ..$ future.call.arguments : [18:41:18.011] ..$ ...future.elements_ii : [18:41:18.011] ..$ ...future.seeds_ii : [18:41:18.011] ..$ ...future.globals.maxSize: [18:41:18.011] - attr(*, "resolved")= logi FALSE [18:41:18.011] - attr(*, "total_size")= num 4288 [18:41:18.011] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:18.011] - attr(*, "already-done")= logi TRUE [18:41:18.017] - copied '...future.FUN' to environment [18:41:18.017] - copied 'future.call.arguments' to environment [18:41:18.017] - copied '...future.elements_ii' to environment [18:41:18.017] - copied '...future.seeds_ii' to environment [18:41:18.018] - copied '...future.globals.maxSize' to environment [18:41:18.018] assign_globals() ... done [18:41:18.018] plan(): Setting new future strategy stack: [18:41:18.018] List of future strategies: [18:41:18.018] 1. sequential: [18:41:18.018] - args: function (..., envir = parent.frame(), workers = "") [18:41:18.018] - tweaked: FALSE [18:41:18.018] - call: NULL [18:41:18.019] plan(): nbrOfWorkers() = 1 [18:41:18.020] plan(): Setting new future strategy stack: [18:41:18.020] List of future strategies: [18:41:18.020] 1. multisession: [18:41:18.020] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:41:18.020] - tweaked: FALSE [18:41:18.020] - call: plan(strategy) [18:41:18.023] plan(): nbrOfWorkers() = 1 [18:41:18.023] SequentialFuture started (and completed) [18:41:18.023] - Launch lazy future ... done [18:41:18.023] run() for 'SequentialFuture' ... done [18:41:18.023] Created future: [18:41:18.024] SequentialFuture: [18:41:18.024] Label: 'future_lapply-4' [18:41:18.024] Expression: [18:41:18.024] { [18:41:18.024] do.call(function(...) { [18:41:18.024] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.024] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:18.024] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.024] on.exit(options(oopts), add = TRUE) [18:41:18.024] } [18:41:18.024] { [18:41:18.024] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:18.024] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.024] ...future.FUN(...future.X_jj, ...) [18:41:18.024] }) [18:41:18.024] } [18:41:18.024] }, args = future.call.arguments) [18:41:18.024] } [18:41:18.024] Lazy evaluation: FALSE [18:41:18.024] Asynchronous evaluation: FALSE [18:41:18.024] Local evaluation: TRUE [18:41:18.024] Environment: R_GlobalEnv [18:41:18.024] Capture standard output: TRUE [18:41:18.024] Capture condition classes: 'condition' (excluding 'nothing') [18:41:18.024] Globals: 5 objects totaling 755 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 93 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:18.024] Packages: [18:41:18.024] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:18.024] Resolved: TRUE [18:41:18.024] Value: 47 bytes of class 'list' [18:41:18.024] Early signaling: FALSE [18:41:18.024] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:18.024] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:18.025] Chunk #4 of 4 ... DONE [18:41:18.025] Launching 4 futures (chunks) ... DONE [18:41:18.025] Resolving 4 futures (chunks) ... [18:41:18.025] resolve() on list ... [18:41:18.025] recursive: 0 [18:41:18.026] length: 4 [18:41:18.026] [18:41:18.026] resolved() for 'SequentialFuture' ... [18:41:18.026] - state: 'finished' [18:41:18.026] - run: TRUE [18:41:18.026] - result: 'FutureResult' [18:41:18.027] resolved() for 'SequentialFuture' ... done [18:41:18.027] Future #1 [18:41:18.027] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:18.027] - nx: 4 [18:41:18.027] - relay: TRUE [18:41:18.027] - stdout: TRUE [18:41:18.028] - signal: TRUE [18:41:18.028] - resignal: FALSE [18:41:18.028] - force: TRUE [18:41:18.028] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [18:41:18.028] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:41:18.028] - until=1 [18:41:18.028] - relaying element #1 [18:41:18.029] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:18.029] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:18.029] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:18.029] length: 3 (resolved future 1) [18:41:18.029] resolved() for 'SequentialFuture' ... [18:41:18.030] - state: 'finished' [18:41:18.030] - run: TRUE [18:41:18.030] - result: 'FutureResult' [18:41:18.030] resolved() for 'SequentialFuture' ... done [18:41:18.030] Future #2 [18:41:18.031] signalConditionsASAP(SequentialFuture, pos=2) ... [18:41:18.031] - nx: 4 [18:41:18.031] - relay: TRUE [18:41:18.031] - stdout: TRUE [18:41:18.031] - signal: TRUE [18:41:18.031] - resignal: FALSE [18:41:18.031] - force: TRUE [18:41:18.032] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:18.032] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:18.032] - until=2 [18:41:18.032] - relaying element #2 [18:41:18.032] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:18.033] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:18.033] signalConditionsASAP(SequentialFuture, pos=2) ... done [18:41:18.033] length: 2 (resolved future 2) [18:41:18.033] resolved() for 'SequentialFuture' ... [18:41:18.033] - state: 'finished' [18:41:18.033] - run: TRUE [18:41:18.034] - result: 'FutureResult' [18:41:18.034] resolved() for 'SequentialFuture' ... done [18:41:18.034] Future #3 [18:41:18.034] signalConditionsASAP(SequentialFuture, pos=3) ... [18:41:18.034] - nx: 4 [18:41:18.034] - relay: TRUE [18:41:18.035] - stdout: TRUE [18:41:18.035] - signal: TRUE [18:41:18.035] - resignal: FALSE [18:41:18.035] - force: TRUE [18:41:18.035] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:18.035] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:18.036] - until=3 [18:41:18.036] - relaying element #3 [18:41:18.036] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:18.036] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:18.036] signalConditionsASAP(SequentialFuture, pos=3) ... done [18:41:18.036] length: 1 (resolved future 3) [18:41:18.037] resolved() for 'SequentialFuture' ... [18:41:18.037] - state: 'finished' [18:41:18.037] - run: TRUE [18:41:18.037] - result: 'FutureResult' [18:41:18.037] resolved() for 'SequentialFuture' ... done [18:41:18.038] Future #4 [18:41:18.038] signalConditionsASAP(SequentialFuture, pos=4) ... [18:41:18.038] - nx: 4 [18:41:18.038] - relay: TRUE [18:41:18.038] - stdout: TRUE [18:41:18.038] - signal: TRUE [18:41:18.039] - resignal: FALSE [18:41:18.039] - force: TRUE [18:41:18.039] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:18.039] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:18.039] - until=4 [18:41:18.039] - relaying element #4 [18:41:18.040] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:18.040] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:18.040] signalConditionsASAP(SequentialFuture, pos=4) ... done [18:41:18.040] length: 0 (resolved future 4) [18:41:18.040] Relaying remaining futures [18:41:18.040] signalConditionsASAP(NULL, pos=0) ... [18:41:18.040] - nx: 4 [18:41:18.041] - relay: TRUE [18:41:18.041] - stdout: TRUE [18:41:18.041] - signal: TRUE [18:41:18.041] - resignal: FALSE [18:41:18.041] - force: TRUE [18:41:18.041] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:18.042] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [18:41:18.042] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:18.042] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:18.042] signalConditionsASAP(NULL, pos=0) ... done [18:41:18.042] resolve() on list ... DONE [18:41:18.043] - Number of value chunks collected: 4 [18:41:18.043] Resolving 4 futures (chunks) ... DONE [18:41:18.043] Reducing values from 4 chunks ... [18:41:18.043] - Number of values collected after concatenation: 4 [18:41:18.043] - Number of values expected: 4 [18:41:18.043] Reducing values from 4 chunks ... DONE [18:41:18.044] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL [18:41:18.046] future_lapply() ... [18:41:18.049] Number of chunks: 4 [18:41:18.049] getGlobalsAndPackagesXApply() ... [18:41:18.050] - future.globals: TRUE [18:41:18.050] getGlobalsAndPackages() ... [18:41:18.050] Searching for globals... [18:41:18.051] - globals found: [2] 'FUN', '.Internal' [18:41:18.051] Searching for globals ... DONE [18:41:18.052] Resolving globals: FALSE [18:41:18.052] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:18.052] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:18.053] - globals: [1] 'FUN' [18:41:18.053] [18:41:18.053] getGlobalsAndPackages() ... DONE [18:41:18.053] - globals found/used: [n=1] 'FUN' [18:41:18.053] - needed namespaces: [n=0] [18:41:18.053] Finding globals ... DONE [18:41:18.054] - use_args: TRUE [18:41:18.054] - Getting '...' globals ... [18:41:18.054] resolve() on list ... [18:41:18.054] recursive: 0 [18:41:18.055] length: 1 [18:41:18.055] elements: '...' [18:41:18.055] length: 0 (resolved future 1) [18:41:18.055] resolve() on list ... DONE [18:41:18.055] - '...' content: [n=1] 'length' [18:41:18.055] List of 1 [18:41:18.055] $ ...:List of 1 [18:41:18.055] ..$ length: int 2 [18:41:18.055] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:18.055] - attr(*, "where")=List of 1 [18:41:18.055] ..$ ...: [18:41:18.055] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:18.055] - attr(*, "resolved")= logi TRUE [18:41:18.055] - attr(*, "total_size")= num NA [18:41:18.059] - Getting '...' globals ... DONE [18:41:18.059] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:18.059] List of 2 [18:41:18.059] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:18.059] $ ... :List of 1 [18:41:18.059] ..$ length: int 2 [18:41:18.059] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:18.059] - attr(*, "where")=List of 2 [18:41:18.059] ..$ ...future.FUN: [18:41:18.059] ..$ ... : [18:41:18.059] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:18.059] - attr(*, "resolved")= logi FALSE [18:41:18.059] - attr(*, "total_size")= int 4324 [18:41:18.063] Packages to be attached in all futures: [n=0] [18:41:18.063] getGlobalsAndPackagesXApply() ... DONE [18:41:18.063] Number of futures (= number of chunks): 4 [18:41:18.063] Launching 4 futures (chunks) ... [18:41:18.064] Chunk #1 of 4 ... [18:41:18.064] - Finding globals in 'X' for chunk #1 ... [18:41:18.064] getGlobalsAndPackages() ... [18:41:18.064] Searching for globals... [18:41:18.064] [18:41:18.065] Searching for globals ... DONE [18:41:18.065] - globals: [0] [18:41:18.065] getGlobalsAndPackages() ... DONE [18:41:18.065] + additional globals found: [n=0] [18:41:18.065] + additional namespaces needed: [n=0] [18:41:18.065] - Finding globals in 'X' for chunk #1 ... DONE [18:41:18.066] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:18.068] - seeds: [18:41:18.068] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.068] getGlobalsAndPackages() ... [18:41:18.068] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.068] Resolving globals: FALSE [18:41:18.068] Tweak future expression to call with '...' arguments ... [18:41:18.069] { [18:41:18.069] do.call(function(...) { [18:41:18.069] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.069] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:18.069] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.069] on.exit(options(oopts), add = TRUE) [18:41:18.069] } [18:41:18.069] { [18:41:18.069] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:18.069] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.069] ...future.FUN(...future.X_jj, ...) [18:41:18.069] }) [18:41:18.069] } [18:41:18.069] }, args = future.call.arguments) [18:41:18.069] } [18:41:18.069] Tweak future expression to call with '...' arguments ... DONE [18:41:18.070] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.070] [18:41:18.070] getGlobalsAndPackages() ... DONE [18:41:18.070] run() for 'Future' ... [18:41:18.070] - state: 'created' [18:41:18.071] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:18.073] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:18.073] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:18.073] - Field: 'label' [18:41:18.074] - Field: 'local' [18:41:18.074] - Field: 'owner' [18:41:18.074] - Field: 'envir' [18:41:18.074] - Field: 'packages' [18:41:18.074] - Field: 'gc' [18:41:18.074] - Field: 'conditions' [18:41:18.075] - Field: 'expr' [18:41:18.075] - Field: 'uuid' [18:41:18.075] - Field: 'seed' [18:41:18.075] - Field: 'version' [18:41:18.075] - Field: 'result' [18:41:18.075] - Field: 'asynchronous' [18:41:18.076] - Field: 'calls' [18:41:18.076] - Field: 'globals' [18:41:18.076] - Field: 'stdout' [18:41:18.076] - Field: 'earlySignal' [18:41:18.076] - Field: 'lazy' [18:41:18.076] - Field: 'state' [18:41:18.077] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:18.077] - Launch lazy future ... [18:41:18.077] Packages needed by the future expression (n = 0): [18:41:18.077] Packages needed by future strategies (n = 0): [18:41:18.078] { [18:41:18.078] { [18:41:18.078] { [18:41:18.078] ...future.startTime <- base::Sys.time() [18:41:18.078] { [18:41:18.078] { [18:41:18.078] { [18:41:18.078] base::local({ [18:41:18.078] has_future <- base::requireNamespace("future", [18:41:18.078] quietly = TRUE) [18:41:18.078] if (has_future) { [18:41:18.078] ns <- base::getNamespace("future") [18:41:18.078] version <- ns[[".package"]][["version"]] [18:41:18.078] if (is.null(version)) [18:41:18.078] version <- utils::packageVersion("future") [18:41:18.078] } [18:41:18.078] else { [18:41:18.078] version <- NULL [18:41:18.078] } [18:41:18.078] if (!has_future || version < "1.8.0") { [18:41:18.078] info <- base::c(r_version = base::gsub("R version ", [18:41:18.078] "", base::R.version$version.string), [18:41:18.078] platform = base::sprintf("%s (%s-bit)", [18:41:18.078] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:18.078] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:18.078] "release", "version")], collapse = " "), [18:41:18.078] hostname = base::Sys.info()[["nodename"]]) [18:41:18.078] info <- base::sprintf("%s: %s", base::names(info), [18:41:18.078] info) [18:41:18.078] info <- base::paste(info, collapse = "; ") [18:41:18.078] if (!has_future) { [18:41:18.078] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:18.078] info) [18:41:18.078] } [18:41:18.078] else { [18:41:18.078] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:18.078] info, version) [18:41:18.078] } [18:41:18.078] base::stop(msg) [18:41:18.078] } [18:41:18.078] }) [18:41:18.078] } [18:41:18.078] ...future.strategy.old <- future::plan("list") [18:41:18.078] options(future.plan = NULL) [18:41:18.078] Sys.unsetenv("R_FUTURE_PLAN") [18:41:18.078] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:18.078] } [18:41:18.078] ...future.workdir <- getwd() [18:41:18.078] } [18:41:18.078] ...future.oldOptions <- base::as.list(base::.Options) [18:41:18.078] ...future.oldEnvVars <- base::Sys.getenv() [18:41:18.078] } [18:41:18.078] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:18.078] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:18.078] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:18.078] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:18.078] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:18.078] future.stdout.windows.reencode = NULL, width = 80L) [18:41:18.078] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:18.078] base::names(...future.oldOptions)) [18:41:18.078] } [18:41:18.078] if (FALSE) { [18:41:18.078] } [18:41:18.078] else { [18:41:18.078] if (TRUE) { [18:41:18.078] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:18.078] open = "w") [18:41:18.078] } [18:41:18.078] else { [18:41:18.078] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:18.078] windows = "NUL", "/dev/null"), open = "w") [18:41:18.078] } [18:41:18.078] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:18.078] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:18.078] base::sink(type = "output", split = FALSE) [18:41:18.078] base::close(...future.stdout) [18:41:18.078] }, add = TRUE) [18:41:18.078] } [18:41:18.078] ...future.frame <- base::sys.nframe() [18:41:18.078] ...future.conditions <- base::list() [18:41:18.078] ...future.rng <- base::globalenv()$.Random.seed [18:41:18.078] if (FALSE) { [18:41:18.078] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:18.078] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:18.078] } [18:41:18.078] ...future.result <- base::tryCatch({ [18:41:18.078] base::withCallingHandlers({ [18:41:18.078] ...future.value <- base::withVisible(base::local({ [18:41:18.078] do.call(function(...) { [18:41:18.078] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.078] if (!identical(...future.globals.maxSize.org, [18:41:18.078] ...future.globals.maxSize)) { [18:41:18.078] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.078] on.exit(options(oopts), add = TRUE) [18:41:18.078] } [18:41:18.078] { [18:41:18.078] lapply(seq_along(...future.elements_ii), [18:41:18.078] FUN = function(jj) { [18:41:18.078] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.078] ...future.FUN(...future.X_jj, ...) [18:41:18.078] }) [18:41:18.078] } [18:41:18.078] }, args = future.call.arguments) [18:41:18.078] })) [18:41:18.078] future::FutureResult(value = ...future.value$value, [18:41:18.078] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:18.078] ...future.rng), globalenv = if (FALSE) [18:41:18.078] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:18.078] ...future.globalenv.names)) [18:41:18.078] else NULL, started = ...future.startTime, version = "1.8") [18:41:18.078] }, condition = base::local({ [18:41:18.078] c <- base::c [18:41:18.078] inherits <- base::inherits [18:41:18.078] invokeRestart <- base::invokeRestart [18:41:18.078] length <- base::length [18:41:18.078] list <- base::list [18:41:18.078] seq.int <- base::seq.int [18:41:18.078] signalCondition <- base::signalCondition [18:41:18.078] sys.calls <- base::sys.calls [18:41:18.078] `[[` <- base::`[[` [18:41:18.078] `+` <- base::`+` [18:41:18.078] `<<-` <- base::`<<-` [18:41:18.078] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:18.078] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:18.078] 3L)] [18:41:18.078] } [18:41:18.078] function(cond) { [18:41:18.078] is_error <- inherits(cond, "error") [18:41:18.078] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:18.078] NULL) [18:41:18.078] if (is_error) { [18:41:18.078] sessionInformation <- function() { [18:41:18.078] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:18.078] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:18.078] search = base::search(), system = base::Sys.info()) [18:41:18.078] } [18:41:18.078] ...future.conditions[[length(...future.conditions) + [18:41:18.078] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:18.078] cond$call), session = sessionInformation(), [18:41:18.078] timestamp = base::Sys.time(), signaled = 0L) [18:41:18.078] signalCondition(cond) [18:41:18.078] } [18:41:18.078] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:18.078] "immediateCondition"))) { [18:41:18.078] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:18.078] ...future.conditions[[length(...future.conditions) + [18:41:18.078] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:18.078] if (TRUE && !signal) { [18:41:18.078] muffleCondition <- function (cond, pattern = "^muffle") [18:41:18.078] { [18:41:18.078] inherits <- base::inherits [18:41:18.078] invokeRestart <- base::invokeRestart [18:41:18.078] is.null <- base::is.null [18:41:18.078] muffled <- FALSE [18:41:18.078] if (inherits(cond, "message")) { [18:41:18.078] muffled <- grepl(pattern, "muffleMessage") [18:41:18.078] if (muffled) [18:41:18.078] invokeRestart("muffleMessage") [18:41:18.078] } [18:41:18.078] else if (inherits(cond, "warning")) { [18:41:18.078] muffled <- grepl(pattern, "muffleWarning") [18:41:18.078] if (muffled) [18:41:18.078] invokeRestart("muffleWarning") [18:41:18.078] } [18:41:18.078] else if (inherits(cond, "condition")) { [18:41:18.078] if (!is.null(pattern)) { [18:41:18.078] computeRestarts <- base::computeRestarts [18:41:18.078] grepl <- base::grepl [18:41:18.078] restarts <- computeRestarts(cond) [18:41:18.078] for (restart in restarts) { [18:41:18.078] name <- restart$name [18:41:18.078] if (is.null(name)) [18:41:18.078] next [18:41:18.078] if (!grepl(pattern, name)) [18:41:18.078] next [18:41:18.078] invokeRestart(restart) [18:41:18.078] muffled <- TRUE [18:41:18.078] break [18:41:18.078] } [18:41:18.078] } [18:41:18.078] } [18:41:18.078] invisible(muffled) [18:41:18.078] } [18:41:18.078] muffleCondition(cond, pattern = "^muffle") [18:41:18.078] } [18:41:18.078] } [18:41:18.078] else { [18:41:18.078] if (TRUE) { [18:41:18.078] muffleCondition <- function (cond, pattern = "^muffle") [18:41:18.078] { [18:41:18.078] inherits <- base::inherits [18:41:18.078] invokeRestart <- base::invokeRestart [18:41:18.078] is.null <- base::is.null [18:41:18.078] muffled <- FALSE [18:41:18.078] if (inherits(cond, "message")) { [18:41:18.078] muffled <- grepl(pattern, "muffleMessage") [18:41:18.078] if (muffled) [18:41:18.078] invokeRestart("muffleMessage") [18:41:18.078] } [18:41:18.078] else if (inherits(cond, "warning")) { [18:41:18.078] muffled <- grepl(pattern, "muffleWarning") [18:41:18.078] if (muffled) [18:41:18.078] invokeRestart("muffleWarning") [18:41:18.078] } [18:41:18.078] else if (inherits(cond, "condition")) { [18:41:18.078] if (!is.null(pattern)) { [18:41:18.078] computeRestarts <- base::computeRestarts [18:41:18.078] grepl <- base::grepl [18:41:18.078] restarts <- computeRestarts(cond) [18:41:18.078] for (restart in restarts) { [18:41:18.078] name <- restart$name [18:41:18.078] if (is.null(name)) [18:41:18.078] next [18:41:18.078] if (!grepl(pattern, name)) [18:41:18.078] next [18:41:18.078] invokeRestart(restart) [18:41:18.078] muffled <- TRUE [18:41:18.078] break [18:41:18.078] } [18:41:18.078] } [18:41:18.078] } [18:41:18.078] invisible(muffled) [18:41:18.078] } [18:41:18.078] muffleCondition(cond, pattern = "^muffle") [18:41:18.078] } [18:41:18.078] } [18:41:18.078] } [18:41:18.078] })) [18:41:18.078] }, error = function(ex) { [18:41:18.078] base::structure(base::list(value = NULL, visible = NULL, [18:41:18.078] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:18.078] ...future.rng), started = ...future.startTime, [18:41:18.078] finished = Sys.time(), session_uuid = NA_character_, [18:41:18.078] version = "1.8"), class = "FutureResult") [18:41:18.078] }, finally = { [18:41:18.078] if (!identical(...future.workdir, getwd())) [18:41:18.078] setwd(...future.workdir) [18:41:18.078] { [18:41:18.078] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:18.078] ...future.oldOptions$nwarnings <- NULL [18:41:18.078] } [18:41:18.078] base::options(...future.oldOptions) [18:41:18.078] if (.Platform$OS.type == "windows") { [18:41:18.078] old_names <- names(...future.oldEnvVars) [18:41:18.078] envs <- base::Sys.getenv() [18:41:18.078] names <- names(envs) [18:41:18.078] common <- intersect(names, old_names) [18:41:18.078] added <- setdiff(names, old_names) [18:41:18.078] removed <- setdiff(old_names, names) [18:41:18.078] changed <- common[...future.oldEnvVars[common] != [18:41:18.078] envs[common]] [18:41:18.078] NAMES <- toupper(changed) [18:41:18.078] args <- list() [18:41:18.078] for (kk in seq_along(NAMES)) { [18:41:18.078] name <- changed[[kk]] [18:41:18.078] NAME <- NAMES[[kk]] [18:41:18.078] if (name != NAME && is.element(NAME, old_names)) [18:41:18.078] next [18:41:18.078] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:18.078] } [18:41:18.078] NAMES <- toupper(added) [18:41:18.078] for (kk in seq_along(NAMES)) { [18:41:18.078] name <- added[[kk]] [18:41:18.078] NAME <- NAMES[[kk]] [18:41:18.078] if (name != NAME && is.element(NAME, old_names)) [18:41:18.078] next [18:41:18.078] args[[name]] <- "" [18:41:18.078] } [18:41:18.078] NAMES <- toupper(removed) [18:41:18.078] for (kk in seq_along(NAMES)) { [18:41:18.078] name <- removed[[kk]] [18:41:18.078] NAME <- NAMES[[kk]] [18:41:18.078] if (name != NAME && is.element(NAME, old_names)) [18:41:18.078] next [18:41:18.078] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:18.078] } [18:41:18.078] if (length(args) > 0) [18:41:18.078] base::do.call(base::Sys.setenv, args = args) [18:41:18.078] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:18.078] } [18:41:18.078] else { [18:41:18.078] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:18.078] } [18:41:18.078] { [18:41:18.078] if (base::length(...future.futureOptionsAdded) > [18:41:18.078] 0L) { [18:41:18.078] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:18.078] base::names(opts) <- ...future.futureOptionsAdded [18:41:18.078] base::options(opts) [18:41:18.078] } [18:41:18.078] { [18:41:18.078] { [18:41:18.078] NULL [18:41:18.078] RNGkind("Mersenne-Twister") [18:41:18.078] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:18.078] inherits = FALSE) [18:41:18.078] } [18:41:18.078] options(future.plan = NULL) [18:41:18.078] if (is.na(NA_character_)) [18:41:18.078] Sys.unsetenv("R_FUTURE_PLAN") [18:41:18.078] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:18.078] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:18.078] .init = FALSE) [18:41:18.078] } [18:41:18.078] } [18:41:18.078] } [18:41:18.078] }) [18:41:18.078] if (TRUE) { [18:41:18.078] base::sink(type = "output", split = FALSE) [18:41:18.078] if (TRUE) { [18:41:18.078] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:18.078] } [18:41:18.078] else { [18:41:18.078] ...future.result["stdout"] <- base::list(NULL) [18:41:18.078] } [18:41:18.078] base::close(...future.stdout) [18:41:18.078] ...future.stdout <- NULL [18:41:18.078] } [18:41:18.078] ...future.result$conditions <- ...future.conditions [18:41:18.078] ...future.result$finished <- base::Sys.time() [18:41:18.078] ...future.result [18:41:18.078] } [18:41:18.081] assign_globals() ... [18:41:18.082] List of 5 [18:41:18.082] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:18.082] $ future.call.arguments :List of 1 [18:41:18.082] ..$ length: int 2 [18:41:18.082] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:18.082] $ ...future.elements_ii :List of 1 [18:41:18.082] ..$ a: chr "integer" [18:41:18.082] $ ...future.seeds_ii : NULL [18:41:18.082] $ ...future.globals.maxSize: NULL [18:41:18.082] - attr(*, "where")=List of 5 [18:41:18.082] ..$ ...future.FUN : [18:41:18.082] ..$ future.call.arguments : [18:41:18.082] ..$ ...future.elements_ii : [18:41:18.082] ..$ ...future.seeds_ii : [18:41:18.082] ..$ ...future.globals.maxSize: [18:41:18.082] - attr(*, "resolved")= logi FALSE [18:41:18.082] - attr(*, "total_size")= num 4324 [18:41:18.082] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:18.082] - attr(*, "already-done")= logi TRUE [18:41:18.088] - copied '...future.FUN' to environment [18:41:18.088] - copied 'future.call.arguments' to environment [18:41:18.088] - copied '...future.elements_ii' to environment [18:41:18.088] - copied '...future.seeds_ii' to environment [18:41:18.088] - copied '...future.globals.maxSize' to environment [18:41:18.089] assign_globals() ... done [18:41:18.089] plan(): Setting new future strategy stack: [18:41:18.089] List of future strategies: [18:41:18.089] 1. sequential: [18:41:18.089] - args: function (..., envir = parent.frame(), workers = "") [18:41:18.089] - tweaked: FALSE [18:41:18.089] - call: NULL [18:41:18.090] plan(): nbrOfWorkers() = 1 [18:41:18.091] plan(): Setting new future strategy stack: [18:41:18.091] List of future strategies: [18:41:18.091] 1. multisession: [18:41:18.091] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:41:18.091] - tweaked: FALSE [18:41:18.091] - call: plan(strategy) [18:41:18.093] plan(): nbrOfWorkers() = 1 [18:41:18.094] SequentialFuture started (and completed) [18:41:18.094] - Launch lazy future ... done [18:41:18.094] run() for 'SequentialFuture' ... done [18:41:18.094] Created future: [18:41:18.094] SequentialFuture: [18:41:18.094] Label: 'future_lapply-1' [18:41:18.094] Expression: [18:41:18.094] { [18:41:18.094] do.call(function(...) { [18:41:18.094] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.094] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:18.094] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.094] on.exit(options(oopts), add = TRUE) [18:41:18.094] } [18:41:18.094] { [18:41:18.094] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:18.094] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.094] ...future.FUN(...future.X_jj, ...) [18:41:18.094] }) [18:41:18.094] } [18:41:18.094] }, args = future.call.arguments) [18:41:18.094] } [18:41:18.094] Lazy evaluation: FALSE [18:41:18.094] Asynchronous evaluation: FALSE [18:41:18.094] Local evaluation: TRUE [18:41:18.094] Environment: R_GlobalEnv [18:41:18.094] Capture standard output: TRUE [18:41:18.094] Capture condition classes: 'condition' (excluding 'nothing') [18:41:18.094] Globals: 5 objects totaling 758 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 96 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:18.094] Packages: [18:41:18.094] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:18.094] Resolved: TRUE [18:41:18.094] Value: 47 bytes of class 'list' [18:41:18.094] Early signaling: FALSE [18:41:18.094] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:18.094] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:18.096] Chunk #1 of 4 ... DONE [18:41:18.096] Chunk #2 of 4 ... [18:41:18.096] - Finding globals in 'X' for chunk #2 ... [18:41:18.096] getGlobalsAndPackages() ... [18:41:18.096] Searching for globals... [18:41:18.097] [18:41:18.097] Searching for globals ... DONE [18:41:18.097] - globals: [0] [18:41:18.097] getGlobalsAndPackages() ... DONE [18:41:18.097] + additional globals found: [n=0] [18:41:18.098] + additional namespaces needed: [n=0] [18:41:18.098] - Finding globals in 'X' for chunk #2 ... DONE [18:41:18.098] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:18.098] - seeds: [18:41:18.098] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.098] getGlobalsAndPackages() ... [18:41:18.098] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.099] Resolving globals: FALSE [18:41:18.099] Tweak future expression to call with '...' arguments ... [18:41:18.099] { [18:41:18.099] do.call(function(...) { [18:41:18.099] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.099] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:18.099] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.099] on.exit(options(oopts), add = TRUE) [18:41:18.099] } [18:41:18.099] { [18:41:18.099] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:18.099] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.099] ...future.FUN(...future.X_jj, ...) [18:41:18.099] }) [18:41:18.099] } [18:41:18.099] }, args = future.call.arguments) [18:41:18.099] } [18:41:18.099] Tweak future expression to call with '...' arguments ... DONE [18:41:18.100] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.100] [18:41:18.100] getGlobalsAndPackages() ... DONE [18:41:18.101] run() for 'Future' ... [18:41:18.101] - state: 'created' [18:41:18.101] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:18.103] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:18.104] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:18.104] - Field: 'label' [18:41:18.104] - Field: 'local' [18:41:18.104] - Field: 'owner' [18:41:18.104] - Field: 'envir' [18:41:18.104] - Field: 'packages' [18:41:18.105] - Field: 'gc' [18:41:18.105] - Field: 'conditions' [18:41:18.105] - Field: 'expr' [18:41:18.105] - Field: 'uuid' [18:41:18.105] - Field: 'seed' [18:41:18.105] - Field: 'version' [18:41:18.106] - Field: 'result' [18:41:18.106] - Field: 'asynchronous' [18:41:18.106] - Field: 'calls' [18:41:18.106] - Field: 'globals' [18:41:18.106] - Field: 'stdout' [18:41:18.107] - Field: 'earlySignal' [18:41:18.107] - Field: 'lazy' [18:41:18.107] - Field: 'state' [18:41:18.107] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:18.107] - Launch lazy future ... [18:41:18.107] Packages needed by the future expression (n = 0): [18:41:18.108] Packages needed by future strategies (n = 0): [18:41:18.108] { [18:41:18.108] { [18:41:18.108] { [18:41:18.108] ...future.startTime <- base::Sys.time() [18:41:18.108] { [18:41:18.108] { [18:41:18.108] { [18:41:18.108] base::local({ [18:41:18.108] has_future <- base::requireNamespace("future", [18:41:18.108] quietly = TRUE) [18:41:18.108] if (has_future) { [18:41:18.108] ns <- base::getNamespace("future") [18:41:18.108] version <- ns[[".package"]][["version"]] [18:41:18.108] if (is.null(version)) [18:41:18.108] version <- utils::packageVersion("future") [18:41:18.108] } [18:41:18.108] else { [18:41:18.108] version <- NULL [18:41:18.108] } [18:41:18.108] if (!has_future || version < "1.8.0") { [18:41:18.108] info <- base::c(r_version = base::gsub("R version ", [18:41:18.108] "", base::R.version$version.string), [18:41:18.108] platform = base::sprintf("%s (%s-bit)", [18:41:18.108] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:18.108] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:18.108] "release", "version")], collapse = " "), [18:41:18.108] hostname = base::Sys.info()[["nodename"]]) [18:41:18.108] info <- base::sprintf("%s: %s", base::names(info), [18:41:18.108] info) [18:41:18.108] info <- base::paste(info, collapse = "; ") [18:41:18.108] if (!has_future) { [18:41:18.108] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:18.108] info) [18:41:18.108] } [18:41:18.108] else { [18:41:18.108] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:18.108] info, version) [18:41:18.108] } [18:41:18.108] base::stop(msg) [18:41:18.108] } [18:41:18.108] }) [18:41:18.108] } [18:41:18.108] ...future.strategy.old <- future::plan("list") [18:41:18.108] options(future.plan = NULL) [18:41:18.108] Sys.unsetenv("R_FUTURE_PLAN") [18:41:18.108] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:18.108] } [18:41:18.108] ...future.workdir <- getwd() [18:41:18.108] } [18:41:18.108] ...future.oldOptions <- base::as.list(base::.Options) [18:41:18.108] ...future.oldEnvVars <- base::Sys.getenv() [18:41:18.108] } [18:41:18.108] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:18.108] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:18.108] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:18.108] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:18.108] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:18.108] future.stdout.windows.reencode = NULL, width = 80L) [18:41:18.108] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:18.108] base::names(...future.oldOptions)) [18:41:18.108] } [18:41:18.108] if (FALSE) { [18:41:18.108] } [18:41:18.108] else { [18:41:18.108] if (TRUE) { [18:41:18.108] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:18.108] open = "w") [18:41:18.108] } [18:41:18.108] else { [18:41:18.108] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:18.108] windows = "NUL", "/dev/null"), open = "w") [18:41:18.108] } [18:41:18.108] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:18.108] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:18.108] base::sink(type = "output", split = FALSE) [18:41:18.108] base::close(...future.stdout) [18:41:18.108] }, add = TRUE) [18:41:18.108] } [18:41:18.108] ...future.frame <- base::sys.nframe() [18:41:18.108] ...future.conditions <- base::list() [18:41:18.108] ...future.rng <- base::globalenv()$.Random.seed [18:41:18.108] if (FALSE) { [18:41:18.108] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:18.108] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:18.108] } [18:41:18.108] ...future.result <- base::tryCatch({ [18:41:18.108] base::withCallingHandlers({ [18:41:18.108] ...future.value <- base::withVisible(base::local({ [18:41:18.108] do.call(function(...) { [18:41:18.108] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.108] if (!identical(...future.globals.maxSize.org, [18:41:18.108] ...future.globals.maxSize)) { [18:41:18.108] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.108] on.exit(options(oopts), add = TRUE) [18:41:18.108] } [18:41:18.108] { [18:41:18.108] lapply(seq_along(...future.elements_ii), [18:41:18.108] FUN = function(jj) { [18:41:18.108] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.108] ...future.FUN(...future.X_jj, ...) [18:41:18.108] }) [18:41:18.108] } [18:41:18.108] }, args = future.call.arguments) [18:41:18.108] })) [18:41:18.108] future::FutureResult(value = ...future.value$value, [18:41:18.108] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:18.108] ...future.rng), globalenv = if (FALSE) [18:41:18.108] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:18.108] ...future.globalenv.names)) [18:41:18.108] else NULL, started = ...future.startTime, version = "1.8") [18:41:18.108] }, condition = base::local({ [18:41:18.108] c <- base::c [18:41:18.108] inherits <- base::inherits [18:41:18.108] invokeRestart <- base::invokeRestart [18:41:18.108] length <- base::length [18:41:18.108] list <- base::list [18:41:18.108] seq.int <- base::seq.int [18:41:18.108] signalCondition <- base::signalCondition [18:41:18.108] sys.calls <- base::sys.calls [18:41:18.108] `[[` <- base::`[[` [18:41:18.108] `+` <- base::`+` [18:41:18.108] `<<-` <- base::`<<-` [18:41:18.108] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:18.108] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:18.108] 3L)] [18:41:18.108] } [18:41:18.108] function(cond) { [18:41:18.108] is_error <- inherits(cond, "error") [18:41:18.108] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:18.108] NULL) [18:41:18.108] if (is_error) { [18:41:18.108] sessionInformation <- function() { [18:41:18.108] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:18.108] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:18.108] search = base::search(), system = base::Sys.info()) [18:41:18.108] } [18:41:18.108] ...future.conditions[[length(...future.conditions) + [18:41:18.108] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:18.108] cond$call), session = sessionInformation(), [18:41:18.108] timestamp = base::Sys.time(), signaled = 0L) [18:41:18.108] signalCondition(cond) [18:41:18.108] } [18:41:18.108] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:18.108] "immediateCondition"))) { [18:41:18.108] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:18.108] ...future.conditions[[length(...future.conditions) + [18:41:18.108] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:18.108] if (TRUE && !signal) { [18:41:18.108] muffleCondition <- function (cond, pattern = "^muffle") [18:41:18.108] { [18:41:18.108] inherits <- base::inherits [18:41:18.108] invokeRestart <- base::invokeRestart [18:41:18.108] is.null <- base::is.null [18:41:18.108] muffled <- FALSE [18:41:18.108] if (inherits(cond, "message")) { [18:41:18.108] muffled <- grepl(pattern, "muffleMessage") [18:41:18.108] if (muffled) [18:41:18.108] invokeRestart("muffleMessage") [18:41:18.108] } [18:41:18.108] else if (inherits(cond, "warning")) { [18:41:18.108] muffled <- grepl(pattern, "muffleWarning") [18:41:18.108] if (muffled) [18:41:18.108] invokeRestart("muffleWarning") [18:41:18.108] } [18:41:18.108] else if (inherits(cond, "condition")) { [18:41:18.108] if (!is.null(pattern)) { [18:41:18.108] computeRestarts <- base::computeRestarts [18:41:18.108] grepl <- base::grepl [18:41:18.108] restarts <- computeRestarts(cond) [18:41:18.108] for (restart in restarts) { [18:41:18.108] name <- restart$name [18:41:18.108] if (is.null(name)) [18:41:18.108] next [18:41:18.108] if (!grepl(pattern, name)) [18:41:18.108] next [18:41:18.108] invokeRestart(restart) [18:41:18.108] muffled <- TRUE [18:41:18.108] break [18:41:18.108] } [18:41:18.108] } [18:41:18.108] } [18:41:18.108] invisible(muffled) [18:41:18.108] } [18:41:18.108] muffleCondition(cond, pattern = "^muffle") [18:41:18.108] } [18:41:18.108] } [18:41:18.108] else { [18:41:18.108] if (TRUE) { [18:41:18.108] muffleCondition <- function (cond, pattern = "^muffle") [18:41:18.108] { [18:41:18.108] inherits <- base::inherits [18:41:18.108] invokeRestart <- base::invokeRestart [18:41:18.108] is.null <- base::is.null [18:41:18.108] muffled <- FALSE [18:41:18.108] if (inherits(cond, "message")) { [18:41:18.108] muffled <- grepl(pattern, "muffleMessage") [18:41:18.108] if (muffled) [18:41:18.108] invokeRestart("muffleMessage") [18:41:18.108] } [18:41:18.108] else if (inherits(cond, "warning")) { [18:41:18.108] muffled <- grepl(pattern, "muffleWarning") [18:41:18.108] if (muffled) [18:41:18.108] invokeRestart("muffleWarning") [18:41:18.108] } [18:41:18.108] else if (inherits(cond, "condition")) { [18:41:18.108] if (!is.null(pattern)) { [18:41:18.108] computeRestarts <- base::computeRestarts [18:41:18.108] grepl <- base::grepl [18:41:18.108] restarts <- computeRestarts(cond) [18:41:18.108] for (restart in restarts) { [18:41:18.108] name <- restart$name [18:41:18.108] if (is.null(name)) [18:41:18.108] next [18:41:18.108] if (!grepl(pattern, name)) [18:41:18.108] next [18:41:18.108] invokeRestart(restart) [18:41:18.108] muffled <- TRUE [18:41:18.108] break [18:41:18.108] } [18:41:18.108] } [18:41:18.108] } [18:41:18.108] invisible(muffled) [18:41:18.108] } [18:41:18.108] muffleCondition(cond, pattern = "^muffle") [18:41:18.108] } [18:41:18.108] } [18:41:18.108] } [18:41:18.108] })) [18:41:18.108] }, error = function(ex) { [18:41:18.108] base::structure(base::list(value = NULL, visible = NULL, [18:41:18.108] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:18.108] ...future.rng), started = ...future.startTime, [18:41:18.108] finished = Sys.time(), session_uuid = NA_character_, [18:41:18.108] version = "1.8"), class = "FutureResult") [18:41:18.108] }, finally = { [18:41:18.108] if (!identical(...future.workdir, getwd())) [18:41:18.108] setwd(...future.workdir) [18:41:18.108] { [18:41:18.108] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:18.108] ...future.oldOptions$nwarnings <- NULL [18:41:18.108] } [18:41:18.108] base::options(...future.oldOptions) [18:41:18.108] if (.Platform$OS.type == "windows") { [18:41:18.108] old_names <- names(...future.oldEnvVars) [18:41:18.108] envs <- base::Sys.getenv() [18:41:18.108] names <- names(envs) [18:41:18.108] common <- intersect(names, old_names) [18:41:18.108] added <- setdiff(names, old_names) [18:41:18.108] removed <- setdiff(old_names, names) [18:41:18.108] changed <- common[...future.oldEnvVars[common] != [18:41:18.108] envs[common]] [18:41:18.108] NAMES <- toupper(changed) [18:41:18.108] args <- list() [18:41:18.108] for (kk in seq_along(NAMES)) { [18:41:18.108] name <- changed[[kk]] [18:41:18.108] NAME <- NAMES[[kk]] [18:41:18.108] if (name != NAME && is.element(NAME, old_names)) [18:41:18.108] next [18:41:18.108] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:18.108] } [18:41:18.108] NAMES <- toupper(added) [18:41:18.108] for (kk in seq_along(NAMES)) { [18:41:18.108] name <- added[[kk]] [18:41:18.108] NAME <- NAMES[[kk]] [18:41:18.108] if (name != NAME && is.element(NAME, old_names)) [18:41:18.108] next [18:41:18.108] args[[name]] <- "" [18:41:18.108] } [18:41:18.108] NAMES <- toupper(removed) [18:41:18.108] for (kk in seq_along(NAMES)) { [18:41:18.108] name <- removed[[kk]] [18:41:18.108] NAME <- NAMES[[kk]] [18:41:18.108] if (name != NAME && is.element(NAME, old_names)) [18:41:18.108] next [18:41:18.108] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:18.108] } [18:41:18.108] if (length(args) > 0) [18:41:18.108] base::do.call(base::Sys.setenv, args = args) [18:41:18.108] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:18.108] } [18:41:18.108] else { [18:41:18.108] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:18.108] } [18:41:18.108] { [18:41:18.108] if (base::length(...future.futureOptionsAdded) > [18:41:18.108] 0L) { [18:41:18.108] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:18.108] base::names(opts) <- ...future.futureOptionsAdded [18:41:18.108] base::options(opts) [18:41:18.108] } [18:41:18.108] { [18:41:18.108] { [18:41:18.108] NULL [18:41:18.108] RNGkind("Mersenne-Twister") [18:41:18.108] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:18.108] inherits = FALSE) [18:41:18.108] } [18:41:18.108] options(future.plan = NULL) [18:41:18.108] if (is.na(NA_character_)) [18:41:18.108] Sys.unsetenv("R_FUTURE_PLAN") [18:41:18.108] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:18.108] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:18.108] .init = FALSE) [18:41:18.108] } [18:41:18.108] } [18:41:18.108] } [18:41:18.108] }) [18:41:18.108] if (TRUE) { [18:41:18.108] base::sink(type = "output", split = FALSE) [18:41:18.108] if (TRUE) { [18:41:18.108] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:18.108] } [18:41:18.108] else { [18:41:18.108] ...future.result["stdout"] <- base::list(NULL) [18:41:18.108] } [18:41:18.108] base::close(...future.stdout) [18:41:18.108] ...future.stdout <- NULL [18:41:18.108] } [18:41:18.108] ...future.result$conditions <- ...future.conditions [18:41:18.108] ...future.result$finished <- base::Sys.time() [18:41:18.108] ...future.result [18:41:18.108] } [18:41:18.112] assign_globals() ... [18:41:18.112] List of 5 [18:41:18.112] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:18.112] $ future.call.arguments :List of 1 [18:41:18.112] ..$ length: int 2 [18:41:18.112] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:18.112] $ ...future.elements_ii :List of 1 [18:41:18.112] ..$ b: chr "numeric" [18:41:18.112] $ ...future.seeds_ii : NULL [18:41:18.112] $ ...future.globals.maxSize: NULL [18:41:18.112] - attr(*, "where")=List of 5 [18:41:18.112] ..$ ...future.FUN : [18:41:18.112] ..$ future.call.arguments : [18:41:18.112] ..$ ...future.elements_ii : [18:41:18.112] ..$ ...future.seeds_ii : [18:41:18.112] ..$ ...future.globals.maxSize: [18:41:18.112] - attr(*, "resolved")= logi FALSE [18:41:18.112] - attr(*, "total_size")= num 4324 [18:41:18.112] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:18.112] - attr(*, "already-done")= logi TRUE [18:41:18.118] - copied '...future.FUN' to environment [18:41:18.118] - copied 'future.call.arguments' to environment [18:41:18.119] - copied '...future.elements_ii' to environment [18:41:18.119] - copied '...future.seeds_ii' to environment [18:41:18.119] - copied '...future.globals.maxSize' to environment [18:41:18.119] assign_globals() ... done [18:41:18.119] plan(): Setting new future strategy stack: [18:41:18.120] List of future strategies: [18:41:18.120] 1. sequential: [18:41:18.120] - args: function (..., envir = parent.frame(), workers = "") [18:41:18.120] - tweaked: FALSE [18:41:18.120] - call: NULL [18:41:18.120] plan(): nbrOfWorkers() = 1 [18:41:18.121] plan(): Setting new future strategy stack: [18:41:18.122] List of future strategies: [18:41:18.122] 1. multisession: [18:41:18.122] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:41:18.122] - tweaked: FALSE [18:41:18.122] - call: plan(strategy) [18:41:18.124] plan(): nbrOfWorkers() = 1 [18:41:18.124] SequentialFuture started (and completed) [18:41:18.124] - Launch lazy future ... done [18:41:18.125] run() for 'SequentialFuture' ... done [18:41:18.125] Created future: [18:41:18.125] SequentialFuture: [18:41:18.125] Label: 'future_lapply-2' [18:41:18.125] Expression: [18:41:18.125] { [18:41:18.125] do.call(function(...) { [18:41:18.125] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.125] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:18.125] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.125] on.exit(options(oopts), add = TRUE) [18:41:18.125] } [18:41:18.125] { [18:41:18.125] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:18.125] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.125] ...future.FUN(...future.X_jj, ...) [18:41:18.125] }) [18:41:18.125] } [18:41:18.125] }, args = future.call.arguments) [18:41:18.125] } [18:41:18.125] Lazy evaluation: FALSE [18:41:18.125] Asynchronous evaluation: FALSE [18:41:18.125] Local evaluation: TRUE [18:41:18.125] Environment: R_GlobalEnv [18:41:18.125] Capture standard output: TRUE [18:41:18.125] Capture condition classes: 'condition' (excluding 'nothing') [18:41:18.125] Globals: 5 objects totaling 758 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 96 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:18.125] Packages: [18:41:18.125] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:18.125] Resolved: TRUE [18:41:18.125] Value: 55 bytes of class 'list' [18:41:18.125] Early signaling: FALSE [18:41:18.125] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:18.125] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:18.126] Chunk #2 of 4 ... DONE [18:41:18.126] Chunk #3 of 4 ... [18:41:18.126] - Finding globals in 'X' for chunk #3 ... [18:41:18.127] getGlobalsAndPackages() ... [18:41:18.127] Searching for globals... [18:41:18.127] [18:41:18.127] Searching for globals ... DONE [18:41:18.127] - globals: [0] [18:41:18.128] getGlobalsAndPackages() ... DONE [18:41:18.128] + additional globals found: [n=0] [18:41:18.128] + additional namespaces needed: [n=0] [18:41:18.128] - Finding globals in 'X' for chunk #3 ... DONE [18:41:18.128] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:18.128] - seeds: [18:41:18.129] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.129] getGlobalsAndPackages() ... [18:41:18.129] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.129] Resolving globals: FALSE [18:41:18.129] Tweak future expression to call with '...' arguments ... [18:41:18.129] { [18:41:18.129] do.call(function(...) { [18:41:18.129] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.129] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:18.129] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.129] on.exit(options(oopts), add = TRUE) [18:41:18.129] } [18:41:18.129] { [18:41:18.129] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:18.129] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.129] ...future.FUN(...future.X_jj, ...) [18:41:18.129] }) [18:41:18.129] } [18:41:18.129] }, args = future.call.arguments) [18:41:18.129] } [18:41:18.130] Tweak future expression to call with '...' arguments ... DONE [18:41:18.130] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.130] [18:41:18.131] getGlobalsAndPackages() ... DONE [18:41:18.131] run() for 'Future' ... [18:41:18.131] - state: 'created' [18:41:18.131] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:18.134] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:18.134] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:18.134] - Field: 'label' [18:41:18.135] - Field: 'local' [18:41:18.135] - Field: 'owner' [18:41:18.135] - Field: 'envir' [18:41:18.135] - Field: 'packages' [18:41:18.135] - Field: 'gc' [18:41:18.135] - Field: 'conditions' [18:41:18.136] - Field: 'expr' [18:41:18.136] - Field: 'uuid' [18:41:18.136] - Field: 'seed' [18:41:18.136] - Field: 'version' [18:41:18.136] - Field: 'result' [18:41:18.136] - Field: 'asynchronous' [18:41:18.137] - Field: 'calls' [18:41:18.137] - Field: 'globals' [18:41:18.137] - Field: 'stdout' [18:41:18.137] - Field: 'earlySignal' [18:41:18.137] - Field: 'lazy' [18:41:18.138] - Field: 'state' [18:41:18.138] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:18.138] - Launch lazy future ... [18:41:18.138] Packages needed by the future expression (n = 0): [18:41:18.139] Packages needed by future strategies (n = 0): [18:41:18.139] { [18:41:18.139] { [18:41:18.139] { [18:41:18.139] ...future.startTime <- base::Sys.time() [18:41:18.139] { [18:41:18.139] { [18:41:18.139] { [18:41:18.139] base::local({ [18:41:18.139] has_future <- base::requireNamespace("future", [18:41:18.139] quietly = TRUE) [18:41:18.139] if (has_future) { [18:41:18.139] ns <- base::getNamespace("future") [18:41:18.139] version <- ns[[".package"]][["version"]] [18:41:18.139] if (is.null(version)) [18:41:18.139] version <- utils::packageVersion("future") [18:41:18.139] } [18:41:18.139] else { [18:41:18.139] version <- NULL [18:41:18.139] } [18:41:18.139] if (!has_future || version < "1.8.0") { [18:41:18.139] info <- base::c(r_version = base::gsub("R version ", [18:41:18.139] "", base::R.version$version.string), [18:41:18.139] platform = base::sprintf("%s (%s-bit)", [18:41:18.139] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:18.139] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:18.139] "release", "version")], collapse = " "), [18:41:18.139] hostname = base::Sys.info()[["nodename"]]) [18:41:18.139] info <- base::sprintf("%s: %s", base::names(info), [18:41:18.139] info) [18:41:18.139] info <- base::paste(info, collapse = "; ") [18:41:18.139] if (!has_future) { [18:41:18.139] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:18.139] info) [18:41:18.139] } [18:41:18.139] else { [18:41:18.139] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:18.139] info, version) [18:41:18.139] } [18:41:18.139] base::stop(msg) [18:41:18.139] } [18:41:18.139] }) [18:41:18.139] } [18:41:18.139] ...future.strategy.old <- future::plan("list") [18:41:18.139] options(future.plan = NULL) [18:41:18.139] Sys.unsetenv("R_FUTURE_PLAN") [18:41:18.139] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:18.139] } [18:41:18.139] ...future.workdir <- getwd() [18:41:18.139] } [18:41:18.139] ...future.oldOptions <- base::as.list(base::.Options) [18:41:18.139] ...future.oldEnvVars <- base::Sys.getenv() [18:41:18.139] } [18:41:18.139] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:18.139] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:18.139] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:18.139] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:18.139] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:18.139] future.stdout.windows.reencode = NULL, width = 80L) [18:41:18.139] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:18.139] base::names(...future.oldOptions)) [18:41:18.139] } [18:41:18.139] if (FALSE) { [18:41:18.139] } [18:41:18.139] else { [18:41:18.139] if (TRUE) { [18:41:18.139] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:18.139] open = "w") [18:41:18.139] } [18:41:18.139] else { [18:41:18.139] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:18.139] windows = "NUL", "/dev/null"), open = "w") [18:41:18.139] } [18:41:18.139] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:18.139] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:18.139] base::sink(type = "output", split = FALSE) [18:41:18.139] base::close(...future.stdout) [18:41:18.139] }, add = TRUE) [18:41:18.139] } [18:41:18.139] ...future.frame <- base::sys.nframe() [18:41:18.139] ...future.conditions <- base::list() [18:41:18.139] ...future.rng <- base::globalenv()$.Random.seed [18:41:18.139] if (FALSE) { [18:41:18.139] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:18.139] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:18.139] } [18:41:18.139] ...future.result <- base::tryCatch({ [18:41:18.139] base::withCallingHandlers({ [18:41:18.139] ...future.value <- base::withVisible(base::local({ [18:41:18.139] do.call(function(...) { [18:41:18.139] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.139] if (!identical(...future.globals.maxSize.org, [18:41:18.139] ...future.globals.maxSize)) { [18:41:18.139] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.139] on.exit(options(oopts), add = TRUE) [18:41:18.139] } [18:41:18.139] { [18:41:18.139] lapply(seq_along(...future.elements_ii), [18:41:18.139] FUN = function(jj) { [18:41:18.139] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.139] ...future.FUN(...future.X_jj, ...) [18:41:18.139] }) [18:41:18.139] } [18:41:18.139] }, args = future.call.arguments) [18:41:18.139] })) [18:41:18.139] future::FutureResult(value = ...future.value$value, [18:41:18.139] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:18.139] ...future.rng), globalenv = if (FALSE) [18:41:18.139] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:18.139] ...future.globalenv.names)) [18:41:18.139] else NULL, started = ...future.startTime, version = "1.8") [18:41:18.139] }, condition = base::local({ [18:41:18.139] c <- base::c [18:41:18.139] inherits <- base::inherits [18:41:18.139] invokeRestart <- base::invokeRestart [18:41:18.139] length <- base::length [18:41:18.139] list <- base::list [18:41:18.139] seq.int <- base::seq.int [18:41:18.139] signalCondition <- base::signalCondition [18:41:18.139] sys.calls <- base::sys.calls [18:41:18.139] `[[` <- base::`[[` [18:41:18.139] `+` <- base::`+` [18:41:18.139] `<<-` <- base::`<<-` [18:41:18.139] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:18.139] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:18.139] 3L)] [18:41:18.139] } [18:41:18.139] function(cond) { [18:41:18.139] is_error <- inherits(cond, "error") [18:41:18.139] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:18.139] NULL) [18:41:18.139] if (is_error) { [18:41:18.139] sessionInformation <- function() { [18:41:18.139] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:18.139] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:18.139] search = base::search(), system = base::Sys.info()) [18:41:18.139] } [18:41:18.139] ...future.conditions[[length(...future.conditions) + [18:41:18.139] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:18.139] cond$call), session = sessionInformation(), [18:41:18.139] timestamp = base::Sys.time(), signaled = 0L) [18:41:18.139] signalCondition(cond) [18:41:18.139] } [18:41:18.139] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:18.139] "immediateCondition"))) { [18:41:18.139] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:18.139] ...future.conditions[[length(...future.conditions) + [18:41:18.139] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:18.139] if (TRUE && !signal) { [18:41:18.139] muffleCondition <- function (cond, pattern = "^muffle") [18:41:18.139] { [18:41:18.139] inherits <- base::inherits [18:41:18.139] invokeRestart <- base::invokeRestart [18:41:18.139] is.null <- base::is.null [18:41:18.139] muffled <- FALSE [18:41:18.139] if (inherits(cond, "message")) { [18:41:18.139] muffled <- grepl(pattern, "muffleMessage") [18:41:18.139] if (muffled) [18:41:18.139] invokeRestart("muffleMessage") [18:41:18.139] } [18:41:18.139] else if (inherits(cond, "warning")) { [18:41:18.139] muffled <- grepl(pattern, "muffleWarning") [18:41:18.139] if (muffled) [18:41:18.139] invokeRestart("muffleWarning") [18:41:18.139] } [18:41:18.139] else if (inherits(cond, "condition")) { [18:41:18.139] if (!is.null(pattern)) { [18:41:18.139] computeRestarts <- base::computeRestarts [18:41:18.139] grepl <- base::grepl [18:41:18.139] restarts <- computeRestarts(cond) [18:41:18.139] for (restart in restarts) { [18:41:18.139] name <- restart$name [18:41:18.139] if (is.null(name)) [18:41:18.139] next [18:41:18.139] if (!grepl(pattern, name)) [18:41:18.139] next [18:41:18.139] invokeRestart(restart) [18:41:18.139] muffled <- TRUE [18:41:18.139] break [18:41:18.139] } [18:41:18.139] } [18:41:18.139] } [18:41:18.139] invisible(muffled) [18:41:18.139] } [18:41:18.139] muffleCondition(cond, pattern = "^muffle") [18:41:18.139] } [18:41:18.139] } [18:41:18.139] else { [18:41:18.139] if (TRUE) { [18:41:18.139] muffleCondition <- function (cond, pattern = "^muffle") [18:41:18.139] { [18:41:18.139] inherits <- base::inherits [18:41:18.139] invokeRestart <- base::invokeRestart [18:41:18.139] is.null <- base::is.null [18:41:18.139] muffled <- FALSE [18:41:18.139] if (inherits(cond, "message")) { [18:41:18.139] muffled <- grepl(pattern, "muffleMessage") [18:41:18.139] if (muffled) [18:41:18.139] invokeRestart("muffleMessage") [18:41:18.139] } [18:41:18.139] else if (inherits(cond, "warning")) { [18:41:18.139] muffled <- grepl(pattern, "muffleWarning") [18:41:18.139] if (muffled) [18:41:18.139] invokeRestart("muffleWarning") [18:41:18.139] } [18:41:18.139] else if (inherits(cond, "condition")) { [18:41:18.139] if (!is.null(pattern)) { [18:41:18.139] computeRestarts <- base::computeRestarts [18:41:18.139] grepl <- base::grepl [18:41:18.139] restarts <- computeRestarts(cond) [18:41:18.139] for (restart in restarts) { [18:41:18.139] name <- restart$name [18:41:18.139] if (is.null(name)) [18:41:18.139] next [18:41:18.139] if (!grepl(pattern, name)) [18:41:18.139] next [18:41:18.139] invokeRestart(restart) [18:41:18.139] muffled <- TRUE [18:41:18.139] break [18:41:18.139] } [18:41:18.139] } [18:41:18.139] } [18:41:18.139] invisible(muffled) [18:41:18.139] } [18:41:18.139] muffleCondition(cond, pattern = "^muffle") [18:41:18.139] } [18:41:18.139] } [18:41:18.139] } [18:41:18.139] })) [18:41:18.139] }, error = function(ex) { [18:41:18.139] base::structure(base::list(value = NULL, visible = NULL, [18:41:18.139] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:18.139] ...future.rng), started = ...future.startTime, [18:41:18.139] finished = Sys.time(), session_uuid = NA_character_, [18:41:18.139] version = "1.8"), class = "FutureResult") [18:41:18.139] }, finally = { [18:41:18.139] if (!identical(...future.workdir, getwd())) [18:41:18.139] setwd(...future.workdir) [18:41:18.139] { [18:41:18.139] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:18.139] ...future.oldOptions$nwarnings <- NULL [18:41:18.139] } [18:41:18.139] base::options(...future.oldOptions) [18:41:18.139] if (.Platform$OS.type == "windows") { [18:41:18.139] old_names <- names(...future.oldEnvVars) [18:41:18.139] envs <- base::Sys.getenv() [18:41:18.139] names <- names(envs) [18:41:18.139] common <- intersect(names, old_names) [18:41:18.139] added <- setdiff(names, old_names) [18:41:18.139] removed <- setdiff(old_names, names) [18:41:18.139] changed <- common[...future.oldEnvVars[common] != [18:41:18.139] envs[common]] [18:41:18.139] NAMES <- toupper(changed) [18:41:18.139] args <- list() [18:41:18.139] for (kk in seq_along(NAMES)) { [18:41:18.139] name <- changed[[kk]] [18:41:18.139] NAME <- NAMES[[kk]] [18:41:18.139] if (name != NAME && is.element(NAME, old_names)) [18:41:18.139] next [18:41:18.139] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:18.139] } [18:41:18.139] NAMES <- toupper(added) [18:41:18.139] for (kk in seq_along(NAMES)) { [18:41:18.139] name <- added[[kk]] [18:41:18.139] NAME <- NAMES[[kk]] [18:41:18.139] if (name != NAME && is.element(NAME, old_names)) [18:41:18.139] next [18:41:18.139] args[[name]] <- "" [18:41:18.139] } [18:41:18.139] NAMES <- toupper(removed) [18:41:18.139] for (kk in seq_along(NAMES)) { [18:41:18.139] name <- removed[[kk]] [18:41:18.139] NAME <- NAMES[[kk]] [18:41:18.139] if (name != NAME && is.element(NAME, old_names)) [18:41:18.139] next [18:41:18.139] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:18.139] } [18:41:18.139] if (length(args) > 0) [18:41:18.139] base::do.call(base::Sys.setenv, args = args) [18:41:18.139] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:18.139] } [18:41:18.139] else { [18:41:18.139] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:18.139] } [18:41:18.139] { [18:41:18.139] if (base::length(...future.futureOptionsAdded) > [18:41:18.139] 0L) { [18:41:18.139] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:18.139] base::names(opts) <- ...future.futureOptionsAdded [18:41:18.139] base::options(opts) [18:41:18.139] } [18:41:18.139] { [18:41:18.139] { [18:41:18.139] NULL [18:41:18.139] RNGkind("Mersenne-Twister") [18:41:18.139] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:18.139] inherits = FALSE) [18:41:18.139] } [18:41:18.139] options(future.plan = NULL) [18:41:18.139] if (is.na(NA_character_)) [18:41:18.139] Sys.unsetenv("R_FUTURE_PLAN") [18:41:18.139] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:18.139] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:18.139] .init = FALSE) [18:41:18.139] } [18:41:18.139] } [18:41:18.139] } [18:41:18.139] }) [18:41:18.139] if (TRUE) { [18:41:18.139] base::sink(type = "output", split = FALSE) [18:41:18.139] if (TRUE) { [18:41:18.139] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:18.139] } [18:41:18.139] else { [18:41:18.139] ...future.result["stdout"] <- base::list(NULL) [18:41:18.139] } [18:41:18.139] base::close(...future.stdout) [18:41:18.139] ...future.stdout <- NULL [18:41:18.139] } [18:41:18.139] ...future.result$conditions <- ...future.conditions [18:41:18.139] ...future.result$finished <- base::Sys.time() [18:41:18.139] ...future.result [18:41:18.139] } [18:41:18.143] assign_globals() ... [18:41:18.143] List of 5 [18:41:18.143] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:18.143] $ future.call.arguments :List of 1 [18:41:18.143] ..$ length: int 2 [18:41:18.143] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:18.143] $ ...future.elements_ii :List of 1 [18:41:18.143] ..$ c: chr "character" [18:41:18.143] $ ...future.seeds_ii : NULL [18:41:18.143] $ ...future.globals.maxSize: NULL [18:41:18.143] - attr(*, "where")=List of 5 [18:41:18.143] ..$ ...future.FUN : [18:41:18.143] ..$ future.call.arguments : [18:41:18.143] ..$ ...future.elements_ii : [18:41:18.143] ..$ ...future.seeds_ii : [18:41:18.143] ..$ ...future.globals.maxSize: [18:41:18.143] - attr(*, "resolved")= logi FALSE [18:41:18.143] - attr(*, "total_size")= num 4324 [18:41:18.143] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:18.143] - attr(*, "already-done")= logi TRUE [18:41:18.149] - copied '...future.FUN' to environment [18:41:18.149] - copied 'future.call.arguments' to environment [18:41:18.149] - copied '...future.elements_ii' to environment [18:41:18.150] - copied '...future.seeds_ii' to environment [18:41:18.150] - copied '...future.globals.maxSize' to environment [18:41:18.150] assign_globals() ... done [18:41:18.150] plan(): Setting new future strategy stack: [18:41:18.150] List of future strategies: [18:41:18.150] 1. sequential: [18:41:18.150] - args: function (..., envir = parent.frame(), workers = "") [18:41:18.150] - tweaked: FALSE [18:41:18.150] - call: NULL [18:41:18.151] plan(): nbrOfWorkers() = 1 [18:41:18.152] plan(): Setting new future strategy stack: [18:41:18.152] List of future strategies: [18:41:18.152] 1. multisession: [18:41:18.152] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:41:18.152] - tweaked: FALSE [18:41:18.152] - call: plan(strategy) [18:41:18.155] plan(): nbrOfWorkers() = 1 [18:41:18.155] SequentialFuture started (and completed) [18:41:18.155] - Launch lazy future ... done [18:41:18.156] run() for 'SequentialFuture' ... done [18:41:18.156] Created future: [18:41:18.156] SequentialFuture: [18:41:18.156] Label: 'future_lapply-3' [18:41:18.156] Expression: [18:41:18.156] { [18:41:18.156] do.call(function(...) { [18:41:18.156] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.156] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:18.156] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.156] on.exit(options(oopts), add = TRUE) [18:41:18.156] } [18:41:18.156] { [18:41:18.156] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:18.156] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.156] ...future.FUN(...future.X_jj, ...) [18:41:18.156] }) [18:41:18.156] } [18:41:18.156] }, args = future.call.arguments) [18:41:18.156] } [18:41:18.156] Lazy evaluation: FALSE [18:41:18.156] Asynchronous evaluation: FALSE [18:41:18.156] Local evaluation: TRUE [18:41:18.156] Environment: R_GlobalEnv [18:41:18.156] Capture standard output: TRUE [18:41:18.156] Capture condition classes: 'condition' (excluding 'nothing') [18:41:18.156] Globals: 5 objects totaling 760 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 98 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:18.156] Packages: [18:41:18.156] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:18.156] Resolved: TRUE [18:41:18.156] Value: 55 bytes of class 'list' [18:41:18.156] Early signaling: FALSE [18:41:18.156] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:18.156] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:18.157] Chunk #3 of 4 ... DONE [18:41:18.157] Chunk #4 of 4 ... [18:41:18.157] - Finding globals in 'X' for chunk #4 ... [18:41:18.158] getGlobalsAndPackages() ... [18:41:18.158] Searching for globals... [18:41:18.158] [18:41:18.158] Searching for globals ... DONE [18:41:18.158] - globals: [0] [18:41:18.158] getGlobalsAndPackages() ... DONE [18:41:18.159] + additional globals found: [n=0] [18:41:18.159] + additional namespaces needed: [n=0] [18:41:18.159] - Finding globals in 'X' for chunk #4 ... DONE [18:41:18.159] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:18.159] - seeds: [18:41:18.159] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.160] getGlobalsAndPackages() ... [18:41:18.160] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.160] Resolving globals: FALSE [18:41:18.160] Tweak future expression to call with '...' arguments ... [18:41:18.160] { [18:41:18.160] do.call(function(...) { [18:41:18.160] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.160] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:18.160] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.160] on.exit(options(oopts), add = TRUE) [18:41:18.160] } [18:41:18.160] { [18:41:18.160] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:18.160] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.160] ...future.FUN(...future.X_jj, ...) [18:41:18.160] }) [18:41:18.160] } [18:41:18.160] }, args = future.call.arguments) [18:41:18.160] } [18:41:18.161] Tweak future expression to call with '...' arguments ... DONE [18:41:18.161] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.161] [18:41:18.162] getGlobalsAndPackages() ... DONE [18:41:18.162] run() for 'Future' ... [18:41:18.162] - state: 'created' [18:41:18.162] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:18.165] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:18.165] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:18.165] - Field: 'label' [18:41:18.165] - Field: 'local' [18:41:18.165] - Field: 'owner' [18:41:18.166] - Field: 'envir' [18:41:18.166] - Field: 'packages' [18:41:18.166] - Field: 'gc' [18:41:18.166] - Field: 'conditions' [18:41:18.166] - Field: 'expr' [18:41:18.166] - Field: 'uuid' [18:41:18.167] - Field: 'seed' [18:41:18.167] - Field: 'version' [18:41:18.167] - Field: 'result' [18:41:18.167] - Field: 'asynchronous' [18:41:18.167] - Field: 'calls' [18:41:18.167] - Field: 'globals' [18:41:18.168] - Field: 'stdout' [18:41:18.168] - Field: 'earlySignal' [18:41:18.168] - Field: 'lazy' [18:41:18.168] - Field: 'state' [18:41:18.168] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:18.168] - Launch lazy future ... [18:41:18.169] Packages needed by the future expression (n = 0): [18:41:18.169] Packages needed by future strategies (n = 0): [18:41:18.169] { [18:41:18.169] { [18:41:18.169] { [18:41:18.169] ...future.startTime <- base::Sys.time() [18:41:18.169] { [18:41:18.169] { [18:41:18.169] { [18:41:18.169] base::local({ [18:41:18.169] has_future <- base::requireNamespace("future", [18:41:18.169] quietly = TRUE) [18:41:18.169] if (has_future) { [18:41:18.169] ns <- base::getNamespace("future") [18:41:18.169] version <- ns[[".package"]][["version"]] [18:41:18.169] if (is.null(version)) [18:41:18.169] version <- utils::packageVersion("future") [18:41:18.169] } [18:41:18.169] else { [18:41:18.169] version <- NULL [18:41:18.169] } [18:41:18.169] if (!has_future || version < "1.8.0") { [18:41:18.169] info <- base::c(r_version = base::gsub("R version ", [18:41:18.169] "", base::R.version$version.string), [18:41:18.169] platform = base::sprintf("%s (%s-bit)", [18:41:18.169] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:18.169] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:18.169] "release", "version")], collapse = " "), [18:41:18.169] hostname = base::Sys.info()[["nodename"]]) [18:41:18.169] info <- base::sprintf("%s: %s", base::names(info), [18:41:18.169] info) [18:41:18.169] info <- base::paste(info, collapse = "; ") [18:41:18.169] if (!has_future) { [18:41:18.169] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:18.169] info) [18:41:18.169] } [18:41:18.169] else { [18:41:18.169] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:18.169] info, version) [18:41:18.169] } [18:41:18.169] base::stop(msg) [18:41:18.169] } [18:41:18.169] }) [18:41:18.169] } [18:41:18.169] ...future.strategy.old <- future::plan("list") [18:41:18.169] options(future.plan = NULL) [18:41:18.169] Sys.unsetenv("R_FUTURE_PLAN") [18:41:18.169] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:18.169] } [18:41:18.169] ...future.workdir <- getwd() [18:41:18.169] } [18:41:18.169] ...future.oldOptions <- base::as.list(base::.Options) [18:41:18.169] ...future.oldEnvVars <- base::Sys.getenv() [18:41:18.169] } [18:41:18.169] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:18.169] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:18.169] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:18.169] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:18.169] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:18.169] future.stdout.windows.reencode = NULL, width = 80L) [18:41:18.169] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:18.169] base::names(...future.oldOptions)) [18:41:18.169] } [18:41:18.169] if (FALSE) { [18:41:18.169] } [18:41:18.169] else { [18:41:18.169] if (TRUE) { [18:41:18.169] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:18.169] open = "w") [18:41:18.169] } [18:41:18.169] else { [18:41:18.169] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:18.169] windows = "NUL", "/dev/null"), open = "w") [18:41:18.169] } [18:41:18.169] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:18.169] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:18.169] base::sink(type = "output", split = FALSE) [18:41:18.169] base::close(...future.stdout) [18:41:18.169] }, add = TRUE) [18:41:18.169] } [18:41:18.169] ...future.frame <- base::sys.nframe() [18:41:18.169] ...future.conditions <- base::list() [18:41:18.169] ...future.rng <- base::globalenv()$.Random.seed [18:41:18.169] if (FALSE) { [18:41:18.169] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:18.169] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:18.169] } [18:41:18.169] ...future.result <- base::tryCatch({ [18:41:18.169] base::withCallingHandlers({ [18:41:18.169] ...future.value <- base::withVisible(base::local({ [18:41:18.169] do.call(function(...) { [18:41:18.169] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.169] if (!identical(...future.globals.maxSize.org, [18:41:18.169] ...future.globals.maxSize)) { [18:41:18.169] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.169] on.exit(options(oopts), add = TRUE) [18:41:18.169] } [18:41:18.169] { [18:41:18.169] lapply(seq_along(...future.elements_ii), [18:41:18.169] FUN = function(jj) { [18:41:18.169] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.169] ...future.FUN(...future.X_jj, ...) [18:41:18.169] }) [18:41:18.169] } [18:41:18.169] }, args = future.call.arguments) [18:41:18.169] })) [18:41:18.169] future::FutureResult(value = ...future.value$value, [18:41:18.169] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:18.169] ...future.rng), globalenv = if (FALSE) [18:41:18.169] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:18.169] ...future.globalenv.names)) [18:41:18.169] else NULL, started = ...future.startTime, version = "1.8") [18:41:18.169] }, condition = base::local({ [18:41:18.169] c <- base::c [18:41:18.169] inherits <- base::inherits [18:41:18.169] invokeRestart <- base::invokeRestart [18:41:18.169] length <- base::length [18:41:18.169] list <- base::list [18:41:18.169] seq.int <- base::seq.int [18:41:18.169] signalCondition <- base::signalCondition [18:41:18.169] sys.calls <- base::sys.calls [18:41:18.169] `[[` <- base::`[[` [18:41:18.169] `+` <- base::`+` [18:41:18.169] `<<-` <- base::`<<-` [18:41:18.169] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:18.169] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:18.169] 3L)] [18:41:18.169] } [18:41:18.169] function(cond) { [18:41:18.169] is_error <- inherits(cond, "error") [18:41:18.169] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:18.169] NULL) [18:41:18.169] if (is_error) { [18:41:18.169] sessionInformation <- function() { [18:41:18.169] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:18.169] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:18.169] search = base::search(), system = base::Sys.info()) [18:41:18.169] } [18:41:18.169] ...future.conditions[[length(...future.conditions) + [18:41:18.169] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:18.169] cond$call), session = sessionInformation(), [18:41:18.169] timestamp = base::Sys.time(), signaled = 0L) [18:41:18.169] signalCondition(cond) [18:41:18.169] } [18:41:18.169] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:18.169] "immediateCondition"))) { [18:41:18.169] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:18.169] ...future.conditions[[length(...future.conditions) + [18:41:18.169] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:18.169] if (TRUE && !signal) { [18:41:18.169] muffleCondition <- function (cond, pattern = "^muffle") [18:41:18.169] { [18:41:18.169] inherits <- base::inherits [18:41:18.169] invokeRestart <- base::invokeRestart [18:41:18.169] is.null <- base::is.null [18:41:18.169] muffled <- FALSE [18:41:18.169] if (inherits(cond, "message")) { [18:41:18.169] muffled <- grepl(pattern, "muffleMessage") [18:41:18.169] if (muffled) [18:41:18.169] invokeRestart("muffleMessage") [18:41:18.169] } [18:41:18.169] else if (inherits(cond, "warning")) { [18:41:18.169] muffled <- grepl(pattern, "muffleWarning") [18:41:18.169] if (muffled) [18:41:18.169] invokeRestart("muffleWarning") [18:41:18.169] } [18:41:18.169] else if (inherits(cond, "condition")) { [18:41:18.169] if (!is.null(pattern)) { [18:41:18.169] computeRestarts <- base::computeRestarts [18:41:18.169] grepl <- base::grepl [18:41:18.169] restarts <- computeRestarts(cond) [18:41:18.169] for (restart in restarts) { [18:41:18.169] name <- restart$name [18:41:18.169] if (is.null(name)) [18:41:18.169] next [18:41:18.169] if (!grepl(pattern, name)) [18:41:18.169] next [18:41:18.169] invokeRestart(restart) [18:41:18.169] muffled <- TRUE [18:41:18.169] break [18:41:18.169] } [18:41:18.169] } [18:41:18.169] } [18:41:18.169] invisible(muffled) [18:41:18.169] } [18:41:18.169] muffleCondition(cond, pattern = "^muffle") [18:41:18.169] } [18:41:18.169] } [18:41:18.169] else { [18:41:18.169] if (TRUE) { [18:41:18.169] muffleCondition <- function (cond, pattern = "^muffle") [18:41:18.169] { [18:41:18.169] inherits <- base::inherits [18:41:18.169] invokeRestart <- base::invokeRestart [18:41:18.169] is.null <- base::is.null [18:41:18.169] muffled <- FALSE [18:41:18.169] if (inherits(cond, "message")) { [18:41:18.169] muffled <- grepl(pattern, "muffleMessage") [18:41:18.169] if (muffled) [18:41:18.169] invokeRestart("muffleMessage") [18:41:18.169] } [18:41:18.169] else if (inherits(cond, "warning")) { [18:41:18.169] muffled <- grepl(pattern, "muffleWarning") [18:41:18.169] if (muffled) [18:41:18.169] invokeRestart("muffleWarning") [18:41:18.169] } [18:41:18.169] else if (inherits(cond, "condition")) { [18:41:18.169] if (!is.null(pattern)) { [18:41:18.169] computeRestarts <- base::computeRestarts [18:41:18.169] grepl <- base::grepl [18:41:18.169] restarts <- computeRestarts(cond) [18:41:18.169] for (restart in restarts) { [18:41:18.169] name <- restart$name [18:41:18.169] if (is.null(name)) [18:41:18.169] next [18:41:18.169] if (!grepl(pattern, name)) [18:41:18.169] next [18:41:18.169] invokeRestart(restart) [18:41:18.169] muffled <- TRUE [18:41:18.169] break [18:41:18.169] } [18:41:18.169] } [18:41:18.169] } [18:41:18.169] invisible(muffled) [18:41:18.169] } [18:41:18.169] muffleCondition(cond, pattern = "^muffle") [18:41:18.169] } [18:41:18.169] } [18:41:18.169] } [18:41:18.169] })) [18:41:18.169] }, error = function(ex) { [18:41:18.169] base::structure(base::list(value = NULL, visible = NULL, [18:41:18.169] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:18.169] ...future.rng), started = ...future.startTime, [18:41:18.169] finished = Sys.time(), session_uuid = NA_character_, [18:41:18.169] version = "1.8"), class = "FutureResult") [18:41:18.169] }, finally = { [18:41:18.169] if (!identical(...future.workdir, getwd())) [18:41:18.169] setwd(...future.workdir) [18:41:18.169] { [18:41:18.169] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:18.169] ...future.oldOptions$nwarnings <- NULL [18:41:18.169] } [18:41:18.169] base::options(...future.oldOptions) [18:41:18.169] if (.Platform$OS.type == "windows") { [18:41:18.169] old_names <- names(...future.oldEnvVars) [18:41:18.169] envs <- base::Sys.getenv() [18:41:18.169] names <- names(envs) [18:41:18.169] common <- intersect(names, old_names) [18:41:18.169] added <- setdiff(names, old_names) [18:41:18.169] removed <- setdiff(old_names, names) [18:41:18.169] changed <- common[...future.oldEnvVars[common] != [18:41:18.169] envs[common]] [18:41:18.169] NAMES <- toupper(changed) [18:41:18.169] args <- list() [18:41:18.169] for (kk in seq_along(NAMES)) { [18:41:18.169] name <- changed[[kk]] [18:41:18.169] NAME <- NAMES[[kk]] [18:41:18.169] if (name != NAME && is.element(NAME, old_names)) [18:41:18.169] next [18:41:18.169] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:18.169] } [18:41:18.169] NAMES <- toupper(added) [18:41:18.169] for (kk in seq_along(NAMES)) { [18:41:18.169] name <- added[[kk]] [18:41:18.169] NAME <- NAMES[[kk]] [18:41:18.169] if (name != NAME && is.element(NAME, old_names)) [18:41:18.169] next [18:41:18.169] args[[name]] <- "" [18:41:18.169] } [18:41:18.169] NAMES <- toupper(removed) [18:41:18.169] for (kk in seq_along(NAMES)) { [18:41:18.169] name <- removed[[kk]] [18:41:18.169] NAME <- NAMES[[kk]] [18:41:18.169] if (name != NAME && is.element(NAME, old_names)) [18:41:18.169] next [18:41:18.169] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:18.169] } [18:41:18.169] if (length(args) > 0) [18:41:18.169] base::do.call(base::Sys.setenv, args = args) [18:41:18.169] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:18.169] } [18:41:18.169] else { [18:41:18.169] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:18.169] } [18:41:18.169] { [18:41:18.169] if (base::length(...future.futureOptionsAdded) > [18:41:18.169] 0L) { [18:41:18.169] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:18.169] base::names(opts) <- ...future.futureOptionsAdded [18:41:18.169] base::options(opts) [18:41:18.169] } [18:41:18.169] { [18:41:18.169] { [18:41:18.169] NULL [18:41:18.169] RNGkind("Mersenne-Twister") [18:41:18.169] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:18.169] inherits = FALSE) [18:41:18.169] } [18:41:18.169] options(future.plan = NULL) [18:41:18.169] if (is.na(NA_character_)) [18:41:18.169] Sys.unsetenv("R_FUTURE_PLAN") [18:41:18.169] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:18.169] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:18.169] .init = FALSE) [18:41:18.169] } [18:41:18.169] } [18:41:18.169] } [18:41:18.169] }) [18:41:18.169] if (TRUE) { [18:41:18.169] base::sink(type = "output", split = FALSE) [18:41:18.169] if (TRUE) { [18:41:18.169] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:18.169] } [18:41:18.169] else { [18:41:18.169] ...future.result["stdout"] <- base::list(NULL) [18:41:18.169] } [18:41:18.169] base::close(...future.stdout) [18:41:18.169] ...future.stdout <- NULL [18:41:18.169] } [18:41:18.169] ...future.result$conditions <- ...future.conditions [18:41:18.169] ...future.result$finished <- base::Sys.time() [18:41:18.169] ...future.result [18:41:18.169] } [18:41:18.173] assign_globals() ... [18:41:18.174] List of 5 [18:41:18.174] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:18.174] $ future.call.arguments :List of 1 [18:41:18.174] ..$ length: int 2 [18:41:18.174] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:18.174] $ ...future.elements_ii :List of 1 [18:41:18.174] ..$ c: chr "list" [18:41:18.174] $ ...future.seeds_ii : NULL [18:41:18.174] $ ...future.globals.maxSize: NULL [18:41:18.174] - attr(*, "where")=List of 5 [18:41:18.174] ..$ ...future.FUN : [18:41:18.174] ..$ future.call.arguments : [18:41:18.174] ..$ ...future.elements_ii : [18:41:18.174] ..$ ...future.seeds_ii : [18:41:18.174] ..$ ...future.globals.maxSize: [18:41:18.174] - attr(*, "resolved")= logi FALSE [18:41:18.174] - attr(*, "total_size")= num 4324 [18:41:18.174] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:18.174] - attr(*, "already-done")= logi TRUE [18:41:18.180] - copied '...future.FUN' to environment [18:41:18.180] - copied 'future.call.arguments' to environment [18:41:18.180] - copied '...future.elements_ii' to environment [18:41:18.180] - copied '...future.seeds_ii' to environment [18:41:18.180] - copied '...future.globals.maxSize' to environment [18:41:18.181] assign_globals() ... done [18:41:18.181] plan(): Setting new future strategy stack: [18:41:18.181] List of future strategies: [18:41:18.181] 1. sequential: [18:41:18.181] - args: function (..., envir = parent.frame(), workers = "") [18:41:18.181] - tweaked: FALSE [18:41:18.181] - call: NULL [18:41:18.182] plan(): nbrOfWorkers() = 1 [18:41:18.183] plan(): Setting new future strategy stack: [18:41:18.183] List of future strategies: [18:41:18.183] 1. multisession: [18:41:18.183] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:41:18.183] - tweaked: FALSE [18:41:18.183] - call: plan(strategy) [18:41:18.186] plan(): nbrOfWorkers() = 1 [18:41:18.188] SequentialFuture started (and completed) [18:41:18.188] - Launch lazy future ... done [18:41:18.188] run() for 'SequentialFuture' ... done [18:41:18.189] Created future: [18:41:18.189] SequentialFuture: [18:41:18.189] Label: 'future_lapply-4' [18:41:18.189] Expression: [18:41:18.189] { [18:41:18.189] do.call(function(...) { [18:41:18.189] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.189] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:18.189] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.189] on.exit(options(oopts), add = TRUE) [18:41:18.189] } [18:41:18.189] { [18:41:18.189] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:18.189] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.189] ...future.FUN(...future.X_jj, ...) [18:41:18.189] }) [18:41:18.189] } [18:41:18.189] }, args = future.call.arguments) [18:41:18.189] } [18:41:18.189] Lazy evaluation: FALSE [18:41:18.189] Asynchronous evaluation: FALSE [18:41:18.189] Local evaluation: TRUE [18:41:18.189] Environment: R_GlobalEnv [18:41:18.189] Capture standard output: TRUE [18:41:18.189] Capture condition classes: 'condition' (excluding 'nothing') [18:41:18.189] Globals: 5 objects totaling 755 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 93 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:18.189] Packages: [18:41:18.189] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:18.189] Resolved: TRUE [18:41:18.189] Value: 47 bytes of class 'list' [18:41:18.189] Early signaling: FALSE [18:41:18.189] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:18.189] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:18.190] Chunk #4 of 4 ... DONE [18:41:18.190] Launching 4 futures (chunks) ... DONE [18:41:18.190] Resolving 4 futures (chunks) ... [18:41:18.190] resolve() on list ... [18:41:18.191] recursive: 0 [18:41:18.191] length: 4 [18:41:18.191] [18:41:18.191] resolved() for 'SequentialFuture' ... [18:41:18.191] - state: 'finished' [18:41:18.191] - run: TRUE [18:41:18.192] - result: 'FutureResult' [18:41:18.192] resolved() for 'SequentialFuture' ... done [18:41:18.192] Future #1 [18:41:18.192] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:18.192] - nx: 4 [18:41:18.192] - relay: TRUE [18:41:18.193] - stdout: TRUE [18:41:18.193] - signal: TRUE [18:41:18.193] - resignal: FALSE [18:41:18.193] - force: TRUE [18:41:18.193] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [18:41:18.193] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:41:18.193] - until=1 [18:41:18.194] - relaying element #1 [18:41:18.194] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:18.194] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:18.194] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:18.194] length: 3 (resolved future 1) [18:41:18.195] resolved() for 'SequentialFuture' ... [18:41:18.195] - state: 'finished' [18:41:18.195] - run: TRUE [18:41:18.195] - result: 'FutureResult' [18:41:18.195] resolved() for 'SequentialFuture' ... done [18:41:18.195] Future #2 [18:41:18.196] signalConditionsASAP(SequentialFuture, pos=2) ... [18:41:18.196] - nx: 4 [18:41:18.196] - relay: TRUE [18:41:18.196] - stdout: TRUE [18:41:18.196] - signal: TRUE [18:41:18.196] - resignal: FALSE [18:41:18.197] - force: TRUE [18:41:18.197] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:18.197] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:18.197] - until=2 [18:41:18.197] - relaying element #2 [18:41:18.197] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:18.198] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:18.198] signalConditionsASAP(SequentialFuture, pos=2) ... done [18:41:18.198] length: 2 (resolved future 2) [18:41:18.198] resolved() for 'SequentialFuture' ... [18:41:18.198] - state: 'finished' [18:41:18.199] - run: TRUE [18:41:18.199] - result: 'FutureResult' [18:41:18.199] resolved() for 'SequentialFuture' ... done [18:41:18.199] Future #3 [18:41:18.199] signalConditionsASAP(SequentialFuture, pos=3) ... [18:41:18.199] - nx: 4 [18:41:18.200] - relay: TRUE [18:41:18.200] - stdout: TRUE [18:41:18.200] - signal: TRUE [18:41:18.200] - resignal: FALSE [18:41:18.200] - force: TRUE [18:41:18.200] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:18.200] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:18.201] - until=3 [18:41:18.201] - relaying element #3 [18:41:18.201] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:18.201] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:18.201] signalConditionsASAP(SequentialFuture, pos=3) ... done [18:41:18.202] length: 1 (resolved future 3) [18:41:18.202] resolved() for 'SequentialFuture' ... [18:41:18.202] - state: 'finished' [18:41:18.202] - run: TRUE [18:41:18.202] - result: 'FutureResult' [18:41:18.202] resolved() for 'SequentialFuture' ... done [18:41:18.203] Future #4 [18:41:18.203] signalConditionsASAP(SequentialFuture, pos=4) ... [18:41:18.203] - nx: 4 [18:41:18.203] - relay: TRUE [18:41:18.203] - stdout: TRUE [18:41:18.203] - signal: TRUE [18:41:18.204] - resignal: FALSE [18:41:18.204] - force: TRUE [18:41:18.204] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:18.204] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:18.204] - until=4 [18:41:18.204] - relaying element #4 [18:41:18.205] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:18.205] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:18.205] signalConditionsASAP(SequentialFuture, pos=4) ... done [18:41:18.205] length: 0 (resolved future 4) [18:41:18.205] Relaying remaining futures [18:41:18.205] signalConditionsASAP(NULL, pos=0) ... [18:41:18.206] - nx: 4 [18:41:18.206] - relay: TRUE [18:41:18.206] - stdout: TRUE [18:41:18.206] - signal: TRUE [18:41:18.206] - resignal: FALSE [18:41:18.206] - force: TRUE [18:41:18.206] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:18.207] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [18:41:18.207] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:18.207] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:18.207] signalConditionsASAP(NULL, pos=0) ... done [18:41:18.207] resolve() on list ... DONE [18:41:18.208] - Number of value chunks collected: 4 [18:41:18.208] Resolving 4 futures (chunks) ... DONE [18:41:18.208] Reducing values from 4 chunks ... [18:41:18.208] - Number of values collected after concatenation: 4 [18:41:18.208] - Number of values expected: 4 [18:41:18.208] Reducing values from 4 chunks ... DONE [18:41:18.209] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL - future_lapply(x, FUN = base::vector, ...) ... [18:41:18.211] future_lapply() ... [18:41:18.214] Number of chunks: 4 [18:41:18.214] getGlobalsAndPackagesXApply() ... [18:41:18.215] - future.globals: TRUE [18:41:18.215] getGlobalsAndPackages() ... [18:41:18.215] Searching for globals... [18:41:18.216] - globals found: [2] 'FUN', '.Internal' [18:41:18.216] Searching for globals ... DONE [18:41:18.217] Resolving globals: FALSE [18:41:18.217] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:18.218] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:18.218] - globals: [1] 'FUN' [18:41:18.218] [18:41:18.218] getGlobalsAndPackages() ... DONE [18:41:18.218] - globals found/used: [n=1] 'FUN' [18:41:18.218] - needed namespaces: [n=0] [18:41:18.219] Finding globals ... DONE [18:41:18.219] - use_args: TRUE [18:41:18.219] - Getting '...' globals ... [18:41:18.219] resolve() on list ... [18:41:18.219] recursive: 0 [18:41:18.220] length: 1 [18:41:18.220] elements: '...' [18:41:18.220] length: 0 (resolved future 1) [18:41:18.220] resolve() on list ... DONE [18:41:18.220] - '...' content: [n=1] 'length' [18:41:18.221] List of 1 [18:41:18.221] $ ...:List of 1 [18:41:18.221] ..$ length: int 2 [18:41:18.221] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:18.221] - attr(*, "where")=List of 1 [18:41:18.221] ..$ ...: [18:41:18.221] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:18.221] - attr(*, "resolved")= logi TRUE [18:41:18.221] - attr(*, "total_size")= num NA [18:41:18.224] - Getting '...' globals ... DONE [18:41:18.224] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:18.224] List of 2 [18:41:18.224] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:18.224] $ ... :List of 1 [18:41:18.224] ..$ length: int 2 [18:41:18.224] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:18.224] - attr(*, "where")=List of 2 [18:41:18.224] ..$ ...future.FUN: [18:41:18.224] ..$ ... : [18:41:18.224] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:18.224] - attr(*, "resolved")= logi FALSE [18:41:18.224] - attr(*, "total_size")= int 4406 [18:41:18.228] Packages to be attached in all futures: [n=0] [18:41:18.228] getGlobalsAndPackagesXApply() ... DONE [18:41:18.228] Number of futures (= number of chunks): 4 [18:41:18.229] Launching 4 futures (chunks) ... [18:41:18.229] Chunk #1 of 4 ... [18:41:18.229] - Finding globals in 'X' for chunk #1 ... [18:41:18.229] getGlobalsAndPackages() ... [18:41:18.229] Searching for globals... [18:41:18.230] [18:41:18.230] Searching for globals ... DONE [18:41:18.230] - globals: [0] [18:41:18.230] getGlobalsAndPackages() ... DONE [18:41:18.230] + additional globals found: [n=0] [18:41:18.230] + additional namespaces needed: [n=0] [18:41:18.231] - Finding globals in 'X' for chunk #1 ... DONE [18:41:18.231] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:18.231] - seeds: [18:41:18.231] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.231] getGlobalsAndPackages() ... [18:41:18.231] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.232] Resolving globals: FALSE [18:41:18.232] Tweak future expression to call with '...' arguments ... [18:41:18.232] { [18:41:18.232] do.call(function(...) { [18:41:18.232] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.232] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:18.232] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.232] on.exit(options(oopts), add = TRUE) [18:41:18.232] } [18:41:18.232] { [18:41:18.232] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:18.232] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.232] ...future.FUN(...future.X_jj, ...) [18:41:18.232] }) [18:41:18.232] } [18:41:18.232] }, args = future.call.arguments) [18:41:18.232] } [18:41:18.232] Tweak future expression to call with '...' arguments ... DONE [18:41:18.233] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.233] [18:41:18.233] getGlobalsAndPackages() ... DONE [18:41:18.234] run() for 'Future' ... [18:41:18.234] - state: 'created' [18:41:18.234] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:18.237] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:18.237] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:18.237] - Field: 'label' [18:41:18.237] - Field: 'local' [18:41:18.237] - Field: 'owner' [18:41:18.237] - Field: 'envir' [18:41:18.238] - Field: 'packages' [18:41:18.238] - Field: 'gc' [18:41:18.238] - Field: 'conditions' [18:41:18.238] - Field: 'expr' [18:41:18.238] - Field: 'uuid' [18:41:18.238] - Field: 'seed' [18:41:18.239] - Field: 'version' [18:41:18.239] - Field: 'result' [18:41:18.239] - Field: 'asynchronous' [18:41:18.239] - Field: 'calls' [18:41:18.239] - Field: 'globals' [18:41:18.240] - Field: 'stdout' [18:41:18.240] - Field: 'earlySignal' [18:41:18.240] - Field: 'lazy' [18:41:18.240] - Field: 'state' [18:41:18.240] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:18.240] - Launch lazy future ... [18:41:18.241] Packages needed by the future expression (n = 0): [18:41:18.241] Packages needed by future strategies (n = 0): [18:41:18.241] { [18:41:18.241] { [18:41:18.241] { [18:41:18.241] ...future.startTime <- base::Sys.time() [18:41:18.241] { [18:41:18.241] { [18:41:18.241] { [18:41:18.241] base::local({ [18:41:18.241] has_future <- base::requireNamespace("future", [18:41:18.241] quietly = TRUE) [18:41:18.241] if (has_future) { [18:41:18.241] ns <- base::getNamespace("future") [18:41:18.241] version <- ns[[".package"]][["version"]] [18:41:18.241] if (is.null(version)) [18:41:18.241] version <- utils::packageVersion("future") [18:41:18.241] } [18:41:18.241] else { [18:41:18.241] version <- NULL [18:41:18.241] } [18:41:18.241] if (!has_future || version < "1.8.0") { [18:41:18.241] info <- base::c(r_version = base::gsub("R version ", [18:41:18.241] "", base::R.version$version.string), [18:41:18.241] platform = base::sprintf("%s (%s-bit)", [18:41:18.241] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:18.241] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:18.241] "release", "version")], collapse = " "), [18:41:18.241] hostname = base::Sys.info()[["nodename"]]) [18:41:18.241] info <- base::sprintf("%s: %s", base::names(info), [18:41:18.241] info) [18:41:18.241] info <- base::paste(info, collapse = "; ") [18:41:18.241] if (!has_future) { [18:41:18.241] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:18.241] info) [18:41:18.241] } [18:41:18.241] else { [18:41:18.241] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:18.241] info, version) [18:41:18.241] } [18:41:18.241] base::stop(msg) [18:41:18.241] } [18:41:18.241] }) [18:41:18.241] } [18:41:18.241] ...future.strategy.old <- future::plan("list") [18:41:18.241] options(future.plan = NULL) [18:41:18.241] Sys.unsetenv("R_FUTURE_PLAN") [18:41:18.241] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:18.241] } [18:41:18.241] ...future.workdir <- getwd() [18:41:18.241] } [18:41:18.241] ...future.oldOptions <- base::as.list(base::.Options) [18:41:18.241] ...future.oldEnvVars <- base::Sys.getenv() [18:41:18.241] } [18:41:18.241] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:18.241] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:18.241] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:18.241] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:18.241] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:18.241] future.stdout.windows.reencode = NULL, width = 80L) [18:41:18.241] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:18.241] base::names(...future.oldOptions)) [18:41:18.241] } [18:41:18.241] if (FALSE) { [18:41:18.241] } [18:41:18.241] else { [18:41:18.241] if (TRUE) { [18:41:18.241] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:18.241] open = "w") [18:41:18.241] } [18:41:18.241] else { [18:41:18.241] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:18.241] windows = "NUL", "/dev/null"), open = "w") [18:41:18.241] } [18:41:18.241] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:18.241] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:18.241] base::sink(type = "output", split = FALSE) [18:41:18.241] base::close(...future.stdout) [18:41:18.241] }, add = TRUE) [18:41:18.241] } [18:41:18.241] ...future.frame <- base::sys.nframe() [18:41:18.241] ...future.conditions <- base::list() [18:41:18.241] ...future.rng <- base::globalenv()$.Random.seed [18:41:18.241] if (FALSE) { [18:41:18.241] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:18.241] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:18.241] } [18:41:18.241] ...future.result <- base::tryCatch({ [18:41:18.241] base::withCallingHandlers({ [18:41:18.241] ...future.value <- base::withVisible(base::local({ [18:41:18.241] do.call(function(...) { [18:41:18.241] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.241] if (!identical(...future.globals.maxSize.org, [18:41:18.241] ...future.globals.maxSize)) { [18:41:18.241] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.241] on.exit(options(oopts), add = TRUE) [18:41:18.241] } [18:41:18.241] { [18:41:18.241] lapply(seq_along(...future.elements_ii), [18:41:18.241] FUN = function(jj) { [18:41:18.241] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.241] ...future.FUN(...future.X_jj, ...) [18:41:18.241] }) [18:41:18.241] } [18:41:18.241] }, args = future.call.arguments) [18:41:18.241] })) [18:41:18.241] future::FutureResult(value = ...future.value$value, [18:41:18.241] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:18.241] ...future.rng), globalenv = if (FALSE) [18:41:18.241] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:18.241] ...future.globalenv.names)) [18:41:18.241] else NULL, started = ...future.startTime, version = "1.8") [18:41:18.241] }, condition = base::local({ [18:41:18.241] c <- base::c [18:41:18.241] inherits <- base::inherits [18:41:18.241] invokeRestart <- base::invokeRestart [18:41:18.241] length <- base::length [18:41:18.241] list <- base::list [18:41:18.241] seq.int <- base::seq.int [18:41:18.241] signalCondition <- base::signalCondition [18:41:18.241] sys.calls <- base::sys.calls [18:41:18.241] `[[` <- base::`[[` [18:41:18.241] `+` <- base::`+` [18:41:18.241] `<<-` <- base::`<<-` [18:41:18.241] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:18.241] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:18.241] 3L)] [18:41:18.241] } [18:41:18.241] function(cond) { [18:41:18.241] is_error <- inherits(cond, "error") [18:41:18.241] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:18.241] NULL) [18:41:18.241] if (is_error) { [18:41:18.241] sessionInformation <- function() { [18:41:18.241] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:18.241] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:18.241] search = base::search(), system = base::Sys.info()) [18:41:18.241] } [18:41:18.241] ...future.conditions[[length(...future.conditions) + [18:41:18.241] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:18.241] cond$call), session = sessionInformation(), [18:41:18.241] timestamp = base::Sys.time(), signaled = 0L) [18:41:18.241] signalCondition(cond) [18:41:18.241] } [18:41:18.241] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:18.241] "immediateCondition"))) { [18:41:18.241] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:18.241] ...future.conditions[[length(...future.conditions) + [18:41:18.241] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:18.241] if (TRUE && !signal) { [18:41:18.241] muffleCondition <- function (cond, pattern = "^muffle") [18:41:18.241] { [18:41:18.241] inherits <- base::inherits [18:41:18.241] invokeRestart <- base::invokeRestart [18:41:18.241] is.null <- base::is.null [18:41:18.241] muffled <- FALSE [18:41:18.241] if (inherits(cond, "message")) { [18:41:18.241] muffled <- grepl(pattern, "muffleMessage") [18:41:18.241] if (muffled) [18:41:18.241] invokeRestart("muffleMessage") [18:41:18.241] } [18:41:18.241] else if (inherits(cond, "warning")) { [18:41:18.241] muffled <- grepl(pattern, "muffleWarning") [18:41:18.241] if (muffled) [18:41:18.241] invokeRestart("muffleWarning") [18:41:18.241] } [18:41:18.241] else if (inherits(cond, "condition")) { [18:41:18.241] if (!is.null(pattern)) { [18:41:18.241] computeRestarts <- base::computeRestarts [18:41:18.241] grepl <- base::grepl [18:41:18.241] restarts <- computeRestarts(cond) [18:41:18.241] for (restart in restarts) { [18:41:18.241] name <- restart$name [18:41:18.241] if (is.null(name)) [18:41:18.241] next [18:41:18.241] if (!grepl(pattern, name)) [18:41:18.241] next [18:41:18.241] invokeRestart(restart) [18:41:18.241] muffled <- TRUE [18:41:18.241] break [18:41:18.241] } [18:41:18.241] } [18:41:18.241] } [18:41:18.241] invisible(muffled) [18:41:18.241] } [18:41:18.241] muffleCondition(cond, pattern = "^muffle") [18:41:18.241] } [18:41:18.241] } [18:41:18.241] else { [18:41:18.241] if (TRUE) { [18:41:18.241] muffleCondition <- function (cond, pattern = "^muffle") [18:41:18.241] { [18:41:18.241] inherits <- base::inherits [18:41:18.241] invokeRestart <- base::invokeRestart [18:41:18.241] is.null <- base::is.null [18:41:18.241] muffled <- FALSE [18:41:18.241] if (inherits(cond, "message")) { [18:41:18.241] muffled <- grepl(pattern, "muffleMessage") [18:41:18.241] if (muffled) [18:41:18.241] invokeRestart("muffleMessage") [18:41:18.241] } [18:41:18.241] else if (inherits(cond, "warning")) { [18:41:18.241] muffled <- grepl(pattern, "muffleWarning") [18:41:18.241] if (muffled) [18:41:18.241] invokeRestart("muffleWarning") [18:41:18.241] } [18:41:18.241] else if (inherits(cond, "condition")) { [18:41:18.241] if (!is.null(pattern)) { [18:41:18.241] computeRestarts <- base::computeRestarts [18:41:18.241] grepl <- base::grepl [18:41:18.241] restarts <- computeRestarts(cond) [18:41:18.241] for (restart in restarts) { [18:41:18.241] name <- restart$name [18:41:18.241] if (is.null(name)) [18:41:18.241] next [18:41:18.241] if (!grepl(pattern, name)) [18:41:18.241] next [18:41:18.241] invokeRestart(restart) [18:41:18.241] muffled <- TRUE [18:41:18.241] break [18:41:18.241] } [18:41:18.241] } [18:41:18.241] } [18:41:18.241] invisible(muffled) [18:41:18.241] } [18:41:18.241] muffleCondition(cond, pattern = "^muffle") [18:41:18.241] } [18:41:18.241] } [18:41:18.241] } [18:41:18.241] })) [18:41:18.241] }, error = function(ex) { [18:41:18.241] base::structure(base::list(value = NULL, visible = NULL, [18:41:18.241] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:18.241] ...future.rng), started = ...future.startTime, [18:41:18.241] finished = Sys.time(), session_uuid = NA_character_, [18:41:18.241] version = "1.8"), class = "FutureResult") [18:41:18.241] }, finally = { [18:41:18.241] if (!identical(...future.workdir, getwd())) [18:41:18.241] setwd(...future.workdir) [18:41:18.241] { [18:41:18.241] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:18.241] ...future.oldOptions$nwarnings <- NULL [18:41:18.241] } [18:41:18.241] base::options(...future.oldOptions) [18:41:18.241] if (.Platform$OS.type == "windows") { [18:41:18.241] old_names <- names(...future.oldEnvVars) [18:41:18.241] envs <- base::Sys.getenv() [18:41:18.241] names <- names(envs) [18:41:18.241] common <- intersect(names, old_names) [18:41:18.241] added <- setdiff(names, old_names) [18:41:18.241] removed <- setdiff(old_names, names) [18:41:18.241] changed <- common[...future.oldEnvVars[common] != [18:41:18.241] envs[common]] [18:41:18.241] NAMES <- toupper(changed) [18:41:18.241] args <- list() [18:41:18.241] for (kk in seq_along(NAMES)) { [18:41:18.241] name <- changed[[kk]] [18:41:18.241] NAME <- NAMES[[kk]] [18:41:18.241] if (name != NAME && is.element(NAME, old_names)) [18:41:18.241] next [18:41:18.241] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:18.241] } [18:41:18.241] NAMES <- toupper(added) [18:41:18.241] for (kk in seq_along(NAMES)) { [18:41:18.241] name <- added[[kk]] [18:41:18.241] NAME <- NAMES[[kk]] [18:41:18.241] if (name != NAME && is.element(NAME, old_names)) [18:41:18.241] next [18:41:18.241] args[[name]] <- "" [18:41:18.241] } [18:41:18.241] NAMES <- toupper(removed) [18:41:18.241] for (kk in seq_along(NAMES)) { [18:41:18.241] name <- removed[[kk]] [18:41:18.241] NAME <- NAMES[[kk]] [18:41:18.241] if (name != NAME && is.element(NAME, old_names)) [18:41:18.241] next [18:41:18.241] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:18.241] } [18:41:18.241] if (length(args) > 0) [18:41:18.241] base::do.call(base::Sys.setenv, args = args) [18:41:18.241] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:18.241] } [18:41:18.241] else { [18:41:18.241] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:18.241] } [18:41:18.241] { [18:41:18.241] if (base::length(...future.futureOptionsAdded) > [18:41:18.241] 0L) { [18:41:18.241] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:18.241] base::names(opts) <- ...future.futureOptionsAdded [18:41:18.241] base::options(opts) [18:41:18.241] } [18:41:18.241] { [18:41:18.241] { [18:41:18.241] NULL [18:41:18.241] RNGkind("Mersenne-Twister") [18:41:18.241] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:18.241] inherits = FALSE) [18:41:18.241] } [18:41:18.241] options(future.plan = NULL) [18:41:18.241] if (is.na(NA_character_)) [18:41:18.241] Sys.unsetenv("R_FUTURE_PLAN") [18:41:18.241] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:18.241] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:18.241] .init = FALSE) [18:41:18.241] } [18:41:18.241] } [18:41:18.241] } [18:41:18.241] }) [18:41:18.241] if (TRUE) { [18:41:18.241] base::sink(type = "output", split = FALSE) [18:41:18.241] if (TRUE) { [18:41:18.241] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:18.241] } [18:41:18.241] else { [18:41:18.241] ...future.result["stdout"] <- base::list(NULL) [18:41:18.241] } [18:41:18.241] base::close(...future.stdout) [18:41:18.241] ...future.stdout <- NULL [18:41:18.241] } [18:41:18.241] ...future.result$conditions <- ...future.conditions [18:41:18.241] ...future.result$finished <- base::Sys.time() [18:41:18.241] ...future.result [18:41:18.241] } [18:41:18.245] assign_globals() ... [18:41:18.245] List of 5 [18:41:18.245] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:18.245] $ future.call.arguments :List of 1 [18:41:18.245] ..$ length: int 2 [18:41:18.245] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:18.245] $ ...future.elements_ii :List of 1 [18:41:18.245] ..$ a: chr "integer" [18:41:18.245] $ ...future.seeds_ii : NULL [18:41:18.245] $ ...future.globals.maxSize: NULL [18:41:18.245] - attr(*, "where")=List of 5 [18:41:18.245] ..$ ...future.FUN : [18:41:18.245] ..$ future.call.arguments : [18:41:18.245] ..$ ...future.elements_ii : [18:41:18.245] ..$ ...future.seeds_ii : [18:41:18.245] ..$ ...future.globals.maxSize: [18:41:18.245] - attr(*, "resolved")= logi FALSE [18:41:18.245] - attr(*, "total_size")= num 4406 [18:41:18.245] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:18.245] - attr(*, "already-done")= logi TRUE [18:41:18.251] - copied '...future.FUN' to environment [18:41:18.252] - copied 'future.call.arguments' to environment [18:41:18.252] - copied '...future.elements_ii' to environment [18:41:18.252] - copied '...future.seeds_ii' to environment [18:41:18.252] - copied '...future.globals.maxSize' to environment [18:41:18.252] assign_globals() ... done [18:41:18.253] plan(): Setting new future strategy stack: [18:41:18.253] List of future strategies: [18:41:18.253] 1. sequential: [18:41:18.253] - args: function (..., envir = parent.frame(), workers = "") [18:41:18.253] - tweaked: FALSE [18:41:18.253] - call: NULL [18:41:18.253] plan(): nbrOfWorkers() = 1 [18:41:18.255] plan(): Setting new future strategy stack: [18:41:18.255] List of future strategies: [18:41:18.255] 1. multisession: [18:41:18.255] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:41:18.255] - tweaked: FALSE [18:41:18.255] - call: plan(strategy) [18:41:18.257] plan(): nbrOfWorkers() = 1 [18:41:18.257] SequentialFuture started (and completed) [18:41:18.258] - Launch lazy future ... done [18:41:18.258] run() for 'SequentialFuture' ... done [18:41:18.258] Created future: [18:41:18.258] SequentialFuture: [18:41:18.258] Label: 'future_lapply-1' [18:41:18.258] Expression: [18:41:18.258] { [18:41:18.258] do.call(function(...) { [18:41:18.258] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.258] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:18.258] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.258] on.exit(options(oopts), add = TRUE) [18:41:18.258] } [18:41:18.258] { [18:41:18.258] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:18.258] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.258] ...future.FUN(...future.X_jj, ...) [18:41:18.258] }) [18:41:18.258] } [18:41:18.258] }, args = future.call.arguments) [18:41:18.258] } [18:41:18.258] Lazy evaluation: FALSE [18:41:18.258] Asynchronous evaluation: FALSE [18:41:18.258] Local evaluation: TRUE [18:41:18.258] Environment: R_GlobalEnv [18:41:18.258] Capture standard output: TRUE [18:41:18.258] Capture condition classes: 'condition' (excluding 'nothing') [18:41:18.258] Globals: 5 objects totaling 758 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 96 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:18.258] Packages: [18:41:18.258] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:18.258] Resolved: TRUE [18:41:18.258] Value: 47 bytes of class 'list' [18:41:18.258] Early signaling: FALSE [18:41:18.258] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:18.258] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:18.259] Chunk #1 of 4 ... DONE [18:41:18.259] Chunk #2 of 4 ... [18:41:18.260] - Finding globals in 'X' for chunk #2 ... [18:41:18.260] getGlobalsAndPackages() ... [18:41:18.260] Searching for globals... [18:41:18.260] [18:41:18.260] Searching for globals ... DONE [18:41:18.261] - globals: [0] [18:41:18.261] getGlobalsAndPackages() ... DONE [18:41:18.261] + additional globals found: [n=0] [18:41:18.261] + additional namespaces needed: [n=0] [18:41:18.261] - Finding globals in 'X' for chunk #2 ... DONE [18:41:18.261] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:18.261] - seeds: [18:41:18.262] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.262] getGlobalsAndPackages() ... [18:41:18.262] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.262] Resolving globals: FALSE [18:41:18.262] Tweak future expression to call with '...' arguments ... [18:41:18.262] { [18:41:18.262] do.call(function(...) { [18:41:18.262] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.262] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:18.262] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.262] on.exit(options(oopts), add = TRUE) [18:41:18.262] } [18:41:18.262] { [18:41:18.262] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:18.262] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.262] ...future.FUN(...future.X_jj, ...) [18:41:18.262] }) [18:41:18.262] } [18:41:18.262] }, args = future.call.arguments) [18:41:18.262] } [18:41:18.263] Tweak future expression to call with '...' arguments ... DONE [18:41:18.263] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.264] [18:41:18.264] getGlobalsAndPackages() ... DONE [18:41:18.264] run() for 'Future' ... [18:41:18.264] - state: 'created' [18:41:18.264] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:18.267] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:18.267] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:18.267] - Field: 'label' [18:41:18.267] - Field: 'local' [18:41:18.267] - Field: 'owner' [18:41:18.268] - Field: 'envir' [18:41:18.268] - Field: 'packages' [18:41:18.268] - Field: 'gc' [18:41:18.268] - Field: 'conditions' [18:41:18.268] - Field: 'expr' [18:41:18.269] - Field: 'uuid' [18:41:18.269] - Field: 'seed' [18:41:18.269] - Field: 'version' [18:41:18.269] - Field: 'result' [18:41:18.269] - Field: 'asynchronous' [18:41:18.269] - Field: 'calls' [18:41:18.270] - Field: 'globals' [18:41:18.270] - Field: 'stdout' [18:41:18.270] - Field: 'earlySignal' [18:41:18.270] - Field: 'lazy' [18:41:18.270] - Field: 'state' [18:41:18.270] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:18.271] - Launch lazy future ... [18:41:18.271] Packages needed by the future expression (n = 0): [18:41:18.271] Packages needed by future strategies (n = 0): [18:41:18.272] { [18:41:18.272] { [18:41:18.272] { [18:41:18.272] ...future.startTime <- base::Sys.time() [18:41:18.272] { [18:41:18.272] { [18:41:18.272] { [18:41:18.272] base::local({ [18:41:18.272] has_future <- base::requireNamespace("future", [18:41:18.272] quietly = TRUE) [18:41:18.272] if (has_future) { [18:41:18.272] ns <- base::getNamespace("future") [18:41:18.272] version <- ns[[".package"]][["version"]] [18:41:18.272] if (is.null(version)) [18:41:18.272] version <- utils::packageVersion("future") [18:41:18.272] } [18:41:18.272] else { [18:41:18.272] version <- NULL [18:41:18.272] } [18:41:18.272] if (!has_future || version < "1.8.0") { [18:41:18.272] info <- base::c(r_version = base::gsub("R version ", [18:41:18.272] "", base::R.version$version.string), [18:41:18.272] platform = base::sprintf("%s (%s-bit)", [18:41:18.272] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:18.272] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:18.272] "release", "version")], collapse = " "), [18:41:18.272] hostname = base::Sys.info()[["nodename"]]) [18:41:18.272] info <- base::sprintf("%s: %s", base::names(info), [18:41:18.272] info) [18:41:18.272] info <- base::paste(info, collapse = "; ") [18:41:18.272] if (!has_future) { [18:41:18.272] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:18.272] info) [18:41:18.272] } [18:41:18.272] else { [18:41:18.272] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:18.272] info, version) [18:41:18.272] } [18:41:18.272] base::stop(msg) [18:41:18.272] } [18:41:18.272] }) [18:41:18.272] } [18:41:18.272] ...future.strategy.old <- future::plan("list") [18:41:18.272] options(future.plan = NULL) [18:41:18.272] Sys.unsetenv("R_FUTURE_PLAN") [18:41:18.272] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:18.272] } [18:41:18.272] ...future.workdir <- getwd() [18:41:18.272] } [18:41:18.272] ...future.oldOptions <- base::as.list(base::.Options) [18:41:18.272] ...future.oldEnvVars <- base::Sys.getenv() [18:41:18.272] } [18:41:18.272] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:18.272] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:18.272] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:18.272] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:18.272] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:18.272] future.stdout.windows.reencode = NULL, width = 80L) [18:41:18.272] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:18.272] base::names(...future.oldOptions)) [18:41:18.272] } [18:41:18.272] if (FALSE) { [18:41:18.272] } [18:41:18.272] else { [18:41:18.272] if (TRUE) { [18:41:18.272] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:18.272] open = "w") [18:41:18.272] } [18:41:18.272] else { [18:41:18.272] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:18.272] windows = "NUL", "/dev/null"), open = "w") [18:41:18.272] } [18:41:18.272] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:18.272] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:18.272] base::sink(type = "output", split = FALSE) [18:41:18.272] base::close(...future.stdout) [18:41:18.272] }, add = TRUE) [18:41:18.272] } [18:41:18.272] ...future.frame <- base::sys.nframe() [18:41:18.272] ...future.conditions <- base::list() [18:41:18.272] ...future.rng <- base::globalenv()$.Random.seed [18:41:18.272] if (FALSE) { [18:41:18.272] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:18.272] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:18.272] } [18:41:18.272] ...future.result <- base::tryCatch({ [18:41:18.272] base::withCallingHandlers({ [18:41:18.272] ...future.value <- base::withVisible(base::local({ [18:41:18.272] do.call(function(...) { [18:41:18.272] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.272] if (!identical(...future.globals.maxSize.org, [18:41:18.272] ...future.globals.maxSize)) { [18:41:18.272] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.272] on.exit(options(oopts), add = TRUE) [18:41:18.272] } [18:41:18.272] { [18:41:18.272] lapply(seq_along(...future.elements_ii), [18:41:18.272] FUN = function(jj) { [18:41:18.272] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.272] ...future.FUN(...future.X_jj, ...) [18:41:18.272] }) [18:41:18.272] } [18:41:18.272] }, args = future.call.arguments) [18:41:18.272] })) [18:41:18.272] future::FutureResult(value = ...future.value$value, [18:41:18.272] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:18.272] ...future.rng), globalenv = if (FALSE) [18:41:18.272] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:18.272] ...future.globalenv.names)) [18:41:18.272] else NULL, started = ...future.startTime, version = "1.8") [18:41:18.272] }, condition = base::local({ [18:41:18.272] c <- base::c [18:41:18.272] inherits <- base::inherits [18:41:18.272] invokeRestart <- base::invokeRestart [18:41:18.272] length <- base::length [18:41:18.272] list <- base::list [18:41:18.272] seq.int <- base::seq.int [18:41:18.272] signalCondition <- base::signalCondition [18:41:18.272] sys.calls <- base::sys.calls [18:41:18.272] `[[` <- base::`[[` [18:41:18.272] `+` <- base::`+` [18:41:18.272] `<<-` <- base::`<<-` [18:41:18.272] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:18.272] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:18.272] 3L)] [18:41:18.272] } [18:41:18.272] function(cond) { [18:41:18.272] is_error <- inherits(cond, "error") [18:41:18.272] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:18.272] NULL) [18:41:18.272] if (is_error) { [18:41:18.272] sessionInformation <- function() { [18:41:18.272] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:18.272] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:18.272] search = base::search(), system = base::Sys.info()) [18:41:18.272] } [18:41:18.272] ...future.conditions[[length(...future.conditions) + [18:41:18.272] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:18.272] cond$call), session = sessionInformation(), [18:41:18.272] timestamp = base::Sys.time(), signaled = 0L) [18:41:18.272] signalCondition(cond) [18:41:18.272] } [18:41:18.272] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:18.272] "immediateCondition"))) { [18:41:18.272] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:18.272] ...future.conditions[[length(...future.conditions) + [18:41:18.272] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:18.272] if (TRUE && !signal) { [18:41:18.272] muffleCondition <- function (cond, pattern = "^muffle") [18:41:18.272] { [18:41:18.272] inherits <- base::inherits [18:41:18.272] invokeRestart <- base::invokeRestart [18:41:18.272] is.null <- base::is.null [18:41:18.272] muffled <- FALSE [18:41:18.272] if (inherits(cond, "message")) { [18:41:18.272] muffled <- grepl(pattern, "muffleMessage") [18:41:18.272] if (muffled) [18:41:18.272] invokeRestart("muffleMessage") [18:41:18.272] } [18:41:18.272] else if (inherits(cond, "warning")) { [18:41:18.272] muffled <- grepl(pattern, "muffleWarning") [18:41:18.272] if (muffled) [18:41:18.272] invokeRestart("muffleWarning") [18:41:18.272] } [18:41:18.272] else if (inherits(cond, "condition")) { [18:41:18.272] if (!is.null(pattern)) { [18:41:18.272] computeRestarts <- base::computeRestarts [18:41:18.272] grepl <- base::grepl [18:41:18.272] restarts <- computeRestarts(cond) [18:41:18.272] for (restart in restarts) { [18:41:18.272] name <- restart$name [18:41:18.272] if (is.null(name)) [18:41:18.272] next [18:41:18.272] if (!grepl(pattern, name)) [18:41:18.272] next [18:41:18.272] invokeRestart(restart) [18:41:18.272] muffled <- TRUE [18:41:18.272] break [18:41:18.272] } [18:41:18.272] } [18:41:18.272] } [18:41:18.272] invisible(muffled) [18:41:18.272] } [18:41:18.272] muffleCondition(cond, pattern = "^muffle") [18:41:18.272] } [18:41:18.272] } [18:41:18.272] else { [18:41:18.272] if (TRUE) { [18:41:18.272] muffleCondition <- function (cond, pattern = "^muffle") [18:41:18.272] { [18:41:18.272] inherits <- base::inherits [18:41:18.272] invokeRestart <- base::invokeRestart [18:41:18.272] is.null <- base::is.null [18:41:18.272] muffled <- FALSE [18:41:18.272] if (inherits(cond, "message")) { [18:41:18.272] muffled <- grepl(pattern, "muffleMessage") [18:41:18.272] if (muffled) [18:41:18.272] invokeRestart("muffleMessage") [18:41:18.272] } [18:41:18.272] else if (inherits(cond, "warning")) { [18:41:18.272] muffled <- grepl(pattern, "muffleWarning") [18:41:18.272] if (muffled) [18:41:18.272] invokeRestart("muffleWarning") [18:41:18.272] } [18:41:18.272] else if (inherits(cond, "condition")) { [18:41:18.272] if (!is.null(pattern)) { [18:41:18.272] computeRestarts <- base::computeRestarts [18:41:18.272] grepl <- base::grepl [18:41:18.272] restarts <- computeRestarts(cond) [18:41:18.272] for (restart in restarts) { [18:41:18.272] name <- restart$name [18:41:18.272] if (is.null(name)) [18:41:18.272] next [18:41:18.272] if (!grepl(pattern, name)) [18:41:18.272] next [18:41:18.272] invokeRestart(restart) [18:41:18.272] muffled <- TRUE [18:41:18.272] break [18:41:18.272] } [18:41:18.272] } [18:41:18.272] } [18:41:18.272] invisible(muffled) [18:41:18.272] } [18:41:18.272] muffleCondition(cond, pattern = "^muffle") [18:41:18.272] } [18:41:18.272] } [18:41:18.272] } [18:41:18.272] })) [18:41:18.272] }, error = function(ex) { [18:41:18.272] base::structure(base::list(value = NULL, visible = NULL, [18:41:18.272] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:18.272] ...future.rng), started = ...future.startTime, [18:41:18.272] finished = Sys.time(), session_uuid = NA_character_, [18:41:18.272] version = "1.8"), class = "FutureResult") [18:41:18.272] }, finally = { [18:41:18.272] if (!identical(...future.workdir, getwd())) [18:41:18.272] setwd(...future.workdir) [18:41:18.272] { [18:41:18.272] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:18.272] ...future.oldOptions$nwarnings <- NULL [18:41:18.272] } [18:41:18.272] base::options(...future.oldOptions) [18:41:18.272] if (.Platform$OS.type == "windows") { [18:41:18.272] old_names <- names(...future.oldEnvVars) [18:41:18.272] envs <- base::Sys.getenv() [18:41:18.272] names <- names(envs) [18:41:18.272] common <- intersect(names, old_names) [18:41:18.272] added <- setdiff(names, old_names) [18:41:18.272] removed <- setdiff(old_names, names) [18:41:18.272] changed <- common[...future.oldEnvVars[common] != [18:41:18.272] envs[common]] [18:41:18.272] NAMES <- toupper(changed) [18:41:18.272] args <- list() [18:41:18.272] for (kk in seq_along(NAMES)) { [18:41:18.272] name <- changed[[kk]] [18:41:18.272] NAME <- NAMES[[kk]] [18:41:18.272] if (name != NAME && is.element(NAME, old_names)) [18:41:18.272] next [18:41:18.272] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:18.272] } [18:41:18.272] NAMES <- toupper(added) [18:41:18.272] for (kk in seq_along(NAMES)) { [18:41:18.272] name <- added[[kk]] [18:41:18.272] NAME <- NAMES[[kk]] [18:41:18.272] if (name != NAME && is.element(NAME, old_names)) [18:41:18.272] next [18:41:18.272] args[[name]] <- "" [18:41:18.272] } [18:41:18.272] NAMES <- toupper(removed) [18:41:18.272] for (kk in seq_along(NAMES)) { [18:41:18.272] name <- removed[[kk]] [18:41:18.272] NAME <- NAMES[[kk]] [18:41:18.272] if (name != NAME && is.element(NAME, old_names)) [18:41:18.272] next [18:41:18.272] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:18.272] } [18:41:18.272] if (length(args) > 0) [18:41:18.272] base::do.call(base::Sys.setenv, args = args) [18:41:18.272] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:18.272] } [18:41:18.272] else { [18:41:18.272] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:18.272] } [18:41:18.272] { [18:41:18.272] if (base::length(...future.futureOptionsAdded) > [18:41:18.272] 0L) { [18:41:18.272] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:18.272] base::names(opts) <- ...future.futureOptionsAdded [18:41:18.272] base::options(opts) [18:41:18.272] } [18:41:18.272] { [18:41:18.272] { [18:41:18.272] NULL [18:41:18.272] RNGkind("Mersenne-Twister") [18:41:18.272] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:18.272] inherits = FALSE) [18:41:18.272] } [18:41:18.272] options(future.plan = NULL) [18:41:18.272] if (is.na(NA_character_)) [18:41:18.272] Sys.unsetenv("R_FUTURE_PLAN") [18:41:18.272] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:18.272] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:18.272] .init = FALSE) [18:41:18.272] } [18:41:18.272] } [18:41:18.272] } [18:41:18.272] }) [18:41:18.272] if (TRUE) { [18:41:18.272] base::sink(type = "output", split = FALSE) [18:41:18.272] if (TRUE) { [18:41:18.272] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:18.272] } [18:41:18.272] else { [18:41:18.272] ...future.result["stdout"] <- base::list(NULL) [18:41:18.272] } [18:41:18.272] base::close(...future.stdout) [18:41:18.272] ...future.stdout <- NULL [18:41:18.272] } [18:41:18.272] ...future.result$conditions <- ...future.conditions [18:41:18.272] ...future.result$finished <- base::Sys.time() [18:41:18.272] ...future.result [18:41:18.272] } [18:41:18.275] assign_globals() ... [18:41:18.276] List of 5 [18:41:18.276] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:18.276] $ future.call.arguments :List of 1 [18:41:18.276] ..$ length: int 2 [18:41:18.276] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:18.276] $ ...future.elements_ii :List of 1 [18:41:18.276] ..$ b: chr "numeric" [18:41:18.276] $ ...future.seeds_ii : NULL [18:41:18.276] $ ...future.globals.maxSize: NULL [18:41:18.276] - attr(*, "where")=List of 5 [18:41:18.276] ..$ ...future.FUN : [18:41:18.276] ..$ future.call.arguments : [18:41:18.276] ..$ ...future.elements_ii : [18:41:18.276] ..$ ...future.seeds_ii : [18:41:18.276] ..$ ...future.globals.maxSize: [18:41:18.276] - attr(*, "resolved")= logi FALSE [18:41:18.276] - attr(*, "total_size")= num 4406 [18:41:18.276] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:18.276] - attr(*, "already-done")= logi TRUE [18:41:18.282] - copied '...future.FUN' to environment [18:41:18.282] - copied 'future.call.arguments' to environment [18:41:18.282] - copied '...future.elements_ii' to environment [18:41:18.282] - copied '...future.seeds_ii' to environment [18:41:18.282] - copied '...future.globals.maxSize' to environment [18:41:18.282] assign_globals() ... done [18:41:18.283] plan(): Setting new future strategy stack: [18:41:18.283] List of future strategies: [18:41:18.283] 1. sequential: [18:41:18.283] - args: function (..., envir = parent.frame(), workers = "") [18:41:18.283] - tweaked: FALSE [18:41:18.283] - call: NULL [18:41:18.284] plan(): nbrOfWorkers() = 1 [18:41:18.285] plan(): Setting new future strategy stack: [18:41:18.285] List of future strategies: [18:41:18.285] 1. multisession: [18:41:18.285] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:41:18.285] - tweaked: FALSE [18:41:18.285] - call: plan(strategy) [18:41:18.287] plan(): nbrOfWorkers() = 1 [18:41:18.288] SequentialFuture started (and completed) [18:41:18.288] - Launch lazy future ... done [18:41:18.288] run() for 'SequentialFuture' ... done [18:41:18.288] Created future: [18:41:18.288] SequentialFuture: [18:41:18.288] Label: 'future_lapply-2' [18:41:18.288] Expression: [18:41:18.288] { [18:41:18.288] do.call(function(...) { [18:41:18.288] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.288] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:18.288] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.288] on.exit(options(oopts), add = TRUE) [18:41:18.288] } [18:41:18.288] { [18:41:18.288] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:18.288] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.288] ...future.FUN(...future.X_jj, ...) [18:41:18.288] }) [18:41:18.288] } [18:41:18.288] }, args = future.call.arguments) [18:41:18.288] } [18:41:18.288] Lazy evaluation: FALSE [18:41:18.288] Asynchronous evaluation: FALSE [18:41:18.288] Local evaluation: TRUE [18:41:18.288] Environment: R_GlobalEnv [18:41:18.288] Capture standard output: TRUE [18:41:18.288] Capture condition classes: 'condition' (excluding 'nothing') [18:41:18.288] Globals: 5 objects totaling 758 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 96 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:18.288] Packages: [18:41:18.288] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:18.288] Resolved: TRUE [18:41:18.288] Value: 55 bytes of class 'list' [18:41:18.288] Early signaling: FALSE [18:41:18.288] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:18.288] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:18.289] Chunk #2 of 4 ... DONE [18:41:18.290] Chunk #3 of 4 ... [18:41:18.290] - Finding globals in 'X' for chunk #3 ... [18:41:18.290] getGlobalsAndPackages() ... [18:41:18.290] Searching for globals... [18:41:18.290] [18:41:18.291] Searching for globals ... DONE [18:41:18.291] - globals: [0] [18:41:18.291] getGlobalsAndPackages() ... DONE [18:41:18.291] + additional globals found: [n=0] [18:41:18.291] + additional namespaces needed: [n=0] [18:41:18.291] - Finding globals in 'X' for chunk #3 ... DONE [18:41:18.292] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:18.292] - seeds: [18:41:18.292] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.292] getGlobalsAndPackages() ... [18:41:18.292] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.292] Resolving globals: FALSE [18:41:18.293] Tweak future expression to call with '...' arguments ... [18:41:18.293] { [18:41:18.293] do.call(function(...) { [18:41:18.293] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.293] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:18.293] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.293] on.exit(options(oopts), add = TRUE) [18:41:18.293] } [18:41:18.293] { [18:41:18.293] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:18.293] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.293] ...future.FUN(...future.X_jj, ...) [18:41:18.293] }) [18:41:18.293] } [18:41:18.293] }, args = future.call.arguments) [18:41:18.293] } [18:41:18.293] Tweak future expression to call with '...' arguments ... DONE [18:41:18.294] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.294] [18:41:18.294] getGlobalsAndPackages() ... DONE [18:41:18.294] run() for 'Future' ... [18:41:18.295] - state: 'created' [18:41:18.295] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:18.297] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:18.297] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:18.298] - Field: 'label' [18:41:18.300] - Field: 'local' [18:41:18.300] - Field: 'owner' [18:41:18.300] - Field: 'envir' [18:41:18.300] - Field: 'packages' [18:41:18.301] - Field: 'gc' [18:41:18.301] - Field: 'conditions' [18:41:18.301] - Field: 'expr' [18:41:18.301] - Field: 'uuid' [18:41:18.301] - Field: 'seed' [18:41:18.302] - Field: 'version' [18:41:18.302] - Field: 'result' [18:41:18.302] - Field: 'asynchronous' [18:41:18.302] - Field: 'calls' [18:41:18.302] - Field: 'globals' [18:41:18.302] - Field: 'stdout' [18:41:18.303] - Field: 'earlySignal' [18:41:18.303] - Field: 'lazy' [18:41:18.303] - Field: 'state' [18:41:18.303] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:18.303] - Launch lazy future ... [18:41:18.303] Packages needed by the future expression (n = 0): [18:41:18.304] Packages needed by future strategies (n = 0): [18:41:18.304] { [18:41:18.304] { [18:41:18.304] { [18:41:18.304] ...future.startTime <- base::Sys.time() [18:41:18.304] { [18:41:18.304] { [18:41:18.304] { [18:41:18.304] base::local({ [18:41:18.304] has_future <- base::requireNamespace("future", [18:41:18.304] quietly = TRUE) [18:41:18.304] if (has_future) { [18:41:18.304] ns <- base::getNamespace("future") [18:41:18.304] version <- ns[[".package"]][["version"]] [18:41:18.304] if (is.null(version)) [18:41:18.304] version <- utils::packageVersion("future") [18:41:18.304] } [18:41:18.304] else { [18:41:18.304] version <- NULL [18:41:18.304] } [18:41:18.304] if (!has_future || version < "1.8.0") { [18:41:18.304] info <- base::c(r_version = base::gsub("R version ", [18:41:18.304] "", base::R.version$version.string), [18:41:18.304] platform = base::sprintf("%s (%s-bit)", [18:41:18.304] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:18.304] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:18.304] "release", "version")], collapse = " "), [18:41:18.304] hostname = base::Sys.info()[["nodename"]]) [18:41:18.304] info <- base::sprintf("%s: %s", base::names(info), [18:41:18.304] info) [18:41:18.304] info <- base::paste(info, collapse = "; ") [18:41:18.304] if (!has_future) { [18:41:18.304] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:18.304] info) [18:41:18.304] } [18:41:18.304] else { [18:41:18.304] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:18.304] info, version) [18:41:18.304] } [18:41:18.304] base::stop(msg) [18:41:18.304] } [18:41:18.304] }) [18:41:18.304] } [18:41:18.304] ...future.strategy.old <- future::plan("list") [18:41:18.304] options(future.plan = NULL) [18:41:18.304] Sys.unsetenv("R_FUTURE_PLAN") [18:41:18.304] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:18.304] } [18:41:18.304] ...future.workdir <- getwd() [18:41:18.304] } [18:41:18.304] ...future.oldOptions <- base::as.list(base::.Options) [18:41:18.304] ...future.oldEnvVars <- base::Sys.getenv() [18:41:18.304] } [18:41:18.304] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:18.304] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:18.304] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:18.304] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:18.304] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:18.304] future.stdout.windows.reencode = NULL, width = 80L) [18:41:18.304] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:18.304] base::names(...future.oldOptions)) [18:41:18.304] } [18:41:18.304] if (FALSE) { [18:41:18.304] } [18:41:18.304] else { [18:41:18.304] if (TRUE) { [18:41:18.304] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:18.304] open = "w") [18:41:18.304] } [18:41:18.304] else { [18:41:18.304] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:18.304] windows = "NUL", "/dev/null"), open = "w") [18:41:18.304] } [18:41:18.304] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:18.304] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:18.304] base::sink(type = "output", split = FALSE) [18:41:18.304] base::close(...future.stdout) [18:41:18.304] }, add = TRUE) [18:41:18.304] } [18:41:18.304] ...future.frame <- base::sys.nframe() [18:41:18.304] ...future.conditions <- base::list() [18:41:18.304] ...future.rng <- base::globalenv()$.Random.seed [18:41:18.304] if (FALSE) { [18:41:18.304] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:18.304] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:18.304] } [18:41:18.304] ...future.result <- base::tryCatch({ [18:41:18.304] base::withCallingHandlers({ [18:41:18.304] ...future.value <- base::withVisible(base::local({ [18:41:18.304] do.call(function(...) { [18:41:18.304] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.304] if (!identical(...future.globals.maxSize.org, [18:41:18.304] ...future.globals.maxSize)) { [18:41:18.304] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.304] on.exit(options(oopts), add = TRUE) [18:41:18.304] } [18:41:18.304] { [18:41:18.304] lapply(seq_along(...future.elements_ii), [18:41:18.304] FUN = function(jj) { [18:41:18.304] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.304] ...future.FUN(...future.X_jj, ...) [18:41:18.304] }) [18:41:18.304] } [18:41:18.304] }, args = future.call.arguments) [18:41:18.304] })) [18:41:18.304] future::FutureResult(value = ...future.value$value, [18:41:18.304] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:18.304] ...future.rng), globalenv = if (FALSE) [18:41:18.304] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:18.304] ...future.globalenv.names)) [18:41:18.304] else NULL, started = ...future.startTime, version = "1.8") [18:41:18.304] }, condition = base::local({ [18:41:18.304] c <- base::c [18:41:18.304] inherits <- base::inherits [18:41:18.304] invokeRestart <- base::invokeRestart [18:41:18.304] length <- base::length [18:41:18.304] list <- base::list [18:41:18.304] seq.int <- base::seq.int [18:41:18.304] signalCondition <- base::signalCondition [18:41:18.304] sys.calls <- base::sys.calls [18:41:18.304] `[[` <- base::`[[` [18:41:18.304] `+` <- base::`+` [18:41:18.304] `<<-` <- base::`<<-` [18:41:18.304] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:18.304] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:18.304] 3L)] [18:41:18.304] } [18:41:18.304] function(cond) { [18:41:18.304] is_error <- inherits(cond, "error") [18:41:18.304] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:18.304] NULL) [18:41:18.304] if (is_error) { [18:41:18.304] sessionInformation <- function() { [18:41:18.304] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:18.304] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:18.304] search = base::search(), system = base::Sys.info()) [18:41:18.304] } [18:41:18.304] ...future.conditions[[length(...future.conditions) + [18:41:18.304] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:18.304] cond$call), session = sessionInformation(), [18:41:18.304] timestamp = base::Sys.time(), signaled = 0L) [18:41:18.304] signalCondition(cond) [18:41:18.304] } [18:41:18.304] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:18.304] "immediateCondition"))) { [18:41:18.304] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:18.304] ...future.conditions[[length(...future.conditions) + [18:41:18.304] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:18.304] if (TRUE && !signal) { [18:41:18.304] muffleCondition <- function (cond, pattern = "^muffle") [18:41:18.304] { [18:41:18.304] inherits <- base::inherits [18:41:18.304] invokeRestart <- base::invokeRestart [18:41:18.304] is.null <- base::is.null [18:41:18.304] muffled <- FALSE [18:41:18.304] if (inherits(cond, "message")) { [18:41:18.304] muffled <- grepl(pattern, "muffleMessage") [18:41:18.304] if (muffled) [18:41:18.304] invokeRestart("muffleMessage") [18:41:18.304] } [18:41:18.304] else if (inherits(cond, "warning")) { [18:41:18.304] muffled <- grepl(pattern, "muffleWarning") [18:41:18.304] if (muffled) [18:41:18.304] invokeRestart("muffleWarning") [18:41:18.304] } [18:41:18.304] else if (inherits(cond, "condition")) { [18:41:18.304] if (!is.null(pattern)) { [18:41:18.304] computeRestarts <- base::computeRestarts [18:41:18.304] grepl <- base::grepl [18:41:18.304] restarts <- computeRestarts(cond) [18:41:18.304] for (restart in restarts) { [18:41:18.304] name <- restart$name [18:41:18.304] if (is.null(name)) [18:41:18.304] next [18:41:18.304] if (!grepl(pattern, name)) [18:41:18.304] next [18:41:18.304] invokeRestart(restart) [18:41:18.304] muffled <- TRUE [18:41:18.304] break [18:41:18.304] } [18:41:18.304] } [18:41:18.304] } [18:41:18.304] invisible(muffled) [18:41:18.304] } [18:41:18.304] muffleCondition(cond, pattern = "^muffle") [18:41:18.304] } [18:41:18.304] } [18:41:18.304] else { [18:41:18.304] if (TRUE) { [18:41:18.304] muffleCondition <- function (cond, pattern = "^muffle") [18:41:18.304] { [18:41:18.304] inherits <- base::inherits [18:41:18.304] invokeRestart <- base::invokeRestart [18:41:18.304] is.null <- base::is.null [18:41:18.304] muffled <- FALSE [18:41:18.304] if (inherits(cond, "message")) { [18:41:18.304] muffled <- grepl(pattern, "muffleMessage") [18:41:18.304] if (muffled) [18:41:18.304] invokeRestart("muffleMessage") [18:41:18.304] } [18:41:18.304] else if (inherits(cond, "warning")) { [18:41:18.304] muffled <- grepl(pattern, "muffleWarning") [18:41:18.304] if (muffled) [18:41:18.304] invokeRestart("muffleWarning") [18:41:18.304] } [18:41:18.304] else if (inherits(cond, "condition")) { [18:41:18.304] if (!is.null(pattern)) { [18:41:18.304] computeRestarts <- base::computeRestarts [18:41:18.304] grepl <- base::grepl [18:41:18.304] restarts <- computeRestarts(cond) [18:41:18.304] for (restart in restarts) { [18:41:18.304] name <- restart$name [18:41:18.304] if (is.null(name)) [18:41:18.304] next [18:41:18.304] if (!grepl(pattern, name)) [18:41:18.304] next [18:41:18.304] invokeRestart(restart) [18:41:18.304] muffled <- TRUE [18:41:18.304] break [18:41:18.304] } [18:41:18.304] } [18:41:18.304] } [18:41:18.304] invisible(muffled) [18:41:18.304] } [18:41:18.304] muffleCondition(cond, pattern = "^muffle") [18:41:18.304] } [18:41:18.304] } [18:41:18.304] } [18:41:18.304] })) [18:41:18.304] }, error = function(ex) { [18:41:18.304] base::structure(base::list(value = NULL, visible = NULL, [18:41:18.304] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:18.304] ...future.rng), started = ...future.startTime, [18:41:18.304] finished = Sys.time(), session_uuid = NA_character_, [18:41:18.304] version = "1.8"), class = "FutureResult") [18:41:18.304] }, finally = { [18:41:18.304] if (!identical(...future.workdir, getwd())) [18:41:18.304] setwd(...future.workdir) [18:41:18.304] { [18:41:18.304] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:18.304] ...future.oldOptions$nwarnings <- NULL [18:41:18.304] } [18:41:18.304] base::options(...future.oldOptions) [18:41:18.304] if (.Platform$OS.type == "windows") { [18:41:18.304] old_names <- names(...future.oldEnvVars) [18:41:18.304] envs <- base::Sys.getenv() [18:41:18.304] names <- names(envs) [18:41:18.304] common <- intersect(names, old_names) [18:41:18.304] added <- setdiff(names, old_names) [18:41:18.304] removed <- setdiff(old_names, names) [18:41:18.304] changed <- common[...future.oldEnvVars[common] != [18:41:18.304] envs[common]] [18:41:18.304] NAMES <- toupper(changed) [18:41:18.304] args <- list() [18:41:18.304] for (kk in seq_along(NAMES)) { [18:41:18.304] name <- changed[[kk]] [18:41:18.304] NAME <- NAMES[[kk]] [18:41:18.304] if (name != NAME && is.element(NAME, old_names)) [18:41:18.304] next [18:41:18.304] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:18.304] } [18:41:18.304] NAMES <- toupper(added) [18:41:18.304] for (kk in seq_along(NAMES)) { [18:41:18.304] name <- added[[kk]] [18:41:18.304] NAME <- NAMES[[kk]] [18:41:18.304] if (name != NAME && is.element(NAME, old_names)) [18:41:18.304] next [18:41:18.304] args[[name]] <- "" [18:41:18.304] } [18:41:18.304] NAMES <- toupper(removed) [18:41:18.304] for (kk in seq_along(NAMES)) { [18:41:18.304] name <- removed[[kk]] [18:41:18.304] NAME <- NAMES[[kk]] [18:41:18.304] if (name != NAME && is.element(NAME, old_names)) [18:41:18.304] next [18:41:18.304] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:18.304] } [18:41:18.304] if (length(args) > 0) [18:41:18.304] base::do.call(base::Sys.setenv, args = args) [18:41:18.304] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:18.304] } [18:41:18.304] else { [18:41:18.304] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:18.304] } [18:41:18.304] { [18:41:18.304] if (base::length(...future.futureOptionsAdded) > [18:41:18.304] 0L) { [18:41:18.304] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:18.304] base::names(opts) <- ...future.futureOptionsAdded [18:41:18.304] base::options(opts) [18:41:18.304] } [18:41:18.304] { [18:41:18.304] { [18:41:18.304] NULL [18:41:18.304] RNGkind("Mersenne-Twister") [18:41:18.304] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:18.304] inherits = FALSE) [18:41:18.304] } [18:41:18.304] options(future.plan = NULL) [18:41:18.304] if (is.na(NA_character_)) [18:41:18.304] Sys.unsetenv("R_FUTURE_PLAN") [18:41:18.304] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:18.304] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:18.304] .init = FALSE) [18:41:18.304] } [18:41:18.304] } [18:41:18.304] } [18:41:18.304] }) [18:41:18.304] if (TRUE) { [18:41:18.304] base::sink(type = "output", split = FALSE) [18:41:18.304] if (TRUE) { [18:41:18.304] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:18.304] } [18:41:18.304] else { [18:41:18.304] ...future.result["stdout"] <- base::list(NULL) [18:41:18.304] } [18:41:18.304] base::close(...future.stdout) [18:41:18.304] ...future.stdout <- NULL [18:41:18.304] } [18:41:18.304] ...future.result$conditions <- ...future.conditions [18:41:18.304] ...future.result$finished <- base::Sys.time() [18:41:18.304] ...future.result [18:41:18.304] } [18:41:18.308] assign_globals() ... [18:41:18.308] List of 5 [18:41:18.308] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:18.308] $ future.call.arguments :List of 1 [18:41:18.308] ..$ length: int 2 [18:41:18.308] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:18.308] $ ...future.elements_ii :List of 1 [18:41:18.308] ..$ c: chr "character" [18:41:18.308] $ ...future.seeds_ii : NULL [18:41:18.308] $ ...future.globals.maxSize: NULL [18:41:18.308] - attr(*, "where")=List of 5 [18:41:18.308] ..$ ...future.FUN : [18:41:18.308] ..$ future.call.arguments : [18:41:18.308] ..$ ...future.elements_ii : [18:41:18.308] ..$ ...future.seeds_ii : [18:41:18.308] ..$ ...future.globals.maxSize: [18:41:18.308] - attr(*, "resolved")= logi FALSE [18:41:18.308] - attr(*, "total_size")= num 4406 [18:41:18.308] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:18.308] - attr(*, "already-done")= logi TRUE [18:41:18.314] - copied '...future.FUN' to environment [18:41:18.314] - copied 'future.call.arguments' to environment [18:41:18.315] - copied '...future.elements_ii' to environment [18:41:18.315] - copied '...future.seeds_ii' to environment [18:41:18.315] - copied '...future.globals.maxSize' to environment [18:41:18.315] assign_globals() ... done [18:41:18.315] plan(): Setting new future strategy stack: [18:41:18.316] List of future strategies: [18:41:18.316] 1. sequential: [18:41:18.316] - args: function (..., envir = parent.frame(), workers = "") [18:41:18.316] - tweaked: FALSE [18:41:18.316] - call: NULL [18:41:18.316] plan(): nbrOfWorkers() = 1 [18:41:18.317] plan(): Setting new future strategy stack: [18:41:18.318] List of future strategies: [18:41:18.318] 1. multisession: [18:41:18.318] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:41:18.318] - tweaked: FALSE [18:41:18.318] - call: plan(strategy) [18:41:18.320] plan(): nbrOfWorkers() = 1 [18:41:18.320] SequentialFuture started (and completed) [18:41:18.320] - Launch lazy future ... done [18:41:18.321] run() for 'SequentialFuture' ... done [18:41:18.321] Created future: [18:41:18.321] SequentialFuture: [18:41:18.321] Label: 'future_lapply-3' [18:41:18.321] Expression: [18:41:18.321] { [18:41:18.321] do.call(function(...) { [18:41:18.321] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.321] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:18.321] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.321] on.exit(options(oopts), add = TRUE) [18:41:18.321] } [18:41:18.321] { [18:41:18.321] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:18.321] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.321] ...future.FUN(...future.X_jj, ...) [18:41:18.321] }) [18:41:18.321] } [18:41:18.321] }, args = future.call.arguments) [18:41:18.321] } [18:41:18.321] Lazy evaluation: FALSE [18:41:18.321] Asynchronous evaluation: FALSE [18:41:18.321] Local evaluation: TRUE [18:41:18.321] Environment: R_GlobalEnv [18:41:18.321] Capture standard output: TRUE [18:41:18.321] Capture condition classes: 'condition' (excluding 'nothing') [18:41:18.321] Globals: 5 objects totaling 760 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 98 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:18.321] Packages: [18:41:18.321] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:18.321] Resolved: TRUE [18:41:18.321] Value: 55 bytes of class 'list' [18:41:18.321] Early signaling: FALSE [18:41:18.321] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:18.321] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:18.322] Chunk #3 of 4 ... DONE [18:41:18.322] Chunk #4 of 4 ... [18:41:18.322] - Finding globals in 'X' for chunk #4 ... [18:41:18.323] getGlobalsAndPackages() ... [18:41:18.323] Searching for globals... [18:41:18.323] [18:41:18.323] Searching for globals ... DONE [18:41:18.323] - globals: [0] [18:41:18.323] getGlobalsAndPackages() ... DONE [18:41:18.324] + additional globals found: [n=0] [18:41:18.324] + additional namespaces needed: [n=0] [18:41:18.324] - Finding globals in 'X' for chunk #4 ... DONE [18:41:18.324] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:18.324] - seeds: [18:41:18.324] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.325] getGlobalsAndPackages() ... [18:41:18.325] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.325] Resolving globals: FALSE [18:41:18.325] Tweak future expression to call with '...' arguments ... [18:41:18.325] { [18:41:18.325] do.call(function(...) { [18:41:18.325] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.325] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:18.325] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.325] on.exit(options(oopts), add = TRUE) [18:41:18.325] } [18:41:18.325] { [18:41:18.325] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:18.325] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.325] ...future.FUN(...future.X_jj, ...) [18:41:18.325] }) [18:41:18.325] } [18:41:18.325] }, args = future.call.arguments) [18:41:18.325] } [18:41:18.326] Tweak future expression to call with '...' arguments ... DONE [18:41:18.326] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.326] [18:41:18.327] getGlobalsAndPackages() ... DONE [18:41:18.327] run() for 'Future' ... [18:41:18.327] - state: 'created' [18:41:18.327] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:18.330] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:18.330] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:18.330] - Field: 'label' [18:41:18.330] - Field: 'local' [18:41:18.330] - Field: 'owner' [18:41:18.331] - Field: 'envir' [18:41:18.331] - Field: 'packages' [18:41:18.331] - Field: 'gc' [18:41:18.331] - Field: 'conditions' [18:41:18.331] - Field: 'expr' [18:41:18.331] - Field: 'uuid' [18:41:18.332] - Field: 'seed' [18:41:18.332] - Field: 'version' [18:41:18.332] - Field: 'result' [18:41:18.332] - Field: 'asynchronous' [18:41:18.332] - Field: 'calls' [18:41:18.332] - Field: 'globals' [18:41:18.333] - Field: 'stdout' [18:41:18.333] - Field: 'earlySignal' [18:41:18.333] - Field: 'lazy' [18:41:18.333] - Field: 'state' [18:41:18.333] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:18.334] - Launch lazy future ... [18:41:18.334] Packages needed by the future expression (n = 0): [18:41:18.334] Packages needed by future strategies (n = 0): [18:41:18.334] { [18:41:18.334] { [18:41:18.334] { [18:41:18.334] ...future.startTime <- base::Sys.time() [18:41:18.334] { [18:41:18.334] { [18:41:18.334] { [18:41:18.334] base::local({ [18:41:18.334] has_future <- base::requireNamespace("future", [18:41:18.334] quietly = TRUE) [18:41:18.334] if (has_future) { [18:41:18.334] ns <- base::getNamespace("future") [18:41:18.334] version <- ns[[".package"]][["version"]] [18:41:18.334] if (is.null(version)) [18:41:18.334] version <- utils::packageVersion("future") [18:41:18.334] } [18:41:18.334] else { [18:41:18.334] version <- NULL [18:41:18.334] } [18:41:18.334] if (!has_future || version < "1.8.0") { [18:41:18.334] info <- base::c(r_version = base::gsub("R version ", [18:41:18.334] "", base::R.version$version.string), [18:41:18.334] platform = base::sprintf("%s (%s-bit)", [18:41:18.334] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:18.334] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:18.334] "release", "version")], collapse = " "), [18:41:18.334] hostname = base::Sys.info()[["nodename"]]) [18:41:18.334] info <- base::sprintf("%s: %s", base::names(info), [18:41:18.334] info) [18:41:18.334] info <- base::paste(info, collapse = "; ") [18:41:18.334] if (!has_future) { [18:41:18.334] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:18.334] info) [18:41:18.334] } [18:41:18.334] else { [18:41:18.334] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:18.334] info, version) [18:41:18.334] } [18:41:18.334] base::stop(msg) [18:41:18.334] } [18:41:18.334] }) [18:41:18.334] } [18:41:18.334] ...future.strategy.old <- future::plan("list") [18:41:18.334] options(future.plan = NULL) [18:41:18.334] Sys.unsetenv("R_FUTURE_PLAN") [18:41:18.334] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:18.334] } [18:41:18.334] ...future.workdir <- getwd() [18:41:18.334] } [18:41:18.334] ...future.oldOptions <- base::as.list(base::.Options) [18:41:18.334] ...future.oldEnvVars <- base::Sys.getenv() [18:41:18.334] } [18:41:18.334] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:18.334] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:18.334] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:18.334] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:18.334] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:18.334] future.stdout.windows.reencode = NULL, width = 80L) [18:41:18.334] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:18.334] base::names(...future.oldOptions)) [18:41:18.334] } [18:41:18.334] if (FALSE) { [18:41:18.334] } [18:41:18.334] else { [18:41:18.334] if (TRUE) { [18:41:18.334] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:18.334] open = "w") [18:41:18.334] } [18:41:18.334] else { [18:41:18.334] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:18.334] windows = "NUL", "/dev/null"), open = "w") [18:41:18.334] } [18:41:18.334] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:18.334] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:18.334] base::sink(type = "output", split = FALSE) [18:41:18.334] base::close(...future.stdout) [18:41:18.334] }, add = TRUE) [18:41:18.334] } [18:41:18.334] ...future.frame <- base::sys.nframe() [18:41:18.334] ...future.conditions <- base::list() [18:41:18.334] ...future.rng <- base::globalenv()$.Random.seed [18:41:18.334] if (FALSE) { [18:41:18.334] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:18.334] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:18.334] } [18:41:18.334] ...future.result <- base::tryCatch({ [18:41:18.334] base::withCallingHandlers({ [18:41:18.334] ...future.value <- base::withVisible(base::local({ [18:41:18.334] do.call(function(...) { [18:41:18.334] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.334] if (!identical(...future.globals.maxSize.org, [18:41:18.334] ...future.globals.maxSize)) { [18:41:18.334] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.334] on.exit(options(oopts), add = TRUE) [18:41:18.334] } [18:41:18.334] { [18:41:18.334] lapply(seq_along(...future.elements_ii), [18:41:18.334] FUN = function(jj) { [18:41:18.334] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.334] ...future.FUN(...future.X_jj, ...) [18:41:18.334] }) [18:41:18.334] } [18:41:18.334] }, args = future.call.arguments) [18:41:18.334] })) [18:41:18.334] future::FutureResult(value = ...future.value$value, [18:41:18.334] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:18.334] ...future.rng), globalenv = if (FALSE) [18:41:18.334] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:18.334] ...future.globalenv.names)) [18:41:18.334] else NULL, started = ...future.startTime, version = "1.8") [18:41:18.334] }, condition = base::local({ [18:41:18.334] c <- base::c [18:41:18.334] inherits <- base::inherits [18:41:18.334] invokeRestart <- base::invokeRestart [18:41:18.334] length <- base::length [18:41:18.334] list <- base::list [18:41:18.334] seq.int <- base::seq.int [18:41:18.334] signalCondition <- base::signalCondition [18:41:18.334] sys.calls <- base::sys.calls [18:41:18.334] `[[` <- base::`[[` [18:41:18.334] `+` <- base::`+` [18:41:18.334] `<<-` <- base::`<<-` [18:41:18.334] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:18.334] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:18.334] 3L)] [18:41:18.334] } [18:41:18.334] function(cond) { [18:41:18.334] is_error <- inherits(cond, "error") [18:41:18.334] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:18.334] NULL) [18:41:18.334] if (is_error) { [18:41:18.334] sessionInformation <- function() { [18:41:18.334] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:18.334] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:18.334] search = base::search(), system = base::Sys.info()) [18:41:18.334] } [18:41:18.334] ...future.conditions[[length(...future.conditions) + [18:41:18.334] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:18.334] cond$call), session = sessionInformation(), [18:41:18.334] timestamp = base::Sys.time(), signaled = 0L) [18:41:18.334] signalCondition(cond) [18:41:18.334] } [18:41:18.334] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:18.334] "immediateCondition"))) { [18:41:18.334] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:18.334] ...future.conditions[[length(...future.conditions) + [18:41:18.334] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:18.334] if (TRUE && !signal) { [18:41:18.334] muffleCondition <- function (cond, pattern = "^muffle") [18:41:18.334] { [18:41:18.334] inherits <- base::inherits [18:41:18.334] invokeRestart <- base::invokeRestart [18:41:18.334] is.null <- base::is.null [18:41:18.334] muffled <- FALSE [18:41:18.334] if (inherits(cond, "message")) { [18:41:18.334] muffled <- grepl(pattern, "muffleMessage") [18:41:18.334] if (muffled) [18:41:18.334] invokeRestart("muffleMessage") [18:41:18.334] } [18:41:18.334] else if (inherits(cond, "warning")) { [18:41:18.334] muffled <- grepl(pattern, "muffleWarning") [18:41:18.334] if (muffled) [18:41:18.334] invokeRestart("muffleWarning") [18:41:18.334] } [18:41:18.334] else if (inherits(cond, "condition")) { [18:41:18.334] if (!is.null(pattern)) { [18:41:18.334] computeRestarts <- base::computeRestarts [18:41:18.334] grepl <- base::grepl [18:41:18.334] restarts <- computeRestarts(cond) [18:41:18.334] for (restart in restarts) { [18:41:18.334] name <- restart$name [18:41:18.334] if (is.null(name)) [18:41:18.334] next [18:41:18.334] if (!grepl(pattern, name)) [18:41:18.334] next [18:41:18.334] invokeRestart(restart) [18:41:18.334] muffled <- TRUE [18:41:18.334] break [18:41:18.334] } [18:41:18.334] } [18:41:18.334] } [18:41:18.334] invisible(muffled) [18:41:18.334] } [18:41:18.334] muffleCondition(cond, pattern = "^muffle") [18:41:18.334] } [18:41:18.334] } [18:41:18.334] else { [18:41:18.334] if (TRUE) { [18:41:18.334] muffleCondition <- function (cond, pattern = "^muffle") [18:41:18.334] { [18:41:18.334] inherits <- base::inherits [18:41:18.334] invokeRestart <- base::invokeRestart [18:41:18.334] is.null <- base::is.null [18:41:18.334] muffled <- FALSE [18:41:18.334] if (inherits(cond, "message")) { [18:41:18.334] muffled <- grepl(pattern, "muffleMessage") [18:41:18.334] if (muffled) [18:41:18.334] invokeRestart("muffleMessage") [18:41:18.334] } [18:41:18.334] else if (inherits(cond, "warning")) { [18:41:18.334] muffled <- grepl(pattern, "muffleWarning") [18:41:18.334] if (muffled) [18:41:18.334] invokeRestart("muffleWarning") [18:41:18.334] } [18:41:18.334] else if (inherits(cond, "condition")) { [18:41:18.334] if (!is.null(pattern)) { [18:41:18.334] computeRestarts <- base::computeRestarts [18:41:18.334] grepl <- base::grepl [18:41:18.334] restarts <- computeRestarts(cond) [18:41:18.334] for (restart in restarts) { [18:41:18.334] name <- restart$name [18:41:18.334] if (is.null(name)) [18:41:18.334] next [18:41:18.334] if (!grepl(pattern, name)) [18:41:18.334] next [18:41:18.334] invokeRestart(restart) [18:41:18.334] muffled <- TRUE [18:41:18.334] break [18:41:18.334] } [18:41:18.334] } [18:41:18.334] } [18:41:18.334] invisible(muffled) [18:41:18.334] } [18:41:18.334] muffleCondition(cond, pattern = "^muffle") [18:41:18.334] } [18:41:18.334] } [18:41:18.334] } [18:41:18.334] })) [18:41:18.334] }, error = function(ex) { [18:41:18.334] base::structure(base::list(value = NULL, visible = NULL, [18:41:18.334] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:18.334] ...future.rng), started = ...future.startTime, [18:41:18.334] finished = Sys.time(), session_uuid = NA_character_, [18:41:18.334] version = "1.8"), class = "FutureResult") [18:41:18.334] }, finally = { [18:41:18.334] if (!identical(...future.workdir, getwd())) [18:41:18.334] setwd(...future.workdir) [18:41:18.334] { [18:41:18.334] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:18.334] ...future.oldOptions$nwarnings <- NULL [18:41:18.334] } [18:41:18.334] base::options(...future.oldOptions) [18:41:18.334] if (.Platform$OS.type == "windows") { [18:41:18.334] old_names <- names(...future.oldEnvVars) [18:41:18.334] envs <- base::Sys.getenv() [18:41:18.334] names <- names(envs) [18:41:18.334] common <- intersect(names, old_names) [18:41:18.334] added <- setdiff(names, old_names) [18:41:18.334] removed <- setdiff(old_names, names) [18:41:18.334] changed <- common[...future.oldEnvVars[common] != [18:41:18.334] envs[common]] [18:41:18.334] NAMES <- toupper(changed) [18:41:18.334] args <- list() [18:41:18.334] for (kk in seq_along(NAMES)) { [18:41:18.334] name <- changed[[kk]] [18:41:18.334] NAME <- NAMES[[kk]] [18:41:18.334] if (name != NAME && is.element(NAME, old_names)) [18:41:18.334] next [18:41:18.334] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:18.334] } [18:41:18.334] NAMES <- toupper(added) [18:41:18.334] for (kk in seq_along(NAMES)) { [18:41:18.334] name <- added[[kk]] [18:41:18.334] NAME <- NAMES[[kk]] [18:41:18.334] if (name != NAME && is.element(NAME, old_names)) [18:41:18.334] next [18:41:18.334] args[[name]] <- "" [18:41:18.334] } [18:41:18.334] NAMES <- toupper(removed) [18:41:18.334] for (kk in seq_along(NAMES)) { [18:41:18.334] name <- removed[[kk]] [18:41:18.334] NAME <- NAMES[[kk]] [18:41:18.334] if (name != NAME && is.element(NAME, old_names)) [18:41:18.334] next [18:41:18.334] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:18.334] } [18:41:18.334] if (length(args) > 0) [18:41:18.334] base::do.call(base::Sys.setenv, args = args) [18:41:18.334] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:18.334] } [18:41:18.334] else { [18:41:18.334] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:18.334] } [18:41:18.334] { [18:41:18.334] if (base::length(...future.futureOptionsAdded) > [18:41:18.334] 0L) { [18:41:18.334] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:18.334] base::names(opts) <- ...future.futureOptionsAdded [18:41:18.334] base::options(opts) [18:41:18.334] } [18:41:18.334] { [18:41:18.334] { [18:41:18.334] NULL [18:41:18.334] RNGkind("Mersenne-Twister") [18:41:18.334] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:18.334] inherits = FALSE) [18:41:18.334] } [18:41:18.334] options(future.plan = NULL) [18:41:18.334] if (is.na(NA_character_)) [18:41:18.334] Sys.unsetenv("R_FUTURE_PLAN") [18:41:18.334] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:18.334] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:18.334] .init = FALSE) [18:41:18.334] } [18:41:18.334] } [18:41:18.334] } [18:41:18.334] }) [18:41:18.334] if (TRUE) { [18:41:18.334] base::sink(type = "output", split = FALSE) [18:41:18.334] if (TRUE) { [18:41:18.334] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:18.334] } [18:41:18.334] else { [18:41:18.334] ...future.result["stdout"] <- base::list(NULL) [18:41:18.334] } [18:41:18.334] base::close(...future.stdout) [18:41:18.334] ...future.stdout <- NULL [18:41:18.334] } [18:41:18.334] ...future.result$conditions <- ...future.conditions [18:41:18.334] ...future.result$finished <- base::Sys.time() [18:41:18.334] ...future.result [18:41:18.334] } [18:41:18.338] assign_globals() ... [18:41:18.338] List of 5 [18:41:18.338] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:18.338] $ future.call.arguments :List of 1 [18:41:18.338] ..$ length: int 2 [18:41:18.338] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:18.338] $ ...future.elements_ii :List of 1 [18:41:18.338] ..$ c: chr "list" [18:41:18.338] $ ...future.seeds_ii : NULL [18:41:18.338] $ ...future.globals.maxSize: NULL [18:41:18.338] - attr(*, "where")=List of 5 [18:41:18.338] ..$ ...future.FUN : [18:41:18.338] ..$ future.call.arguments : [18:41:18.338] ..$ ...future.elements_ii : [18:41:18.338] ..$ ...future.seeds_ii : [18:41:18.338] ..$ ...future.globals.maxSize: [18:41:18.338] - attr(*, "resolved")= logi FALSE [18:41:18.338] - attr(*, "total_size")= num 4406 [18:41:18.338] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:18.338] - attr(*, "already-done")= logi TRUE [18:41:18.345] - copied '...future.FUN' to environment [18:41:18.345] - copied 'future.call.arguments' to environment [18:41:18.345] - copied '...future.elements_ii' to environment [18:41:18.345] - copied '...future.seeds_ii' to environment [18:41:18.345] - copied '...future.globals.maxSize' to environment [18:41:18.346] assign_globals() ... done [18:41:18.346] plan(): Setting new future strategy stack: [18:41:18.346] List of future strategies: [18:41:18.346] 1. sequential: [18:41:18.346] - args: function (..., envir = parent.frame(), workers = "") [18:41:18.346] - tweaked: FALSE [18:41:18.346] - call: NULL [18:41:18.347] plan(): nbrOfWorkers() = 1 [18:41:18.348] plan(): Setting new future strategy stack: [18:41:18.348] List of future strategies: [18:41:18.348] 1. multisession: [18:41:18.348] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:41:18.348] - tweaked: FALSE [18:41:18.348] - call: plan(strategy) [18:41:18.351] plan(): nbrOfWorkers() = 1 [18:41:18.351] SequentialFuture started (and completed) [18:41:18.351] - Launch lazy future ... done [18:41:18.351] run() for 'SequentialFuture' ... done [18:41:18.351] Created future: [18:41:18.352] SequentialFuture: [18:41:18.352] Label: 'future_lapply-4' [18:41:18.352] Expression: [18:41:18.352] { [18:41:18.352] do.call(function(...) { [18:41:18.352] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.352] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:18.352] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.352] on.exit(options(oopts), add = TRUE) [18:41:18.352] } [18:41:18.352] { [18:41:18.352] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:18.352] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.352] ...future.FUN(...future.X_jj, ...) [18:41:18.352] }) [18:41:18.352] } [18:41:18.352] }, args = future.call.arguments) [18:41:18.352] } [18:41:18.352] Lazy evaluation: FALSE [18:41:18.352] Asynchronous evaluation: FALSE [18:41:18.352] Local evaluation: TRUE [18:41:18.352] Environment: R_GlobalEnv [18:41:18.352] Capture standard output: TRUE [18:41:18.352] Capture condition classes: 'condition' (excluding 'nothing') [18:41:18.352] Globals: 5 objects totaling 755 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 93 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:18.352] Packages: [18:41:18.352] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:18.352] Resolved: TRUE [18:41:18.352] Value: 47 bytes of class 'list' [18:41:18.352] Early signaling: FALSE [18:41:18.352] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:18.352] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:18.353] Chunk #4 of 4 ... DONE [18:41:18.353] Launching 4 futures (chunks) ... DONE [18:41:18.353] Resolving 4 futures (chunks) ... [18:41:18.353] resolve() on list ... [18:41:18.353] recursive: 0 [18:41:18.353] length: 4 [18:41:18.354] [18:41:18.354] resolved() for 'SequentialFuture' ... [18:41:18.354] - state: 'finished' [18:41:18.354] - run: TRUE [18:41:18.354] - result: 'FutureResult' [18:41:18.354] resolved() for 'SequentialFuture' ... done [18:41:18.355] Future #1 [18:41:18.355] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:18.355] - nx: 4 [18:41:18.355] - relay: TRUE [18:41:18.355] - stdout: TRUE [18:41:18.355] - signal: TRUE [18:41:18.356] - resignal: FALSE [18:41:18.356] - force: TRUE [18:41:18.356] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [18:41:18.356] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:41:18.356] - until=1 [18:41:18.356] - relaying element #1 [18:41:18.357] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:18.357] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:18.357] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:18.357] length: 3 (resolved future 1) [18:41:18.357] resolved() for 'SequentialFuture' ... [18:41:18.358] - state: 'finished' [18:41:18.358] - run: TRUE [18:41:18.358] - result: 'FutureResult' [18:41:18.358] resolved() for 'SequentialFuture' ... done [18:41:18.358] Future #2 [18:41:18.359] signalConditionsASAP(SequentialFuture, pos=2) ... [18:41:18.359] - nx: 4 [18:41:18.359] - relay: TRUE [18:41:18.359] - stdout: TRUE [18:41:18.359] - signal: TRUE [18:41:18.359] - resignal: FALSE [18:41:18.359] - force: TRUE [18:41:18.360] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:18.360] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:18.360] - until=2 [18:41:18.360] - relaying element #2 [18:41:18.360] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:18.360] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:18.361] signalConditionsASAP(SequentialFuture, pos=2) ... done [18:41:18.361] length: 2 (resolved future 2) [18:41:18.361] resolved() for 'SequentialFuture' ... [18:41:18.361] - state: 'finished' [18:41:18.361] - run: TRUE [18:41:18.362] - result: 'FutureResult' [18:41:18.362] resolved() for 'SequentialFuture' ... done [18:41:18.362] Future #3 [18:41:18.362] signalConditionsASAP(SequentialFuture, pos=3) ... [18:41:18.362] - nx: 4 [18:41:18.362] - relay: TRUE [18:41:18.363] - stdout: TRUE [18:41:18.363] - signal: TRUE [18:41:18.363] - resignal: FALSE [18:41:18.363] - force: TRUE [18:41:18.363] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:18.363] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:18.363] - until=3 [18:41:18.364] - relaying element #3 [18:41:18.364] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:18.364] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:18.364] signalConditionsASAP(SequentialFuture, pos=3) ... done [18:41:18.364] length: 1 (resolved future 3) [18:41:18.365] resolved() for 'SequentialFuture' ... [18:41:18.365] - state: 'finished' [18:41:18.365] - run: TRUE [18:41:18.365] - result: 'FutureResult' [18:41:18.365] resolved() for 'SequentialFuture' ... done [18:41:18.365] Future #4 [18:41:18.366] signalConditionsASAP(SequentialFuture, pos=4) ... [18:41:18.366] - nx: 4 [18:41:18.366] - relay: TRUE [18:41:18.366] - stdout: TRUE [18:41:18.366] - signal: TRUE [18:41:18.366] - resignal: FALSE [18:41:18.367] - force: TRUE [18:41:18.367] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:18.367] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:18.367] - until=4 [18:41:18.367] - relaying element #4 [18:41:18.367] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:18.368] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:18.368] signalConditionsASAP(SequentialFuture, pos=4) ... done [18:41:18.368] length: 0 (resolved future 4) [18:41:18.368] Relaying remaining futures [18:41:18.368] signalConditionsASAP(NULL, pos=0) ... [18:41:18.368] - nx: 4 [18:41:18.369] - relay: TRUE [18:41:18.369] - stdout: TRUE [18:41:18.369] - signal: TRUE [18:41:18.369] - resignal: FALSE [18:41:18.369] - force: TRUE [18:41:18.369] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:18.369] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [18:41:18.370] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:18.370] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:18.370] signalConditionsASAP(NULL, pos=0) ... done [18:41:18.370] resolve() on list ... DONE [18:41:18.371] - Number of value chunks collected: 4 [18:41:18.371] Resolving 4 futures (chunks) ... DONE [18:41:18.371] Reducing values from 4 chunks ... [18:41:18.371] - Number of values collected after concatenation: 4 [18:41:18.371] - Number of values expected: 4 [18:41:18.371] Reducing values from 4 chunks ... DONE [18:41:18.371] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL - future_lapply(x, FUN = future:::hpaste, ...) ... [18:41:18.374] future_lapply() ... [18:41:18.384] Number of chunks: 1 [18:41:18.384] getGlobalsAndPackagesXApply() ... [18:41:18.385] - future.globals: TRUE [18:41:18.385] getGlobalsAndPackages() ... [18:41:18.385] Searching for globals... [18:41:18.394] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [18:41:18.395] Searching for globals ... DONE [18:41:18.395] Resolving globals: FALSE [18:41:18.396] The total size of the 1 globals is 7.17 KiB (7342 bytes) [18:41:18.396] The total size of the 1 globals exported for future expression ('FUN(collapse = "; ", maxHead = 3L)') is 7.17 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (7.17 KiB of class 'function') [18:41:18.397] - globals: [1] 'FUN' [18:41:18.397] - packages: [1] 'future' [18:41:18.397] getGlobalsAndPackages() ... DONE [18:41:18.397] - globals found/used: [n=1] 'FUN' [18:41:18.397] - needed namespaces: [n=1] 'future' [18:41:18.397] Finding globals ... DONE [18:41:18.398] - use_args: TRUE [18:41:18.398] - Getting '...' globals ... [18:41:18.398] resolve() on list ... [18:41:18.398] recursive: 0 [18:41:18.399] length: 1 [18:41:18.399] elements: '...' [18:41:18.399] length: 0 (resolved future 1) [18:41:18.399] resolve() on list ... DONE [18:41:18.399] - '...' content: [n=2] 'collapse', 'maxHead' [18:41:18.399] List of 1 [18:41:18.399] $ ...:List of 2 [18:41:18.399] ..$ collapse: chr "; " [18:41:18.399] ..$ maxHead : int 3 [18:41:18.399] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:18.399] - attr(*, "where")=List of 1 [18:41:18.399] ..$ ...: [18:41:18.399] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:18.399] - attr(*, "resolved")= logi TRUE [18:41:18.399] - attr(*, "total_size")= num NA [18:41:18.405] - Getting '...' globals ... DONE [18:41:18.406] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:18.406] List of 2 [18:41:18.406] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [18:41:18.406] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [18:41:18.406] $ ... :List of 2 [18:41:18.406] ..$ collapse: chr "; " [18:41:18.406] ..$ maxHead : int 3 [18:41:18.406] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:18.406] - attr(*, "where")=List of 2 [18:41:18.406] ..$ ...future.FUN: [18:41:18.406] ..$ ... : [18:41:18.406] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:18.406] - attr(*, "resolved")= logi FALSE [18:41:18.406] - attr(*, "total_size")= int 20301 [18:41:18.410] Packages to be attached in all futures: [n=1] 'future' [18:41:18.410] getGlobalsAndPackagesXApply() ... DONE [18:41:18.410] Number of futures (= number of chunks): 1 [18:41:18.410] Launching 1 futures (chunks) ... [18:41:18.411] Chunk #1 of 1 ... [18:41:18.411] - Finding globals in 'X' for chunk #1 ... [18:41:18.411] getGlobalsAndPackages() ... [18:41:18.411] Searching for globals... [18:41:18.411] [18:41:18.412] Searching for globals ... DONE [18:41:18.412] - globals: [0] [18:41:18.412] getGlobalsAndPackages() ... DONE [18:41:18.412] + additional globals found: [n=0] [18:41:18.412] + additional namespaces needed: [n=0] [18:41:18.412] - Finding globals in 'X' for chunk #1 ... DONE [18:41:18.412] - seeds: [18:41:18.413] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.413] getGlobalsAndPackages() ... [18:41:18.413] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.413] Resolving globals: FALSE [18:41:18.413] Tweak future expression to call with '...' arguments ... [18:41:18.414] { [18:41:18.414] do.call(function(...) { [18:41:18.414] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.414] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:18.414] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.414] on.exit(options(oopts), add = TRUE) [18:41:18.414] } [18:41:18.414] { [18:41:18.414] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:18.414] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.414] ...future.FUN(...future.X_jj, ...) [18:41:18.414] }) [18:41:18.414] } [18:41:18.414] }, args = future.call.arguments) [18:41:18.414] } [18:41:18.414] Tweak future expression to call with '...' arguments ... DONE [18:41:18.414] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.415] - packages: [1] 'future' [18:41:18.415] getGlobalsAndPackages() ... DONE [18:41:18.415] run() for 'Future' ... [18:41:18.415] - state: 'created' [18:41:18.416] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:18.418] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:18.418] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:18.418] - Field: 'label' [18:41:18.418] - Field: 'local' [18:41:18.419] - Field: 'owner' [18:41:18.419] - Field: 'envir' [18:41:18.419] - Field: 'packages' [18:41:18.419] - Field: 'gc' [18:41:18.419] - Field: 'conditions' [18:41:18.420] - Field: 'expr' [18:41:18.420] - Field: 'uuid' [18:41:18.420] - Field: 'seed' [18:41:18.420] - Field: 'version' [18:41:18.420] - Field: 'result' [18:41:18.420] - Field: 'asynchronous' [18:41:18.421] - Field: 'calls' [18:41:18.421] - Field: 'globals' [18:41:18.421] - Field: 'stdout' [18:41:18.421] - Field: 'earlySignal' [18:41:18.421] - Field: 'lazy' [18:41:18.421] - Field: 'state' [18:41:18.422] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:18.422] - Launch lazy future ... [18:41:18.422] Packages needed by the future expression (n = 1): 'future' [18:41:18.422] Packages needed by future strategies (n = 0): [18:41:18.423] { [18:41:18.423] { [18:41:18.423] { [18:41:18.423] ...future.startTime <- base::Sys.time() [18:41:18.423] { [18:41:18.423] { [18:41:18.423] { [18:41:18.423] { [18:41:18.423] base::local({ [18:41:18.423] has_future <- base::requireNamespace("future", [18:41:18.423] quietly = TRUE) [18:41:18.423] if (has_future) { [18:41:18.423] ns <- base::getNamespace("future") [18:41:18.423] version <- ns[[".package"]][["version"]] [18:41:18.423] if (is.null(version)) [18:41:18.423] version <- utils::packageVersion("future") [18:41:18.423] } [18:41:18.423] else { [18:41:18.423] version <- NULL [18:41:18.423] } [18:41:18.423] if (!has_future || version < "1.8.0") { [18:41:18.423] info <- base::c(r_version = base::gsub("R version ", [18:41:18.423] "", base::R.version$version.string), [18:41:18.423] platform = base::sprintf("%s (%s-bit)", [18:41:18.423] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:18.423] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:18.423] "release", "version")], collapse = " "), [18:41:18.423] hostname = base::Sys.info()[["nodename"]]) [18:41:18.423] info <- base::sprintf("%s: %s", base::names(info), [18:41:18.423] info) [18:41:18.423] info <- base::paste(info, collapse = "; ") [18:41:18.423] if (!has_future) { [18:41:18.423] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:18.423] info) [18:41:18.423] } [18:41:18.423] else { [18:41:18.423] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:18.423] info, version) [18:41:18.423] } [18:41:18.423] base::stop(msg) [18:41:18.423] } [18:41:18.423] }) [18:41:18.423] } [18:41:18.423] base::local({ [18:41:18.423] for (pkg in "future") { [18:41:18.423] base::loadNamespace(pkg) [18:41:18.423] base::library(pkg, character.only = TRUE) [18:41:18.423] } [18:41:18.423] }) [18:41:18.423] } [18:41:18.423] ...future.strategy.old <- future::plan("list") [18:41:18.423] options(future.plan = NULL) [18:41:18.423] Sys.unsetenv("R_FUTURE_PLAN") [18:41:18.423] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:18.423] } [18:41:18.423] ...future.workdir <- getwd() [18:41:18.423] } [18:41:18.423] ...future.oldOptions <- base::as.list(base::.Options) [18:41:18.423] ...future.oldEnvVars <- base::Sys.getenv() [18:41:18.423] } [18:41:18.423] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:18.423] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:18.423] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:18.423] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:18.423] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:18.423] future.stdout.windows.reencode = NULL, width = 80L) [18:41:18.423] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:18.423] base::names(...future.oldOptions)) [18:41:18.423] } [18:41:18.423] if (FALSE) { [18:41:18.423] } [18:41:18.423] else { [18:41:18.423] if (TRUE) { [18:41:18.423] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:18.423] open = "w") [18:41:18.423] } [18:41:18.423] else { [18:41:18.423] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:18.423] windows = "NUL", "/dev/null"), open = "w") [18:41:18.423] } [18:41:18.423] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:18.423] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:18.423] base::sink(type = "output", split = FALSE) [18:41:18.423] base::close(...future.stdout) [18:41:18.423] }, add = TRUE) [18:41:18.423] } [18:41:18.423] ...future.frame <- base::sys.nframe() [18:41:18.423] ...future.conditions <- base::list() [18:41:18.423] ...future.rng <- base::globalenv()$.Random.seed [18:41:18.423] if (FALSE) { [18:41:18.423] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:18.423] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:18.423] } [18:41:18.423] ...future.result <- base::tryCatch({ [18:41:18.423] base::withCallingHandlers({ [18:41:18.423] ...future.value <- base::withVisible(base::local({ [18:41:18.423] do.call(function(...) { [18:41:18.423] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.423] if (!identical(...future.globals.maxSize.org, [18:41:18.423] ...future.globals.maxSize)) { [18:41:18.423] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.423] on.exit(options(oopts), add = TRUE) [18:41:18.423] } [18:41:18.423] { [18:41:18.423] lapply(seq_along(...future.elements_ii), [18:41:18.423] FUN = function(jj) { [18:41:18.423] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.423] ...future.FUN(...future.X_jj, ...) [18:41:18.423] }) [18:41:18.423] } [18:41:18.423] }, args = future.call.arguments) [18:41:18.423] })) [18:41:18.423] future::FutureResult(value = ...future.value$value, [18:41:18.423] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:18.423] ...future.rng), globalenv = if (FALSE) [18:41:18.423] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:18.423] ...future.globalenv.names)) [18:41:18.423] else NULL, started = ...future.startTime, version = "1.8") [18:41:18.423] }, condition = base::local({ [18:41:18.423] c <- base::c [18:41:18.423] inherits <- base::inherits [18:41:18.423] invokeRestart <- base::invokeRestart [18:41:18.423] length <- base::length [18:41:18.423] list <- base::list [18:41:18.423] seq.int <- base::seq.int [18:41:18.423] signalCondition <- base::signalCondition [18:41:18.423] sys.calls <- base::sys.calls [18:41:18.423] `[[` <- base::`[[` [18:41:18.423] `+` <- base::`+` [18:41:18.423] `<<-` <- base::`<<-` [18:41:18.423] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:18.423] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:18.423] 3L)] [18:41:18.423] } [18:41:18.423] function(cond) { [18:41:18.423] is_error <- inherits(cond, "error") [18:41:18.423] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:18.423] NULL) [18:41:18.423] if (is_error) { [18:41:18.423] sessionInformation <- function() { [18:41:18.423] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:18.423] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:18.423] search = base::search(), system = base::Sys.info()) [18:41:18.423] } [18:41:18.423] ...future.conditions[[length(...future.conditions) + [18:41:18.423] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:18.423] cond$call), session = sessionInformation(), [18:41:18.423] timestamp = base::Sys.time(), signaled = 0L) [18:41:18.423] signalCondition(cond) [18:41:18.423] } [18:41:18.423] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:18.423] "immediateCondition"))) { [18:41:18.423] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:18.423] ...future.conditions[[length(...future.conditions) + [18:41:18.423] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:18.423] if (TRUE && !signal) { [18:41:18.423] muffleCondition <- function (cond, pattern = "^muffle") [18:41:18.423] { [18:41:18.423] inherits <- base::inherits [18:41:18.423] invokeRestart <- base::invokeRestart [18:41:18.423] is.null <- base::is.null [18:41:18.423] muffled <- FALSE [18:41:18.423] if (inherits(cond, "message")) { [18:41:18.423] muffled <- grepl(pattern, "muffleMessage") [18:41:18.423] if (muffled) [18:41:18.423] invokeRestart("muffleMessage") [18:41:18.423] } [18:41:18.423] else if (inherits(cond, "warning")) { [18:41:18.423] muffled <- grepl(pattern, "muffleWarning") [18:41:18.423] if (muffled) [18:41:18.423] invokeRestart("muffleWarning") [18:41:18.423] } [18:41:18.423] else if (inherits(cond, "condition")) { [18:41:18.423] if (!is.null(pattern)) { [18:41:18.423] computeRestarts <- base::computeRestarts [18:41:18.423] grepl <- base::grepl [18:41:18.423] restarts <- computeRestarts(cond) [18:41:18.423] for (restart in restarts) { [18:41:18.423] name <- restart$name [18:41:18.423] if (is.null(name)) [18:41:18.423] next [18:41:18.423] if (!grepl(pattern, name)) [18:41:18.423] next [18:41:18.423] invokeRestart(restart) [18:41:18.423] muffled <- TRUE [18:41:18.423] break [18:41:18.423] } [18:41:18.423] } [18:41:18.423] } [18:41:18.423] invisible(muffled) [18:41:18.423] } [18:41:18.423] muffleCondition(cond, pattern = "^muffle") [18:41:18.423] } [18:41:18.423] } [18:41:18.423] else { [18:41:18.423] if (TRUE) { [18:41:18.423] muffleCondition <- function (cond, pattern = "^muffle") [18:41:18.423] { [18:41:18.423] inherits <- base::inherits [18:41:18.423] invokeRestart <- base::invokeRestart [18:41:18.423] is.null <- base::is.null [18:41:18.423] muffled <- FALSE [18:41:18.423] if (inherits(cond, "message")) { [18:41:18.423] muffled <- grepl(pattern, "muffleMessage") [18:41:18.423] if (muffled) [18:41:18.423] invokeRestart("muffleMessage") [18:41:18.423] } [18:41:18.423] else if (inherits(cond, "warning")) { [18:41:18.423] muffled <- grepl(pattern, "muffleWarning") [18:41:18.423] if (muffled) [18:41:18.423] invokeRestart("muffleWarning") [18:41:18.423] } [18:41:18.423] else if (inherits(cond, "condition")) { [18:41:18.423] if (!is.null(pattern)) { [18:41:18.423] computeRestarts <- base::computeRestarts [18:41:18.423] grepl <- base::grepl [18:41:18.423] restarts <- computeRestarts(cond) [18:41:18.423] for (restart in restarts) { [18:41:18.423] name <- restart$name [18:41:18.423] if (is.null(name)) [18:41:18.423] next [18:41:18.423] if (!grepl(pattern, name)) [18:41:18.423] next [18:41:18.423] invokeRestart(restart) [18:41:18.423] muffled <- TRUE [18:41:18.423] break [18:41:18.423] } [18:41:18.423] } [18:41:18.423] } [18:41:18.423] invisible(muffled) [18:41:18.423] } [18:41:18.423] muffleCondition(cond, pattern = "^muffle") [18:41:18.423] } [18:41:18.423] } [18:41:18.423] } [18:41:18.423] })) [18:41:18.423] }, error = function(ex) { [18:41:18.423] base::structure(base::list(value = NULL, visible = NULL, [18:41:18.423] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:18.423] ...future.rng), started = ...future.startTime, [18:41:18.423] finished = Sys.time(), session_uuid = NA_character_, [18:41:18.423] version = "1.8"), class = "FutureResult") [18:41:18.423] }, finally = { [18:41:18.423] if (!identical(...future.workdir, getwd())) [18:41:18.423] setwd(...future.workdir) [18:41:18.423] { [18:41:18.423] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:18.423] ...future.oldOptions$nwarnings <- NULL [18:41:18.423] } [18:41:18.423] base::options(...future.oldOptions) [18:41:18.423] if (.Platform$OS.type == "windows") { [18:41:18.423] old_names <- names(...future.oldEnvVars) [18:41:18.423] envs <- base::Sys.getenv() [18:41:18.423] names <- names(envs) [18:41:18.423] common <- intersect(names, old_names) [18:41:18.423] added <- setdiff(names, old_names) [18:41:18.423] removed <- setdiff(old_names, names) [18:41:18.423] changed <- common[...future.oldEnvVars[common] != [18:41:18.423] envs[common]] [18:41:18.423] NAMES <- toupper(changed) [18:41:18.423] args <- list() [18:41:18.423] for (kk in seq_along(NAMES)) { [18:41:18.423] name <- changed[[kk]] [18:41:18.423] NAME <- NAMES[[kk]] [18:41:18.423] if (name != NAME && is.element(NAME, old_names)) [18:41:18.423] next [18:41:18.423] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:18.423] } [18:41:18.423] NAMES <- toupper(added) [18:41:18.423] for (kk in seq_along(NAMES)) { [18:41:18.423] name <- added[[kk]] [18:41:18.423] NAME <- NAMES[[kk]] [18:41:18.423] if (name != NAME && is.element(NAME, old_names)) [18:41:18.423] next [18:41:18.423] args[[name]] <- "" [18:41:18.423] } [18:41:18.423] NAMES <- toupper(removed) [18:41:18.423] for (kk in seq_along(NAMES)) { [18:41:18.423] name <- removed[[kk]] [18:41:18.423] NAME <- NAMES[[kk]] [18:41:18.423] if (name != NAME && is.element(NAME, old_names)) [18:41:18.423] next [18:41:18.423] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:18.423] } [18:41:18.423] if (length(args) > 0) [18:41:18.423] base::do.call(base::Sys.setenv, args = args) [18:41:18.423] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:18.423] } [18:41:18.423] else { [18:41:18.423] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:18.423] } [18:41:18.423] { [18:41:18.423] if (base::length(...future.futureOptionsAdded) > [18:41:18.423] 0L) { [18:41:18.423] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:18.423] base::names(opts) <- ...future.futureOptionsAdded [18:41:18.423] base::options(opts) [18:41:18.423] } [18:41:18.423] { [18:41:18.423] { [18:41:18.423] NULL [18:41:18.423] RNGkind("Mersenne-Twister") [18:41:18.423] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:18.423] inherits = FALSE) [18:41:18.423] } [18:41:18.423] options(future.plan = NULL) [18:41:18.423] if (is.na(NA_character_)) [18:41:18.423] Sys.unsetenv("R_FUTURE_PLAN") [18:41:18.423] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:18.423] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:18.423] .init = FALSE) [18:41:18.423] } [18:41:18.423] } [18:41:18.423] } [18:41:18.423] }) [18:41:18.423] if (TRUE) { [18:41:18.423] base::sink(type = "output", split = FALSE) [18:41:18.423] if (TRUE) { [18:41:18.423] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:18.423] } [18:41:18.423] else { [18:41:18.423] ...future.result["stdout"] <- base::list(NULL) [18:41:18.423] } [18:41:18.423] base::close(...future.stdout) [18:41:18.423] ...future.stdout <- NULL [18:41:18.423] } [18:41:18.423] ...future.result$conditions <- ...future.conditions [18:41:18.423] ...future.result$finished <- base::Sys.time() [18:41:18.423] ...future.result [18:41:18.423] } [18:41:18.427] assign_globals() ... [18:41:18.427] List of 5 [18:41:18.427] $ ...future.FUN :function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [18:41:18.427] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [18:41:18.427] $ future.call.arguments :List of 2 [18:41:18.427] ..$ collapse: chr "; " [18:41:18.427] ..$ maxHead : int 3 [18:41:18.427] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:18.427] $ ...future.elements_ii :List of 1 [18:41:18.427] ..$ a: Named chr [1:101] "hello" "1" "2" "3" ... [18:41:18.427] .. ..- attr(*, "names")= chr [1:101] "" "b1" "b2" "b3" ... [18:41:18.427] $ ...future.seeds_ii : NULL [18:41:18.427] $ ...future.globals.maxSize: NULL [18:41:18.427] - attr(*, "where")=List of 5 [18:41:18.427] ..$ ...future.FUN : [18:41:18.427] ..$ future.call.arguments : [18:41:18.427] ..$ ...future.elements_ii : [18:41:18.427] ..$ ...future.seeds_ii : [18:41:18.427] ..$ ...future.globals.maxSize: [18:41:18.427] - attr(*, "resolved")= logi FALSE [18:41:18.427] - attr(*, "total_size")= num 20301 [18:41:18.427] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:18.427] - attr(*, "already-done")= logi TRUE [18:41:18.434] - copied '...future.FUN' to environment [18:41:18.434] - copied 'future.call.arguments' to environment [18:41:18.434] - copied '...future.elements_ii' to environment [18:41:18.434] - copied '...future.seeds_ii' to environment [18:41:18.434] - copied '...future.globals.maxSize' to environment [18:41:18.435] assign_globals() ... done [18:41:18.435] plan(): Setting new future strategy stack: [18:41:18.436] List of future strategies: [18:41:18.436] 1. sequential: [18:41:18.436] - args: function (..., envir = parent.frame(), workers = "") [18:41:18.436] - tweaked: FALSE [18:41:18.436] - call: NULL [18:41:18.436] plan(): nbrOfWorkers() = 1 [18:41:18.437] plan(): Setting new future strategy stack: [18:41:18.438] List of future strategies: [18:41:18.438] 1. multisession: [18:41:18.438] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:41:18.438] - tweaked: FALSE [18:41:18.438] - call: plan(strategy) [18:41:18.440] plan(): nbrOfWorkers() = 1 [18:41:18.440] SequentialFuture started (and completed) [18:41:18.441] - Launch lazy future ... done [18:41:18.441] run() for 'SequentialFuture' ... done [18:41:18.441] Created future: [18:41:18.441] SequentialFuture: [18:41:18.441] Label: 'future_lapply-1' [18:41:18.441] Expression: [18:41:18.441] { [18:41:18.441] do.call(function(...) { [18:41:18.441] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.441] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:18.441] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.441] on.exit(options(oopts), add = TRUE) [18:41:18.441] } [18:41:18.441] { [18:41:18.441] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:18.441] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.441] ...future.FUN(...future.X_jj, ...) [18:41:18.441] }) [18:41:18.441] } [18:41:18.441] }, args = future.call.arguments) [18:41:18.441] } [18:41:18.441] Lazy evaluation: FALSE [18:41:18.441] Asynchronous evaluation: FALSE [18:41:18.441] Local evaluation: TRUE [18:41:18.441] Environment: R_GlobalEnv [18:41:18.441] Capture standard output: TRUE [18:41:18.441] Capture condition classes: 'condition' (excluding 'nothing') [18:41:18.441] Globals: 5 objects totaling 9.56 KiB (function '...future.FUN' of 7.17 KiB, DotDotDotList 'future.call.arguments' of 187 bytes, list '...future.elements_ii' of 2.15 KiB, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:18.441] Packages: 1 packages ('future') [18:41:18.441] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:18.441] Resolved: TRUE [18:41:18.441] Value: 68 bytes of class 'list' [18:41:18.441] Early signaling: FALSE [18:41:18.441] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:18.441] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:18.442] Chunk #1 of 1 ... DONE [18:41:18.442] Launching 1 futures (chunks) ... DONE [18:41:18.443] Resolving 1 futures (chunks) ... [18:41:18.443] resolve() on list ... [18:41:18.443] recursive: 0 [18:41:18.443] length: 1 [18:41:18.443] [18:41:18.443] resolved() for 'SequentialFuture' ... [18:41:18.444] - state: 'finished' [18:41:18.444] - run: TRUE [18:41:18.444] - result: 'FutureResult' [18:41:18.444] resolved() for 'SequentialFuture' ... done [18:41:18.444] Future #1 [18:41:18.445] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:18.445] - nx: 1 [18:41:18.445] - relay: TRUE [18:41:18.445] - stdout: TRUE [18:41:18.445] - signal: TRUE [18:41:18.445] - resignal: FALSE [18:41:18.445] - force: TRUE [18:41:18.446] - relayed: [n=1] FALSE [18:41:18.446] - queued futures: [n=1] FALSE [18:41:18.446] - until=1 [18:41:18.446] - relaying element #1 [18:41:18.446] - relayed: [n=1] TRUE [18:41:18.447] - queued futures: [n=1] TRUE [18:41:18.447] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:18.447] length: 0 (resolved future 1) [18:41:18.447] Relaying remaining futures [18:41:18.447] signalConditionsASAP(NULL, pos=0) ... [18:41:18.447] - nx: 1 [18:41:18.448] - relay: TRUE [18:41:18.448] - stdout: TRUE [18:41:18.448] - signal: TRUE [18:41:18.448] - resignal: FALSE [18:41:18.448] - force: TRUE [18:41:18.448] - relayed: [n=1] TRUE [18:41:18.448] - queued futures: [n=1] TRUE - flush all [18:41:18.449] - relayed: [n=1] TRUE [18:41:18.449] - queued futures: [n=1] TRUE [18:41:18.449] signalConditionsASAP(NULL, pos=0) ... done [18:41:18.449] resolve() on list ... DONE [18:41:18.449] - Number of value chunks collected: 1 [18:41:18.449] Resolving 1 futures (chunks) ... DONE [18:41:18.450] Reducing values from 1 chunks ... [18:41:18.450] - Number of values collected after concatenation: 1 [18:41:18.450] - Number of values expected: 1 [18:41:18.450] Reducing values from 1 chunks ... DONE [18:41:18.450] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [18:41:18.451] future_lapply() ... [18:41:18.454] Number of chunks: 2 [18:41:18.454] getGlobalsAndPackagesXApply() ... [18:41:18.455] - future.globals: TRUE [18:41:18.455] getGlobalsAndPackages() ... [18:41:18.455] Searching for globals... [18:41:18.456] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [18:41:18.457] Searching for globals ... DONE [18:41:18.457] Resolving globals: FALSE [18:41:18.457] The total size of the 1 globals is 911 bytes (911 bytes) [18:41:18.458] The total size of the 1 globals exported for future expression ('FUN()') is 911 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (911 bytes of class 'function') [18:41:18.458] - globals: [1] 'FUN' [18:41:18.458] - packages: [1] 'listenv' [18:41:18.458] getGlobalsAndPackages() ... DONE [18:41:18.458] - globals found/used: [n=1] 'FUN' [18:41:18.459] - needed namespaces: [n=1] 'listenv' [18:41:18.459] Finding globals ... DONE [18:41:18.459] - use_args: TRUE [18:41:18.459] - Getting '...' globals ... [18:41:18.459] resolve() on list ... [18:41:18.460] recursive: 0 [18:41:18.460] length: 1 [18:41:18.460] elements: '...' [18:41:18.460] length: 0 (resolved future 1) [18:41:18.460] resolve() on list ... DONE [18:41:18.460] - '...' content: [n=0] [18:41:18.461] List of 1 [18:41:18.461] $ ...: list() [18:41:18.461] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:18.461] - attr(*, "where")=List of 1 [18:41:18.461] ..$ ...: [18:41:18.461] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:18.461] - attr(*, "resolved")= logi TRUE [18:41:18.461] - attr(*, "total_size")= num NA [18:41:18.463] - Getting '...' globals ... DONE [18:41:18.464] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:18.464] List of 2 [18:41:18.464] $ ...future.FUN:function (x, ...) [18:41:18.464] $ ... : list() [18:41:18.464] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:18.464] - attr(*, "where")=List of 2 [18:41:18.464] ..$ ...future.FUN: [18:41:18.464] ..$ ... : [18:41:18.464] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:18.464] - attr(*, "resolved")= logi FALSE [18:41:18.464] - attr(*, "total_size")= int 8145 [18:41:18.467] Packages to be attached in all futures: [n=1] 'listenv' [18:41:18.467] getGlobalsAndPackagesXApply() ... DONE [18:41:18.468] Number of futures (= number of chunks): 2 [18:41:18.468] Launching 2 futures (chunks) ... [18:41:18.468] Chunk #1 of 2 ... [18:41:18.468] - Finding globals in 'X' for chunk #1 ... [18:41:18.468] getGlobalsAndPackages() ... [18:41:18.468] Searching for globals... [18:41:18.469] [18:41:18.469] Searching for globals ... DONE [18:41:18.469] - globals: [0] [18:41:18.469] getGlobalsAndPackages() ... DONE [18:41:18.470] + additional globals found: [n=0] [18:41:18.470] + additional namespaces needed: [n=0] [18:41:18.470] - Finding globals in 'X' for chunk #1 ... DONE [18:41:18.470] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:18.470] - seeds: [18:41:18.470] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.471] getGlobalsAndPackages() ... [18:41:18.471] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.471] Resolving globals: FALSE [18:41:18.471] Tweak future expression to call with '...' arguments ... [18:41:18.471] { [18:41:18.471] do.call(function(...) { [18:41:18.471] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.471] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:18.471] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.471] on.exit(options(oopts), add = TRUE) [18:41:18.471] } [18:41:18.471] { [18:41:18.471] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:18.471] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.471] ...future.FUN(...future.X_jj, ...) [18:41:18.471] }) [18:41:18.471] } [18:41:18.471] }, args = future.call.arguments) [18:41:18.471] } [18:41:18.472] Tweak future expression to call with '...' arguments ... DONE [18:41:18.472] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.472] - packages: [1] 'listenv' [18:41:18.473] getGlobalsAndPackages() ... DONE [18:41:18.473] run() for 'Future' ... [18:41:18.473] - state: 'created' [18:41:18.473] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:18.476] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:18.476] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:18.476] - Field: 'label' [18:41:18.476] - Field: 'local' [18:41:18.476] - Field: 'owner' [18:41:18.477] - Field: 'envir' [18:41:18.477] - Field: 'packages' [18:41:18.477] - Field: 'gc' [18:41:18.477] - Field: 'conditions' [18:41:18.477] - Field: 'expr' [18:41:18.477] - Field: 'uuid' [18:41:18.478] - Field: 'seed' [18:41:18.478] - Field: 'version' [18:41:18.478] - Field: 'result' [18:41:18.478] - Field: 'asynchronous' [18:41:18.478] - Field: 'calls' [18:41:18.478] - Field: 'globals' [18:41:18.479] - Field: 'stdout' [18:41:18.479] - Field: 'earlySignal' [18:41:18.479] - Field: 'lazy' [18:41:18.479] - Field: 'state' [18:41:18.479] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:18.479] - Launch lazy future ... [18:41:18.480] Packages needed by the future expression (n = 1): 'listenv' [18:41:18.480] Packages needed by future strategies (n = 0): [18:41:18.480] { [18:41:18.480] { [18:41:18.480] { [18:41:18.480] ...future.startTime <- base::Sys.time() [18:41:18.480] { [18:41:18.480] { [18:41:18.480] { [18:41:18.480] { [18:41:18.480] base::local({ [18:41:18.480] has_future <- base::requireNamespace("future", [18:41:18.480] quietly = TRUE) [18:41:18.480] if (has_future) { [18:41:18.480] ns <- base::getNamespace("future") [18:41:18.480] version <- ns[[".package"]][["version"]] [18:41:18.480] if (is.null(version)) [18:41:18.480] version <- utils::packageVersion("future") [18:41:18.480] } [18:41:18.480] else { [18:41:18.480] version <- NULL [18:41:18.480] } [18:41:18.480] if (!has_future || version < "1.8.0") { [18:41:18.480] info <- base::c(r_version = base::gsub("R version ", [18:41:18.480] "", base::R.version$version.string), [18:41:18.480] platform = base::sprintf("%s (%s-bit)", [18:41:18.480] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:18.480] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:18.480] "release", "version")], collapse = " "), [18:41:18.480] hostname = base::Sys.info()[["nodename"]]) [18:41:18.480] info <- base::sprintf("%s: %s", base::names(info), [18:41:18.480] info) [18:41:18.480] info <- base::paste(info, collapse = "; ") [18:41:18.480] if (!has_future) { [18:41:18.480] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:18.480] info) [18:41:18.480] } [18:41:18.480] else { [18:41:18.480] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:18.480] info, version) [18:41:18.480] } [18:41:18.480] base::stop(msg) [18:41:18.480] } [18:41:18.480] }) [18:41:18.480] } [18:41:18.480] base::local({ [18:41:18.480] for (pkg in "listenv") { [18:41:18.480] base::loadNamespace(pkg) [18:41:18.480] base::library(pkg, character.only = TRUE) [18:41:18.480] } [18:41:18.480] }) [18:41:18.480] } [18:41:18.480] ...future.strategy.old <- future::plan("list") [18:41:18.480] options(future.plan = NULL) [18:41:18.480] Sys.unsetenv("R_FUTURE_PLAN") [18:41:18.480] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:18.480] } [18:41:18.480] ...future.workdir <- getwd() [18:41:18.480] } [18:41:18.480] ...future.oldOptions <- base::as.list(base::.Options) [18:41:18.480] ...future.oldEnvVars <- base::Sys.getenv() [18:41:18.480] } [18:41:18.480] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:18.480] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:18.480] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:18.480] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:18.480] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:18.480] future.stdout.windows.reencode = NULL, width = 80L) [18:41:18.480] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:18.480] base::names(...future.oldOptions)) [18:41:18.480] } [18:41:18.480] if (FALSE) { [18:41:18.480] } [18:41:18.480] else { [18:41:18.480] if (TRUE) { [18:41:18.480] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:18.480] open = "w") [18:41:18.480] } [18:41:18.480] else { [18:41:18.480] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:18.480] windows = "NUL", "/dev/null"), open = "w") [18:41:18.480] } [18:41:18.480] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:18.480] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:18.480] base::sink(type = "output", split = FALSE) [18:41:18.480] base::close(...future.stdout) [18:41:18.480] }, add = TRUE) [18:41:18.480] } [18:41:18.480] ...future.frame <- base::sys.nframe() [18:41:18.480] ...future.conditions <- base::list() [18:41:18.480] ...future.rng <- base::globalenv()$.Random.seed [18:41:18.480] if (FALSE) { [18:41:18.480] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:18.480] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:18.480] } [18:41:18.480] ...future.result <- base::tryCatch({ [18:41:18.480] base::withCallingHandlers({ [18:41:18.480] ...future.value <- base::withVisible(base::local({ [18:41:18.480] do.call(function(...) { [18:41:18.480] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.480] if (!identical(...future.globals.maxSize.org, [18:41:18.480] ...future.globals.maxSize)) { [18:41:18.480] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.480] on.exit(options(oopts), add = TRUE) [18:41:18.480] } [18:41:18.480] { [18:41:18.480] lapply(seq_along(...future.elements_ii), [18:41:18.480] FUN = function(jj) { [18:41:18.480] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.480] ...future.FUN(...future.X_jj, ...) [18:41:18.480] }) [18:41:18.480] } [18:41:18.480] }, args = future.call.arguments) [18:41:18.480] })) [18:41:18.480] future::FutureResult(value = ...future.value$value, [18:41:18.480] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:18.480] ...future.rng), globalenv = if (FALSE) [18:41:18.480] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:18.480] ...future.globalenv.names)) [18:41:18.480] else NULL, started = ...future.startTime, version = "1.8") [18:41:18.480] }, condition = base::local({ [18:41:18.480] c <- base::c [18:41:18.480] inherits <- base::inherits [18:41:18.480] invokeRestart <- base::invokeRestart [18:41:18.480] length <- base::length [18:41:18.480] list <- base::list [18:41:18.480] seq.int <- base::seq.int [18:41:18.480] signalCondition <- base::signalCondition [18:41:18.480] sys.calls <- base::sys.calls [18:41:18.480] `[[` <- base::`[[` [18:41:18.480] `+` <- base::`+` [18:41:18.480] `<<-` <- base::`<<-` [18:41:18.480] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:18.480] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:18.480] 3L)] [18:41:18.480] } [18:41:18.480] function(cond) { [18:41:18.480] is_error <- inherits(cond, "error") [18:41:18.480] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:18.480] NULL) [18:41:18.480] if (is_error) { [18:41:18.480] sessionInformation <- function() { [18:41:18.480] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:18.480] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:18.480] search = base::search(), system = base::Sys.info()) [18:41:18.480] } [18:41:18.480] ...future.conditions[[length(...future.conditions) + [18:41:18.480] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:18.480] cond$call), session = sessionInformation(), [18:41:18.480] timestamp = base::Sys.time(), signaled = 0L) [18:41:18.480] signalCondition(cond) [18:41:18.480] } [18:41:18.480] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:18.480] "immediateCondition"))) { [18:41:18.480] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:18.480] ...future.conditions[[length(...future.conditions) + [18:41:18.480] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:18.480] if (TRUE && !signal) { [18:41:18.480] muffleCondition <- function (cond, pattern = "^muffle") [18:41:18.480] { [18:41:18.480] inherits <- base::inherits [18:41:18.480] invokeRestart <- base::invokeRestart [18:41:18.480] is.null <- base::is.null [18:41:18.480] muffled <- FALSE [18:41:18.480] if (inherits(cond, "message")) { [18:41:18.480] muffled <- grepl(pattern, "muffleMessage") [18:41:18.480] if (muffled) [18:41:18.480] invokeRestart("muffleMessage") [18:41:18.480] } [18:41:18.480] else if (inherits(cond, "warning")) { [18:41:18.480] muffled <- grepl(pattern, "muffleWarning") [18:41:18.480] if (muffled) [18:41:18.480] invokeRestart("muffleWarning") [18:41:18.480] } [18:41:18.480] else if (inherits(cond, "condition")) { [18:41:18.480] if (!is.null(pattern)) { [18:41:18.480] computeRestarts <- base::computeRestarts [18:41:18.480] grepl <- base::grepl [18:41:18.480] restarts <- computeRestarts(cond) [18:41:18.480] for (restart in restarts) { [18:41:18.480] name <- restart$name [18:41:18.480] if (is.null(name)) [18:41:18.480] next [18:41:18.480] if (!grepl(pattern, name)) [18:41:18.480] next [18:41:18.480] invokeRestart(restart) [18:41:18.480] muffled <- TRUE [18:41:18.480] break [18:41:18.480] } [18:41:18.480] } [18:41:18.480] } [18:41:18.480] invisible(muffled) [18:41:18.480] } [18:41:18.480] muffleCondition(cond, pattern = "^muffle") [18:41:18.480] } [18:41:18.480] } [18:41:18.480] else { [18:41:18.480] if (TRUE) { [18:41:18.480] muffleCondition <- function (cond, pattern = "^muffle") [18:41:18.480] { [18:41:18.480] inherits <- base::inherits [18:41:18.480] invokeRestart <- base::invokeRestart [18:41:18.480] is.null <- base::is.null [18:41:18.480] muffled <- FALSE [18:41:18.480] if (inherits(cond, "message")) { [18:41:18.480] muffled <- grepl(pattern, "muffleMessage") [18:41:18.480] if (muffled) [18:41:18.480] invokeRestart("muffleMessage") [18:41:18.480] } [18:41:18.480] else if (inherits(cond, "warning")) { [18:41:18.480] muffled <- grepl(pattern, "muffleWarning") [18:41:18.480] if (muffled) [18:41:18.480] invokeRestart("muffleWarning") [18:41:18.480] } [18:41:18.480] else if (inherits(cond, "condition")) { [18:41:18.480] if (!is.null(pattern)) { [18:41:18.480] computeRestarts <- base::computeRestarts [18:41:18.480] grepl <- base::grepl [18:41:18.480] restarts <- computeRestarts(cond) [18:41:18.480] for (restart in restarts) { [18:41:18.480] name <- restart$name [18:41:18.480] if (is.null(name)) [18:41:18.480] next [18:41:18.480] if (!grepl(pattern, name)) [18:41:18.480] next [18:41:18.480] invokeRestart(restart) [18:41:18.480] muffled <- TRUE [18:41:18.480] break [18:41:18.480] } [18:41:18.480] } [18:41:18.480] } [18:41:18.480] invisible(muffled) [18:41:18.480] } [18:41:18.480] muffleCondition(cond, pattern = "^muffle") [18:41:18.480] } [18:41:18.480] } [18:41:18.480] } [18:41:18.480] })) [18:41:18.480] }, error = function(ex) { [18:41:18.480] base::structure(base::list(value = NULL, visible = NULL, [18:41:18.480] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:18.480] ...future.rng), started = ...future.startTime, [18:41:18.480] finished = Sys.time(), session_uuid = NA_character_, [18:41:18.480] version = "1.8"), class = "FutureResult") [18:41:18.480] }, finally = { [18:41:18.480] if (!identical(...future.workdir, getwd())) [18:41:18.480] setwd(...future.workdir) [18:41:18.480] { [18:41:18.480] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:18.480] ...future.oldOptions$nwarnings <- NULL [18:41:18.480] } [18:41:18.480] base::options(...future.oldOptions) [18:41:18.480] if (.Platform$OS.type == "windows") { [18:41:18.480] old_names <- names(...future.oldEnvVars) [18:41:18.480] envs <- base::Sys.getenv() [18:41:18.480] names <- names(envs) [18:41:18.480] common <- intersect(names, old_names) [18:41:18.480] added <- setdiff(names, old_names) [18:41:18.480] removed <- setdiff(old_names, names) [18:41:18.480] changed <- common[...future.oldEnvVars[common] != [18:41:18.480] envs[common]] [18:41:18.480] NAMES <- toupper(changed) [18:41:18.480] args <- list() [18:41:18.480] for (kk in seq_along(NAMES)) { [18:41:18.480] name <- changed[[kk]] [18:41:18.480] NAME <- NAMES[[kk]] [18:41:18.480] if (name != NAME && is.element(NAME, old_names)) [18:41:18.480] next [18:41:18.480] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:18.480] } [18:41:18.480] NAMES <- toupper(added) [18:41:18.480] for (kk in seq_along(NAMES)) { [18:41:18.480] name <- added[[kk]] [18:41:18.480] NAME <- NAMES[[kk]] [18:41:18.480] if (name != NAME && is.element(NAME, old_names)) [18:41:18.480] next [18:41:18.480] args[[name]] <- "" [18:41:18.480] } [18:41:18.480] NAMES <- toupper(removed) [18:41:18.480] for (kk in seq_along(NAMES)) { [18:41:18.480] name <- removed[[kk]] [18:41:18.480] NAME <- NAMES[[kk]] [18:41:18.480] if (name != NAME && is.element(NAME, old_names)) [18:41:18.480] next [18:41:18.480] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:18.480] } [18:41:18.480] if (length(args) > 0) [18:41:18.480] base::do.call(base::Sys.setenv, args = args) [18:41:18.480] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:18.480] } [18:41:18.480] else { [18:41:18.480] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:18.480] } [18:41:18.480] { [18:41:18.480] if (base::length(...future.futureOptionsAdded) > [18:41:18.480] 0L) { [18:41:18.480] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:18.480] base::names(opts) <- ...future.futureOptionsAdded [18:41:18.480] base::options(opts) [18:41:18.480] } [18:41:18.480] { [18:41:18.480] { [18:41:18.480] NULL [18:41:18.480] RNGkind("Mersenne-Twister") [18:41:18.480] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:18.480] inherits = FALSE) [18:41:18.480] } [18:41:18.480] options(future.plan = NULL) [18:41:18.480] if (is.na(NA_character_)) [18:41:18.480] Sys.unsetenv("R_FUTURE_PLAN") [18:41:18.480] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:18.480] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:18.480] .init = FALSE) [18:41:18.480] } [18:41:18.480] } [18:41:18.480] } [18:41:18.480] }) [18:41:18.480] if (TRUE) { [18:41:18.480] base::sink(type = "output", split = FALSE) [18:41:18.480] if (TRUE) { [18:41:18.480] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:18.480] } [18:41:18.480] else { [18:41:18.480] ...future.result["stdout"] <- base::list(NULL) [18:41:18.480] } [18:41:18.480] base::close(...future.stdout) [18:41:18.480] ...future.stdout <- NULL [18:41:18.480] } [18:41:18.480] ...future.result$conditions <- ...future.conditions [18:41:18.480] ...future.result$finished <- base::Sys.time() [18:41:18.480] ...future.result [18:41:18.480] } [18:41:18.484] assign_globals() ... [18:41:18.485] List of 5 [18:41:18.485] $ ...future.FUN :function (x, ...) [18:41:18.485] $ future.call.arguments : list() [18:41:18.485] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:18.485] $ ...future.elements_ii :List of 1 [18:41:18.485] ..$ a:Classes 'listenv', 'environment' [18:41:18.485] $ ...future.seeds_ii : NULL [18:41:18.485] $ ...future.globals.maxSize: NULL [18:41:18.485] - attr(*, "where")=List of 5 [18:41:18.485] ..$ ...future.FUN : [18:41:18.485] ..$ future.call.arguments : [18:41:18.485] ..$ ...future.elements_ii : [18:41:18.485] ..$ ...future.seeds_ii : [18:41:18.485] ..$ ...future.globals.maxSize: [18:41:18.485] - attr(*, "resolved")= logi FALSE [18:41:18.485] - attr(*, "total_size")= num 8145 [18:41:18.485] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:18.485] - attr(*, "already-done")= logi TRUE [18:41:18.490] - copied '...future.FUN' to environment [18:41:18.491] - copied 'future.call.arguments' to environment [18:41:18.491] - copied '...future.elements_ii' to environment [18:41:18.491] - copied '...future.seeds_ii' to environment [18:41:18.491] - copied '...future.globals.maxSize' to environment [18:41:18.491] assign_globals() ... done [18:41:18.492] plan(): Setting new future strategy stack: [18:41:18.492] List of future strategies: [18:41:18.492] 1. sequential: [18:41:18.492] - args: function (..., envir = parent.frame(), workers = "") [18:41:18.492] - tweaked: FALSE [18:41:18.492] - call: NULL [18:41:18.493] plan(): nbrOfWorkers() = 1 [18:41:18.494] plan(): Setting new future strategy stack: [18:41:18.494] List of future strategies: [18:41:18.494] 1. multisession: [18:41:18.494] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:41:18.494] - tweaked: FALSE [18:41:18.494] - call: plan(strategy) [18:41:18.497] plan(): nbrOfWorkers() = 1 [18:41:18.497] SequentialFuture started (and completed) [18:41:18.497] - Launch lazy future ... done [18:41:18.497] run() for 'SequentialFuture' ... done [18:41:18.498] Created future: [18:41:18.498] SequentialFuture: [18:41:18.498] Label: 'future_lapply-1' [18:41:18.498] Expression: [18:41:18.498] { [18:41:18.498] do.call(function(...) { [18:41:18.498] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.498] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:18.498] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.498] on.exit(options(oopts), add = TRUE) [18:41:18.498] } [18:41:18.498] { [18:41:18.498] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:18.498] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.498] ...future.FUN(...future.X_jj, ...) [18:41:18.498] }) [18:41:18.498] } [18:41:18.498] }, args = future.call.arguments) [18:41:18.498] } [18:41:18.498] Lazy evaluation: FALSE [18:41:18.498] Asynchronous evaluation: FALSE [18:41:18.498] Local evaluation: TRUE [18:41:18.498] Environment: R_GlobalEnv [18:41:18.498] Capture standard output: TRUE [18:41:18.498] Capture condition classes: 'condition' (excluding 'nothing') [18:41:18.498] Globals: 5 objects totaling 1.59 KiB (function '...future.FUN' of 911 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 569 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:18.498] Packages: 1 packages ('listenv') [18:41:18.498] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:18.498] Resolved: TRUE [18:41:18.498] Value: 90 bytes of class 'list' [18:41:18.498] Early signaling: FALSE [18:41:18.498] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:18.498] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:18.499] Chunk #1 of 2 ... DONE [18:41:18.499] Chunk #2 of 2 ... [18:41:18.499] - Finding globals in 'X' for chunk #2 ... [18:41:18.499] getGlobalsAndPackages() ... [18:41:18.499] Searching for globals... [18:41:18.500] [18:41:18.500] Searching for globals ... DONE [18:41:18.500] - globals: [0] [18:41:18.500] getGlobalsAndPackages() ... DONE [18:41:18.501] + additional globals found: [n=0] [18:41:18.501] + additional namespaces needed: [n=0] [18:41:18.501] - Finding globals in 'X' for chunk #2 ... DONE [18:41:18.501] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:18.501] - seeds: [18:41:18.501] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.502] getGlobalsAndPackages() ... [18:41:18.502] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.502] Resolving globals: FALSE [18:41:18.502] Tweak future expression to call with '...' arguments ... [18:41:18.502] { [18:41:18.502] do.call(function(...) { [18:41:18.502] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.502] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:18.502] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.502] on.exit(options(oopts), add = TRUE) [18:41:18.502] } [18:41:18.502] { [18:41:18.502] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:18.502] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.502] ...future.FUN(...future.X_jj, ...) [18:41:18.502] }) [18:41:18.502] } [18:41:18.502] }, args = future.call.arguments) [18:41:18.502] } [18:41:18.503] Tweak future expression to call with '...' arguments ... DONE [18:41:18.503] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.503] - packages: [1] 'listenv' [18:41:18.504] getGlobalsAndPackages() ... DONE [18:41:18.504] run() for 'Future' ... [18:41:18.504] - state: 'created' [18:41:18.504] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:18.507] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:18.507] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:18.507] - Field: 'label' [18:41:18.507] - Field: 'local' [18:41:18.507] - Field: 'owner' [18:41:18.508] - Field: 'envir' [18:41:18.508] - Field: 'packages' [18:41:18.508] - Field: 'gc' [18:41:18.508] - Field: 'conditions' [18:41:18.508] - Field: 'expr' [18:41:18.509] - Field: 'uuid' [18:41:18.509] - Field: 'seed' [18:41:18.509] - Field: 'version' [18:41:18.509] - Field: 'result' [18:41:18.509] - Field: 'asynchronous' [18:41:18.509] - Field: 'calls' [18:41:18.510] - Field: 'globals' [18:41:18.510] - Field: 'stdout' [18:41:18.510] - Field: 'earlySignal' [18:41:18.510] - Field: 'lazy' [18:41:18.510] - Field: 'state' [18:41:18.510] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:18.511] - Launch lazy future ... [18:41:18.511] Packages needed by the future expression (n = 1): 'listenv' [18:41:18.511] Packages needed by future strategies (n = 0): [18:41:18.512] { [18:41:18.512] { [18:41:18.512] { [18:41:18.512] ...future.startTime <- base::Sys.time() [18:41:18.512] { [18:41:18.512] { [18:41:18.512] { [18:41:18.512] { [18:41:18.512] base::local({ [18:41:18.512] has_future <- base::requireNamespace("future", [18:41:18.512] quietly = TRUE) [18:41:18.512] if (has_future) { [18:41:18.512] ns <- base::getNamespace("future") [18:41:18.512] version <- ns[[".package"]][["version"]] [18:41:18.512] if (is.null(version)) [18:41:18.512] version <- utils::packageVersion("future") [18:41:18.512] } [18:41:18.512] else { [18:41:18.512] version <- NULL [18:41:18.512] } [18:41:18.512] if (!has_future || version < "1.8.0") { [18:41:18.512] info <- base::c(r_version = base::gsub("R version ", [18:41:18.512] "", base::R.version$version.string), [18:41:18.512] platform = base::sprintf("%s (%s-bit)", [18:41:18.512] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:18.512] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:18.512] "release", "version")], collapse = " "), [18:41:18.512] hostname = base::Sys.info()[["nodename"]]) [18:41:18.512] info <- base::sprintf("%s: %s", base::names(info), [18:41:18.512] info) [18:41:18.512] info <- base::paste(info, collapse = "; ") [18:41:18.512] if (!has_future) { [18:41:18.512] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:18.512] info) [18:41:18.512] } [18:41:18.512] else { [18:41:18.512] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:18.512] info, version) [18:41:18.512] } [18:41:18.512] base::stop(msg) [18:41:18.512] } [18:41:18.512] }) [18:41:18.512] } [18:41:18.512] base::local({ [18:41:18.512] for (pkg in "listenv") { [18:41:18.512] base::loadNamespace(pkg) [18:41:18.512] base::library(pkg, character.only = TRUE) [18:41:18.512] } [18:41:18.512] }) [18:41:18.512] } [18:41:18.512] ...future.strategy.old <- future::plan("list") [18:41:18.512] options(future.plan = NULL) [18:41:18.512] Sys.unsetenv("R_FUTURE_PLAN") [18:41:18.512] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:18.512] } [18:41:18.512] ...future.workdir <- getwd() [18:41:18.512] } [18:41:18.512] ...future.oldOptions <- base::as.list(base::.Options) [18:41:18.512] ...future.oldEnvVars <- base::Sys.getenv() [18:41:18.512] } [18:41:18.512] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:18.512] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:18.512] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:18.512] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:18.512] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:18.512] future.stdout.windows.reencode = NULL, width = 80L) [18:41:18.512] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:18.512] base::names(...future.oldOptions)) [18:41:18.512] } [18:41:18.512] if (FALSE) { [18:41:18.512] } [18:41:18.512] else { [18:41:18.512] if (TRUE) { [18:41:18.512] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:18.512] open = "w") [18:41:18.512] } [18:41:18.512] else { [18:41:18.512] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:18.512] windows = "NUL", "/dev/null"), open = "w") [18:41:18.512] } [18:41:18.512] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:18.512] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:18.512] base::sink(type = "output", split = FALSE) [18:41:18.512] base::close(...future.stdout) [18:41:18.512] }, add = TRUE) [18:41:18.512] } [18:41:18.512] ...future.frame <- base::sys.nframe() [18:41:18.512] ...future.conditions <- base::list() [18:41:18.512] ...future.rng <- base::globalenv()$.Random.seed [18:41:18.512] if (FALSE) { [18:41:18.512] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:18.512] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:18.512] } [18:41:18.512] ...future.result <- base::tryCatch({ [18:41:18.512] base::withCallingHandlers({ [18:41:18.512] ...future.value <- base::withVisible(base::local({ [18:41:18.512] do.call(function(...) { [18:41:18.512] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.512] if (!identical(...future.globals.maxSize.org, [18:41:18.512] ...future.globals.maxSize)) { [18:41:18.512] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.512] on.exit(options(oopts), add = TRUE) [18:41:18.512] } [18:41:18.512] { [18:41:18.512] lapply(seq_along(...future.elements_ii), [18:41:18.512] FUN = function(jj) { [18:41:18.512] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.512] ...future.FUN(...future.X_jj, ...) [18:41:18.512] }) [18:41:18.512] } [18:41:18.512] }, args = future.call.arguments) [18:41:18.512] })) [18:41:18.512] future::FutureResult(value = ...future.value$value, [18:41:18.512] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:18.512] ...future.rng), globalenv = if (FALSE) [18:41:18.512] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:18.512] ...future.globalenv.names)) [18:41:18.512] else NULL, started = ...future.startTime, version = "1.8") [18:41:18.512] }, condition = base::local({ [18:41:18.512] c <- base::c [18:41:18.512] inherits <- base::inherits [18:41:18.512] invokeRestart <- base::invokeRestart [18:41:18.512] length <- base::length [18:41:18.512] list <- base::list [18:41:18.512] seq.int <- base::seq.int [18:41:18.512] signalCondition <- base::signalCondition [18:41:18.512] sys.calls <- base::sys.calls [18:41:18.512] `[[` <- base::`[[` [18:41:18.512] `+` <- base::`+` [18:41:18.512] `<<-` <- base::`<<-` [18:41:18.512] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:18.512] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:18.512] 3L)] [18:41:18.512] } [18:41:18.512] function(cond) { [18:41:18.512] is_error <- inherits(cond, "error") [18:41:18.512] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:18.512] NULL) [18:41:18.512] if (is_error) { [18:41:18.512] sessionInformation <- function() { [18:41:18.512] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:18.512] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:18.512] search = base::search(), system = base::Sys.info()) [18:41:18.512] } [18:41:18.512] ...future.conditions[[length(...future.conditions) + [18:41:18.512] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:18.512] cond$call), session = sessionInformation(), [18:41:18.512] timestamp = base::Sys.time(), signaled = 0L) [18:41:18.512] signalCondition(cond) [18:41:18.512] } [18:41:18.512] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:18.512] "immediateCondition"))) { [18:41:18.512] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:18.512] ...future.conditions[[length(...future.conditions) + [18:41:18.512] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:18.512] if (TRUE && !signal) { [18:41:18.512] muffleCondition <- function (cond, pattern = "^muffle") [18:41:18.512] { [18:41:18.512] inherits <- base::inherits [18:41:18.512] invokeRestart <- base::invokeRestart [18:41:18.512] is.null <- base::is.null [18:41:18.512] muffled <- FALSE [18:41:18.512] if (inherits(cond, "message")) { [18:41:18.512] muffled <- grepl(pattern, "muffleMessage") [18:41:18.512] if (muffled) [18:41:18.512] invokeRestart("muffleMessage") [18:41:18.512] } [18:41:18.512] else if (inherits(cond, "warning")) { [18:41:18.512] muffled <- grepl(pattern, "muffleWarning") [18:41:18.512] if (muffled) [18:41:18.512] invokeRestart("muffleWarning") [18:41:18.512] } [18:41:18.512] else if (inherits(cond, "condition")) { [18:41:18.512] if (!is.null(pattern)) { [18:41:18.512] computeRestarts <- base::computeRestarts [18:41:18.512] grepl <- base::grepl [18:41:18.512] restarts <- computeRestarts(cond) [18:41:18.512] for (restart in restarts) { [18:41:18.512] name <- restart$name [18:41:18.512] if (is.null(name)) [18:41:18.512] next [18:41:18.512] if (!grepl(pattern, name)) [18:41:18.512] next [18:41:18.512] invokeRestart(restart) [18:41:18.512] muffled <- TRUE [18:41:18.512] break [18:41:18.512] } [18:41:18.512] } [18:41:18.512] } [18:41:18.512] invisible(muffled) [18:41:18.512] } [18:41:18.512] muffleCondition(cond, pattern = "^muffle") [18:41:18.512] } [18:41:18.512] } [18:41:18.512] else { [18:41:18.512] if (TRUE) { [18:41:18.512] muffleCondition <- function (cond, pattern = "^muffle") [18:41:18.512] { [18:41:18.512] inherits <- base::inherits [18:41:18.512] invokeRestart <- base::invokeRestart [18:41:18.512] is.null <- base::is.null [18:41:18.512] muffled <- FALSE [18:41:18.512] if (inherits(cond, "message")) { [18:41:18.512] muffled <- grepl(pattern, "muffleMessage") [18:41:18.512] if (muffled) [18:41:18.512] invokeRestart("muffleMessage") [18:41:18.512] } [18:41:18.512] else if (inherits(cond, "warning")) { [18:41:18.512] muffled <- grepl(pattern, "muffleWarning") [18:41:18.512] if (muffled) [18:41:18.512] invokeRestart("muffleWarning") [18:41:18.512] } [18:41:18.512] else if (inherits(cond, "condition")) { [18:41:18.512] if (!is.null(pattern)) { [18:41:18.512] computeRestarts <- base::computeRestarts [18:41:18.512] grepl <- base::grepl [18:41:18.512] restarts <- computeRestarts(cond) [18:41:18.512] for (restart in restarts) { [18:41:18.512] name <- restart$name [18:41:18.512] if (is.null(name)) [18:41:18.512] next [18:41:18.512] if (!grepl(pattern, name)) [18:41:18.512] next [18:41:18.512] invokeRestart(restart) [18:41:18.512] muffled <- TRUE [18:41:18.512] break [18:41:18.512] } [18:41:18.512] } [18:41:18.512] } [18:41:18.512] invisible(muffled) [18:41:18.512] } [18:41:18.512] muffleCondition(cond, pattern = "^muffle") [18:41:18.512] } [18:41:18.512] } [18:41:18.512] } [18:41:18.512] })) [18:41:18.512] }, error = function(ex) { [18:41:18.512] base::structure(base::list(value = NULL, visible = NULL, [18:41:18.512] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:18.512] ...future.rng), started = ...future.startTime, [18:41:18.512] finished = Sys.time(), session_uuid = NA_character_, [18:41:18.512] version = "1.8"), class = "FutureResult") [18:41:18.512] }, finally = { [18:41:18.512] if (!identical(...future.workdir, getwd())) [18:41:18.512] setwd(...future.workdir) [18:41:18.512] { [18:41:18.512] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:18.512] ...future.oldOptions$nwarnings <- NULL [18:41:18.512] } [18:41:18.512] base::options(...future.oldOptions) [18:41:18.512] if (.Platform$OS.type == "windows") { [18:41:18.512] old_names <- names(...future.oldEnvVars) [18:41:18.512] envs <- base::Sys.getenv() [18:41:18.512] names <- names(envs) [18:41:18.512] common <- intersect(names, old_names) [18:41:18.512] added <- setdiff(names, old_names) [18:41:18.512] removed <- setdiff(old_names, names) [18:41:18.512] changed <- common[...future.oldEnvVars[common] != [18:41:18.512] envs[common]] [18:41:18.512] NAMES <- toupper(changed) [18:41:18.512] args <- list() [18:41:18.512] for (kk in seq_along(NAMES)) { [18:41:18.512] name <- changed[[kk]] [18:41:18.512] NAME <- NAMES[[kk]] [18:41:18.512] if (name != NAME && is.element(NAME, old_names)) [18:41:18.512] next [18:41:18.512] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:18.512] } [18:41:18.512] NAMES <- toupper(added) [18:41:18.512] for (kk in seq_along(NAMES)) { [18:41:18.512] name <- added[[kk]] [18:41:18.512] NAME <- NAMES[[kk]] [18:41:18.512] if (name != NAME && is.element(NAME, old_names)) [18:41:18.512] next [18:41:18.512] args[[name]] <- "" [18:41:18.512] } [18:41:18.512] NAMES <- toupper(removed) [18:41:18.512] for (kk in seq_along(NAMES)) { [18:41:18.512] name <- removed[[kk]] [18:41:18.512] NAME <- NAMES[[kk]] [18:41:18.512] if (name != NAME && is.element(NAME, old_names)) [18:41:18.512] next [18:41:18.512] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:18.512] } [18:41:18.512] if (length(args) > 0) [18:41:18.512] base::do.call(base::Sys.setenv, args = args) [18:41:18.512] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:18.512] } [18:41:18.512] else { [18:41:18.512] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:18.512] } [18:41:18.512] { [18:41:18.512] if (base::length(...future.futureOptionsAdded) > [18:41:18.512] 0L) { [18:41:18.512] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:18.512] base::names(opts) <- ...future.futureOptionsAdded [18:41:18.512] base::options(opts) [18:41:18.512] } [18:41:18.512] { [18:41:18.512] { [18:41:18.512] NULL [18:41:18.512] RNGkind("Mersenne-Twister") [18:41:18.512] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:18.512] inherits = FALSE) [18:41:18.512] } [18:41:18.512] options(future.plan = NULL) [18:41:18.512] if (is.na(NA_character_)) [18:41:18.512] Sys.unsetenv("R_FUTURE_PLAN") [18:41:18.512] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:18.512] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:18.512] .init = FALSE) [18:41:18.512] } [18:41:18.512] } [18:41:18.512] } [18:41:18.512] }) [18:41:18.512] if (TRUE) { [18:41:18.512] base::sink(type = "output", split = FALSE) [18:41:18.512] if (TRUE) { [18:41:18.512] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:18.512] } [18:41:18.512] else { [18:41:18.512] ...future.result["stdout"] <- base::list(NULL) [18:41:18.512] } [18:41:18.512] base::close(...future.stdout) [18:41:18.512] ...future.stdout <- NULL [18:41:18.512] } [18:41:18.512] ...future.result$conditions <- ...future.conditions [18:41:18.512] ...future.result$finished <- base::Sys.time() [18:41:18.512] ...future.result [18:41:18.512] } [18:41:18.524] assign_globals() ... [18:41:18.524] List of 5 [18:41:18.524] $ ...future.FUN :function (x, ...) [18:41:18.524] $ future.call.arguments : list() [18:41:18.524] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:18.524] $ ...future.elements_ii :List of 1 [18:41:18.524] ..$ b:Classes 'listenv', 'environment' [18:41:18.524] $ ...future.seeds_ii : NULL [18:41:18.524] $ ...future.globals.maxSize: NULL [18:41:18.524] - attr(*, "where")=List of 5 [18:41:18.524] ..$ ...future.FUN : [18:41:18.524] ..$ future.call.arguments : [18:41:18.524] ..$ ...future.elements_ii : [18:41:18.524] ..$ ...future.seeds_ii : [18:41:18.524] ..$ ...future.globals.maxSize: [18:41:18.524] - attr(*, "resolved")= logi FALSE [18:41:18.524] - attr(*, "total_size")= num 8145 [18:41:18.524] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:18.524] - attr(*, "already-done")= logi TRUE [18:41:18.530] - copied '...future.FUN' to environment [18:41:18.530] - copied 'future.call.arguments' to environment [18:41:18.530] - copied '...future.elements_ii' to environment [18:41:18.530] - copied '...future.seeds_ii' to environment [18:41:18.530] - copied '...future.globals.maxSize' to environment [18:41:18.531] assign_globals() ... done [18:41:18.531] plan(): Setting new future strategy stack: [18:41:18.531] List of future strategies: [18:41:18.531] 1. sequential: [18:41:18.531] - args: function (..., envir = parent.frame(), workers = "") [18:41:18.531] - tweaked: FALSE [18:41:18.531] - call: NULL [18:41:18.532] plan(): nbrOfWorkers() = 1 [18:41:18.533] plan(): Setting new future strategy stack: [18:41:18.533] List of future strategies: [18:41:18.533] 1. multisession: [18:41:18.533] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:41:18.533] - tweaked: FALSE [18:41:18.533] - call: plan(strategy) [18:41:18.536] plan(): nbrOfWorkers() = 1 [18:41:18.536] SequentialFuture started (and completed) [18:41:18.536] - Launch lazy future ... done [18:41:18.537] run() for 'SequentialFuture' ... done [18:41:18.537] Created future: [18:41:18.537] SequentialFuture: [18:41:18.537] Label: 'future_lapply-2' [18:41:18.537] Expression: [18:41:18.537] { [18:41:18.537] do.call(function(...) { [18:41:18.537] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.537] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:18.537] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.537] on.exit(options(oopts), add = TRUE) [18:41:18.537] } [18:41:18.537] { [18:41:18.537] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:18.537] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.537] ...future.FUN(...future.X_jj, ...) [18:41:18.537] }) [18:41:18.537] } [18:41:18.537] }, args = future.call.arguments) [18:41:18.537] } [18:41:18.537] Lazy evaluation: FALSE [18:41:18.537] Asynchronous evaluation: FALSE [18:41:18.537] Local evaluation: TRUE [18:41:18.537] Environment: R_GlobalEnv [18:41:18.537] Capture standard output: TRUE [18:41:18.537] Capture condition classes: 'condition' (excluding 'nothing') [18:41:18.537] Globals: 5 objects totaling 3.71 KiB (function '...future.FUN' of 911 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 2.67 KiB, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:18.537] Packages: 1 packages ('listenv') [18:41:18.537] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:18.537] Resolved: TRUE [18:41:18.537] Value: 108 bytes of class 'list' [18:41:18.537] Early signaling: FALSE [18:41:18.537] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:18.537] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:18.538] Chunk #2 of 2 ... DONE [18:41:18.538] Launching 2 futures (chunks) ... DONE [18:41:18.538] Resolving 2 futures (chunks) ... [18:41:18.539] resolve() on list ... [18:41:18.539] recursive: 0 [18:41:18.539] length: 2 [18:41:18.539] [18:41:18.539] resolved() for 'SequentialFuture' ... [18:41:18.539] - state: 'finished' [18:41:18.540] - run: TRUE [18:41:18.540] - result: 'FutureResult' [18:41:18.540] resolved() for 'SequentialFuture' ... done [18:41:18.540] Future #1 [18:41:18.540] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:18.540] - nx: 2 [18:41:18.541] - relay: TRUE [18:41:18.541] - stdout: TRUE [18:41:18.541] - signal: TRUE [18:41:18.541] - resignal: FALSE [18:41:18.541] - force: TRUE [18:41:18.541] - relayed: [n=2] FALSE, FALSE [18:41:18.541] - queued futures: [n=2] FALSE, FALSE [18:41:18.542] - until=1 [18:41:18.542] - relaying element #1 [18:41:18.542] - relayed: [n=2] TRUE, FALSE [18:41:18.542] - queued futures: [n=2] TRUE, FALSE [18:41:18.542] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:18.543] length: 1 (resolved future 1) [18:41:18.543] resolved() for 'SequentialFuture' ... [18:41:18.543] - state: 'finished' [18:41:18.543] - run: TRUE [18:41:18.543] - result: 'FutureResult' [18:41:18.543] resolved() for 'SequentialFuture' ... done [18:41:18.544] Future #2 [18:41:18.544] signalConditionsASAP(SequentialFuture, pos=2) ... [18:41:18.544] - nx: 2 [18:41:18.544] - relay: TRUE [18:41:18.544] - stdout: TRUE [18:41:18.544] - signal: TRUE [18:41:18.545] - resignal: FALSE [18:41:18.545] - force: TRUE [18:41:18.545] - relayed: [n=2] TRUE, FALSE [18:41:18.545] - queued futures: [n=2] TRUE, FALSE [18:41:18.545] - until=2 [18:41:18.545] - relaying element #2 [18:41:18.546] - relayed: [n=2] TRUE, TRUE [18:41:18.546] - queued futures: [n=2] TRUE, TRUE [18:41:18.546] signalConditionsASAP(SequentialFuture, pos=2) ... done [18:41:18.546] length: 0 (resolved future 2) [18:41:18.546] Relaying remaining futures [18:41:18.546] signalConditionsASAP(NULL, pos=0) ... [18:41:18.547] - nx: 2 [18:41:18.547] - relay: TRUE [18:41:18.547] - stdout: TRUE [18:41:18.547] - signal: TRUE [18:41:18.547] - resignal: FALSE [18:41:18.547] - force: TRUE [18:41:18.547] - relayed: [n=2] TRUE, TRUE [18:41:18.548] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:18.548] - relayed: [n=2] TRUE, TRUE [18:41:18.548] - queued futures: [n=2] TRUE, TRUE [18:41:18.548] signalConditionsASAP(NULL, pos=0) ... done [18:41:18.549] resolve() on list ... DONE [18:41:18.549] - Number of value chunks collected: 2 [18:41:18.549] Resolving 2 futures (chunks) ... DONE [18:41:18.549] Reducing values from 2 chunks ... [18:41:18.549] - Number of values collected after concatenation: 2 [18:41:18.549] - Number of values expected: 2 [18:41:18.550] Reducing values from 2 chunks ... DONE [18:41:18.550] future_lapply() ... DONE List of 1 $ y:List of 2 ..$ a: Named chr "A" .. ..- attr(*, "names")= chr "A" ..$ b: Named chr [1:2] "A" "B" .. ..- attr(*, "names")= chr [1:2] "A" "B" - future_lapply(x, FUN = vector, ...) ... [18:41:18.552] future_lapply() ... [18:41:18.554] Number of chunks: 1 [18:41:18.555] getGlobalsAndPackagesXApply() ... [18:41:18.555] - future.globals: TRUE [18:41:18.555] getGlobalsAndPackages() ... [18:41:18.555] Searching for globals... [18:41:18.556] - globals found: [2] 'FUN', '.Internal' [18:41:18.557] Searching for globals ... DONE [18:41:18.557] Resolving globals: FALSE [18:41:18.557] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:18.558] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:18.558] - globals: [1] 'FUN' [18:41:18.558] [18:41:18.558] getGlobalsAndPackages() ... DONE [18:41:18.558] - globals found/used: [n=1] 'FUN' [18:41:18.558] - needed namespaces: [n=0] [18:41:18.559] Finding globals ... DONE [18:41:18.559] - use_args: TRUE [18:41:18.559] - Getting '...' globals ... [18:41:18.559] resolve() on list ... [18:41:18.560] recursive: 0 [18:41:18.560] length: 1 [18:41:18.560] elements: '...' [18:41:18.560] length: 0 (resolved future 1) [18:41:18.560] resolve() on list ... DONE [18:41:18.560] - '...' content: [n=1] 'length' [18:41:18.561] List of 1 [18:41:18.561] $ ...:List of 1 [18:41:18.561] ..$ length: int 2 [18:41:18.561] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:18.561] - attr(*, "where")=List of 1 [18:41:18.561] ..$ ...: [18:41:18.561] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:18.561] - attr(*, "resolved")= logi TRUE [18:41:18.561] - attr(*, "total_size")= num NA [18:41:18.564] - Getting '...' globals ... DONE [18:41:18.564] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:18.564] List of 2 [18:41:18.564] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:18.564] $ ... :List of 1 [18:41:18.564] ..$ length: int 2 [18:41:18.564] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:18.564] - attr(*, "where")=List of 2 [18:41:18.564] ..$ ...future.FUN: [18:41:18.564] ..$ ... : [18:41:18.564] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:18.564] - attr(*, "resolved")= logi FALSE [18:41:18.564] - attr(*, "total_size")= int 4288 [18:41:18.569] Packages to be attached in all futures: [n=0] [18:41:18.569] getGlobalsAndPackagesXApply() ... DONE [18:41:18.569] Number of futures (= number of chunks): 1 [18:41:18.569] Launching 1 futures (chunks) ... [18:41:18.569] Chunk #1 of 1 ... [18:41:18.570] - Finding globals in 'X' for chunk #1 ... [18:41:18.570] getGlobalsAndPackages() ... [18:41:18.570] Searching for globals... [18:41:18.570] [18:41:18.570] Searching for globals ... DONE [18:41:18.571] - globals: [0] [18:41:18.571] getGlobalsAndPackages() ... DONE [18:41:18.571] + additional globals found: [n=0] [18:41:18.571] + additional namespaces needed: [n=0] [18:41:18.571] - Finding globals in 'X' for chunk #1 ... DONE [18:41:18.571] - seeds: [18:41:18.572] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.572] getGlobalsAndPackages() ... [18:41:18.572] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.572] Resolving globals: FALSE [18:41:18.572] Tweak future expression to call with '...' arguments ... [18:41:18.573] { [18:41:18.573] do.call(function(...) { [18:41:18.573] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.573] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:18.573] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.573] on.exit(options(oopts), add = TRUE) [18:41:18.573] } [18:41:18.573] { [18:41:18.573] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:18.573] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.573] ...future.FUN(...future.X_jj, ...) [18:41:18.573] }) [18:41:18.573] } [18:41:18.573] }, args = future.call.arguments) [18:41:18.573] } [18:41:18.573] Tweak future expression to call with '...' arguments ... DONE [18:41:18.574] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.574] [18:41:18.574] getGlobalsAndPackages() ... DONE [18:41:18.574] run() for 'Future' ... [18:41:18.575] - state: 'created' [18:41:18.575] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:18.577] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:18.577] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:18.578] - Field: 'label' [18:41:18.578] - Field: 'local' [18:41:18.578] - Field: 'owner' [18:41:18.578] - Field: 'envir' [18:41:18.578] - Field: 'packages' [18:41:18.578] - Field: 'gc' [18:41:18.579] - Field: 'conditions' [18:41:18.579] - Field: 'expr' [18:41:18.579] - Field: 'uuid' [18:41:18.579] - Field: 'seed' [18:41:18.579] - Field: 'version' [18:41:18.580] - Field: 'result' [18:41:18.580] - Field: 'asynchronous' [18:41:18.580] - Field: 'calls' [18:41:18.580] - Field: 'globals' [18:41:18.580] - Field: 'stdout' [18:41:18.580] - Field: 'earlySignal' [18:41:18.581] - Field: 'lazy' [18:41:18.581] - Field: 'state' [18:41:18.581] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:18.581] - Launch lazy future ... [18:41:18.581] Packages needed by the future expression (n = 0): [18:41:18.582] Packages needed by future strategies (n = 0): [18:41:18.582] { [18:41:18.582] { [18:41:18.582] { [18:41:18.582] ...future.startTime <- base::Sys.time() [18:41:18.582] { [18:41:18.582] { [18:41:18.582] { [18:41:18.582] base::local({ [18:41:18.582] has_future <- base::requireNamespace("future", [18:41:18.582] quietly = TRUE) [18:41:18.582] if (has_future) { [18:41:18.582] ns <- base::getNamespace("future") [18:41:18.582] version <- ns[[".package"]][["version"]] [18:41:18.582] if (is.null(version)) [18:41:18.582] version <- utils::packageVersion("future") [18:41:18.582] } [18:41:18.582] else { [18:41:18.582] version <- NULL [18:41:18.582] } [18:41:18.582] if (!has_future || version < "1.8.0") { [18:41:18.582] info <- base::c(r_version = base::gsub("R version ", [18:41:18.582] "", base::R.version$version.string), [18:41:18.582] platform = base::sprintf("%s (%s-bit)", [18:41:18.582] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:18.582] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:18.582] "release", "version")], collapse = " "), [18:41:18.582] hostname = base::Sys.info()[["nodename"]]) [18:41:18.582] info <- base::sprintf("%s: %s", base::names(info), [18:41:18.582] info) [18:41:18.582] info <- base::paste(info, collapse = "; ") [18:41:18.582] if (!has_future) { [18:41:18.582] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:18.582] info) [18:41:18.582] } [18:41:18.582] else { [18:41:18.582] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:18.582] info, version) [18:41:18.582] } [18:41:18.582] base::stop(msg) [18:41:18.582] } [18:41:18.582] }) [18:41:18.582] } [18:41:18.582] ...future.strategy.old <- future::plan("list") [18:41:18.582] options(future.plan = NULL) [18:41:18.582] Sys.unsetenv("R_FUTURE_PLAN") [18:41:18.582] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:18.582] } [18:41:18.582] ...future.workdir <- getwd() [18:41:18.582] } [18:41:18.582] ...future.oldOptions <- base::as.list(base::.Options) [18:41:18.582] ...future.oldEnvVars <- base::Sys.getenv() [18:41:18.582] } [18:41:18.582] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:18.582] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:18.582] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:18.582] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:18.582] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:18.582] future.stdout.windows.reencode = NULL, width = 80L) [18:41:18.582] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:18.582] base::names(...future.oldOptions)) [18:41:18.582] } [18:41:18.582] if (FALSE) { [18:41:18.582] } [18:41:18.582] else { [18:41:18.582] if (TRUE) { [18:41:18.582] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:18.582] open = "w") [18:41:18.582] } [18:41:18.582] else { [18:41:18.582] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:18.582] windows = "NUL", "/dev/null"), open = "w") [18:41:18.582] } [18:41:18.582] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:18.582] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:18.582] base::sink(type = "output", split = FALSE) [18:41:18.582] base::close(...future.stdout) [18:41:18.582] }, add = TRUE) [18:41:18.582] } [18:41:18.582] ...future.frame <- base::sys.nframe() [18:41:18.582] ...future.conditions <- base::list() [18:41:18.582] ...future.rng <- base::globalenv()$.Random.seed [18:41:18.582] if (FALSE) { [18:41:18.582] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:18.582] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:18.582] } [18:41:18.582] ...future.result <- base::tryCatch({ [18:41:18.582] base::withCallingHandlers({ [18:41:18.582] ...future.value <- base::withVisible(base::local({ [18:41:18.582] do.call(function(...) { [18:41:18.582] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.582] if (!identical(...future.globals.maxSize.org, [18:41:18.582] ...future.globals.maxSize)) { [18:41:18.582] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.582] on.exit(options(oopts), add = TRUE) [18:41:18.582] } [18:41:18.582] { [18:41:18.582] lapply(seq_along(...future.elements_ii), [18:41:18.582] FUN = function(jj) { [18:41:18.582] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.582] ...future.FUN(...future.X_jj, ...) [18:41:18.582] }) [18:41:18.582] } [18:41:18.582] }, args = future.call.arguments) [18:41:18.582] })) [18:41:18.582] future::FutureResult(value = ...future.value$value, [18:41:18.582] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:18.582] ...future.rng), globalenv = if (FALSE) [18:41:18.582] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:18.582] ...future.globalenv.names)) [18:41:18.582] else NULL, started = ...future.startTime, version = "1.8") [18:41:18.582] }, condition = base::local({ [18:41:18.582] c <- base::c [18:41:18.582] inherits <- base::inherits [18:41:18.582] invokeRestart <- base::invokeRestart [18:41:18.582] length <- base::length [18:41:18.582] list <- base::list [18:41:18.582] seq.int <- base::seq.int [18:41:18.582] signalCondition <- base::signalCondition [18:41:18.582] sys.calls <- base::sys.calls [18:41:18.582] `[[` <- base::`[[` [18:41:18.582] `+` <- base::`+` [18:41:18.582] `<<-` <- base::`<<-` [18:41:18.582] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:18.582] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:18.582] 3L)] [18:41:18.582] } [18:41:18.582] function(cond) { [18:41:18.582] is_error <- inherits(cond, "error") [18:41:18.582] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:18.582] NULL) [18:41:18.582] if (is_error) { [18:41:18.582] sessionInformation <- function() { [18:41:18.582] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:18.582] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:18.582] search = base::search(), system = base::Sys.info()) [18:41:18.582] } [18:41:18.582] ...future.conditions[[length(...future.conditions) + [18:41:18.582] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:18.582] cond$call), session = sessionInformation(), [18:41:18.582] timestamp = base::Sys.time(), signaled = 0L) [18:41:18.582] signalCondition(cond) [18:41:18.582] } [18:41:18.582] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:18.582] "immediateCondition"))) { [18:41:18.582] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:18.582] ...future.conditions[[length(...future.conditions) + [18:41:18.582] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:18.582] if (TRUE && !signal) { [18:41:18.582] muffleCondition <- function (cond, pattern = "^muffle") [18:41:18.582] { [18:41:18.582] inherits <- base::inherits [18:41:18.582] invokeRestart <- base::invokeRestart [18:41:18.582] is.null <- base::is.null [18:41:18.582] muffled <- FALSE [18:41:18.582] if (inherits(cond, "message")) { [18:41:18.582] muffled <- grepl(pattern, "muffleMessage") [18:41:18.582] if (muffled) [18:41:18.582] invokeRestart("muffleMessage") [18:41:18.582] } [18:41:18.582] else if (inherits(cond, "warning")) { [18:41:18.582] muffled <- grepl(pattern, "muffleWarning") [18:41:18.582] if (muffled) [18:41:18.582] invokeRestart("muffleWarning") [18:41:18.582] } [18:41:18.582] else if (inherits(cond, "condition")) { [18:41:18.582] if (!is.null(pattern)) { [18:41:18.582] computeRestarts <- base::computeRestarts [18:41:18.582] grepl <- base::grepl [18:41:18.582] restarts <- computeRestarts(cond) [18:41:18.582] for (restart in restarts) { [18:41:18.582] name <- restart$name [18:41:18.582] if (is.null(name)) [18:41:18.582] next [18:41:18.582] if (!grepl(pattern, name)) [18:41:18.582] next [18:41:18.582] invokeRestart(restart) [18:41:18.582] muffled <- TRUE [18:41:18.582] break [18:41:18.582] } [18:41:18.582] } [18:41:18.582] } [18:41:18.582] invisible(muffled) [18:41:18.582] } [18:41:18.582] muffleCondition(cond, pattern = "^muffle") [18:41:18.582] } [18:41:18.582] } [18:41:18.582] else { [18:41:18.582] if (TRUE) { [18:41:18.582] muffleCondition <- function (cond, pattern = "^muffle") [18:41:18.582] { [18:41:18.582] inherits <- base::inherits [18:41:18.582] invokeRestart <- base::invokeRestart [18:41:18.582] is.null <- base::is.null [18:41:18.582] muffled <- FALSE [18:41:18.582] if (inherits(cond, "message")) { [18:41:18.582] muffled <- grepl(pattern, "muffleMessage") [18:41:18.582] if (muffled) [18:41:18.582] invokeRestart("muffleMessage") [18:41:18.582] } [18:41:18.582] else if (inherits(cond, "warning")) { [18:41:18.582] muffled <- grepl(pattern, "muffleWarning") [18:41:18.582] if (muffled) [18:41:18.582] invokeRestart("muffleWarning") [18:41:18.582] } [18:41:18.582] else if (inherits(cond, "condition")) { [18:41:18.582] if (!is.null(pattern)) { [18:41:18.582] computeRestarts <- base::computeRestarts [18:41:18.582] grepl <- base::grepl [18:41:18.582] restarts <- computeRestarts(cond) [18:41:18.582] for (restart in restarts) { [18:41:18.582] name <- restart$name [18:41:18.582] if (is.null(name)) [18:41:18.582] next [18:41:18.582] if (!grepl(pattern, name)) [18:41:18.582] next [18:41:18.582] invokeRestart(restart) [18:41:18.582] muffled <- TRUE [18:41:18.582] break [18:41:18.582] } [18:41:18.582] } [18:41:18.582] } [18:41:18.582] invisible(muffled) [18:41:18.582] } [18:41:18.582] muffleCondition(cond, pattern = "^muffle") [18:41:18.582] } [18:41:18.582] } [18:41:18.582] } [18:41:18.582] })) [18:41:18.582] }, error = function(ex) { [18:41:18.582] base::structure(base::list(value = NULL, visible = NULL, [18:41:18.582] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:18.582] ...future.rng), started = ...future.startTime, [18:41:18.582] finished = Sys.time(), session_uuid = NA_character_, [18:41:18.582] version = "1.8"), class = "FutureResult") [18:41:18.582] }, finally = { [18:41:18.582] if (!identical(...future.workdir, getwd())) [18:41:18.582] setwd(...future.workdir) [18:41:18.582] { [18:41:18.582] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:18.582] ...future.oldOptions$nwarnings <- NULL [18:41:18.582] } [18:41:18.582] base::options(...future.oldOptions) [18:41:18.582] if (.Platform$OS.type == "windows") { [18:41:18.582] old_names <- names(...future.oldEnvVars) [18:41:18.582] envs <- base::Sys.getenv() [18:41:18.582] names <- names(envs) [18:41:18.582] common <- intersect(names, old_names) [18:41:18.582] added <- setdiff(names, old_names) [18:41:18.582] removed <- setdiff(old_names, names) [18:41:18.582] changed <- common[...future.oldEnvVars[common] != [18:41:18.582] envs[common]] [18:41:18.582] NAMES <- toupper(changed) [18:41:18.582] args <- list() [18:41:18.582] for (kk in seq_along(NAMES)) { [18:41:18.582] name <- changed[[kk]] [18:41:18.582] NAME <- NAMES[[kk]] [18:41:18.582] if (name != NAME && is.element(NAME, old_names)) [18:41:18.582] next [18:41:18.582] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:18.582] } [18:41:18.582] NAMES <- toupper(added) [18:41:18.582] for (kk in seq_along(NAMES)) { [18:41:18.582] name <- added[[kk]] [18:41:18.582] NAME <- NAMES[[kk]] [18:41:18.582] if (name != NAME && is.element(NAME, old_names)) [18:41:18.582] next [18:41:18.582] args[[name]] <- "" [18:41:18.582] } [18:41:18.582] NAMES <- toupper(removed) [18:41:18.582] for (kk in seq_along(NAMES)) { [18:41:18.582] name <- removed[[kk]] [18:41:18.582] NAME <- NAMES[[kk]] [18:41:18.582] if (name != NAME && is.element(NAME, old_names)) [18:41:18.582] next [18:41:18.582] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:18.582] } [18:41:18.582] if (length(args) > 0) [18:41:18.582] base::do.call(base::Sys.setenv, args = args) [18:41:18.582] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:18.582] } [18:41:18.582] else { [18:41:18.582] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:18.582] } [18:41:18.582] { [18:41:18.582] if (base::length(...future.futureOptionsAdded) > [18:41:18.582] 0L) { [18:41:18.582] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:18.582] base::names(opts) <- ...future.futureOptionsAdded [18:41:18.582] base::options(opts) [18:41:18.582] } [18:41:18.582] { [18:41:18.582] { [18:41:18.582] NULL [18:41:18.582] RNGkind("Mersenne-Twister") [18:41:18.582] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:18.582] inherits = FALSE) [18:41:18.582] } [18:41:18.582] options(future.plan = NULL) [18:41:18.582] if (is.na(NA_character_)) [18:41:18.582] Sys.unsetenv("R_FUTURE_PLAN") [18:41:18.582] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:18.582] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:18.582] .init = FALSE) [18:41:18.582] } [18:41:18.582] } [18:41:18.582] } [18:41:18.582] }) [18:41:18.582] if (TRUE) { [18:41:18.582] base::sink(type = "output", split = FALSE) [18:41:18.582] if (TRUE) { [18:41:18.582] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:18.582] } [18:41:18.582] else { [18:41:18.582] ...future.result["stdout"] <- base::list(NULL) [18:41:18.582] } [18:41:18.582] base::close(...future.stdout) [18:41:18.582] ...future.stdout <- NULL [18:41:18.582] } [18:41:18.582] ...future.result$conditions <- ...future.conditions [18:41:18.582] ...future.result$finished <- base::Sys.time() [18:41:18.582] ...future.result [18:41:18.582] } [18:41:18.586] assign_globals() ... [18:41:18.586] List of 5 [18:41:18.586] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:18.586] $ future.call.arguments :List of 1 [18:41:18.586] ..$ length: int 2 [18:41:18.586] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:18.586] $ ...future.elements_ii :List of 4 [18:41:18.586] ..$ a: chr "integer" [18:41:18.586] ..$ b: chr "numeric" [18:41:18.586] ..$ c: chr "character" [18:41:18.586] ..$ c: chr "list" [18:41:18.586] $ ...future.seeds_ii : NULL [18:41:18.586] $ ...future.globals.maxSize: NULL [18:41:18.586] - attr(*, "where")=List of 5 [18:41:18.586] ..$ ...future.FUN : [18:41:18.586] ..$ future.call.arguments : [18:41:18.586] ..$ ...future.elements_ii : [18:41:18.586] ..$ ...future.seeds_ii : [18:41:18.586] ..$ ...future.globals.maxSize: [18:41:18.586] - attr(*, "resolved")= logi FALSE [18:41:18.586] - attr(*, "total_size")= num 4288 [18:41:18.586] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:18.586] - attr(*, "already-done")= logi TRUE [18:41:18.593] - copied '...future.FUN' to environment [18:41:18.594] - copied 'future.call.arguments' to environment [18:41:18.594] - copied '...future.elements_ii' to environment [18:41:18.594] - copied '...future.seeds_ii' to environment [18:41:18.594] - copied '...future.globals.maxSize' to environment [18:41:18.594] assign_globals() ... done [18:41:18.595] plan(): Setting new future strategy stack: [18:41:18.595] List of future strategies: [18:41:18.595] 1. sequential: [18:41:18.595] - args: function (..., envir = parent.frame(), workers = "") [18:41:18.595] - tweaked: FALSE [18:41:18.595] - call: NULL [18:41:18.595] plan(): nbrOfWorkers() = 1 [18:41:18.597] plan(): Setting new future strategy stack: [18:41:18.597] List of future strategies: [18:41:18.597] 1. multisession: [18:41:18.597] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:41:18.597] - tweaked: FALSE [18:41:18.597] - call: plan(strategy) [18:41:18.599] plan(): nbrOfWorkers() = 1 [18:41:18.600] SequentialFuture started (and completed) [18:41:18.600] - Launch lazy future ... done [18:41:18.600] run() for 'SequentialFuture' ... done [18:41:18.600] Created future: [18:41:18.600] SequentialFuture: [18:41:18.600] Label: 'future_lapply-1' [18:41:18.600] Expression: [18:41:18.600] { [18:41:18.600] do.call(function(...) { [18:41:18.600] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.600] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:18.600] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.600] on.exit(options(oopts), add = TRUE) [18:41:18.600] } [18:41:18.600] { [18:41:18.600] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:18.600] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.600] ...future.FUN(...future.X_jj, ...) [18:41:18.600] }) [18:41:18.600] } [18:41:18.600] }, args = future.call.arguments) [18:41:18.600] } [18:41:18.600] Lazy evaluation: FALSE [18:41:18.600] Asynchronous evaluation: FALSE [18:41:18.600] Local evaluation: TRUE [18:41:18.600] Environment: R_GlobalEnv [18:41:18.600] Capture standard output: TRUE [18:41:18.600] Capture condition classes: 'condition' (excluding 'nothing') [18:41:18.600] Globals: 5 objects totaling 853 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 191 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:18.600] Packages: [18:41:18.600] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:18.600] Resolved: TRUE [18:41:18.600] Value: 111 bytes of class 'list' [18:41:18.600] Early signaling: FALSE [18:41:18.600] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:18.600] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:18.602] Chunk #1 of 1 ... DONE [18:41:18.602] Launching 1 futures (chunks) ... DONE [18:41:18.602] Resolving 1 futures (chunks) ... [18:41:18.602] resolve() on list ... [18:41:18.602] recursive: 0 [18:41:18.602] length: 1 [18:41:18.603] [18:41:18.603] resolved() for 'SequentialFuture' ... [18:41:18.603] - state: 'finished' [18:41:18.603] - run: TRUE [18:41:18.603] - result: 'FutureResult' [18:41:18.604] resolved() for 'SequentialFuture' ... done [18:41:18.604] Future #1 [18:41:18.604] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:18.604] - nx: 1 [18:41:18.604] - relay: TRUE [18:41:18.604] - stdout: TRUE [18:41:18.605] - signal: TRUE [18:41:18.605] - resignal: FALSE [18:41:18.605] - force: TRUE [18:41:18.605] - relayed: [n=1] FALSE [18:41:18.605] - queued futures: [n=1] FALSE [18:41:18.605] - until=1 [18:41:18.606] - relaying element #1 [18:41:18.606] - relayed: [n=1] TRUE [18:41:18.606] - queued futures: [n=1] TRUE [18:41:18.606] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:18.607] length: 0 (resolved future 1) [18:41:18.607] Relaying remaining futures [18:41:18.607] signalConditionsASAP(NULL, pos=0) ... [18:41:18.607] - nx: 1 [18:41:18.607] - relay: TRUE [18:41:18.607] - stdout: TRUE [18:41:18.608] - signal: TRUE [18:41:18.608] - resignal: FALSE [18:41:18.608] - force: TRUE [18:41:18.608] - relayed: [n=1] TRUE [18:41:18.608] - queued futures: [n=1] TRUE - flush all [18:41:18.609] - relayed: [n=1] TRUE [18:41:18.609] - queued futures: [n=1] TRUE [18:41:18.609] signalConditionsASAP(NULL, pos=0) ... done [18:41:18.609] resolve() on list ... DONE [18:41:18.609] - Number of value chunks collected: 1 [18:41:18.609] Resolving 1 futures (chunks) ... DONE [18:41:18.610] Reducing values from 1 chunks ... [18:41:18.610] - Number of values collected after concatenation: 4 [18:41:18.610] - Number of values expected: 4 [18:41:18.610] Reducing values from 1 chunks ... DONE [18:41:18.610] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL [18:41:18.613] future_lapply() ... [18:41:18.616] Number of chunks: 1 [18:41:18.616] getGlobalsAndPackagesXApply() ... [18:41:18.616] - future.globals: TRUE [18:41:18.617] getGlobalsAndPackages() ... [18:41:18.617] Searching for globals... [18:41:18.618] - globals found: [2] 'FUN', '.Internal' [18:41:18.618] Searching for globals ... DONE [18:41:18.618] Resolving globals: FALSE [18:41:18.619] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:18.619] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:18.620] - globals: [1] 'FUN' [18:41:18.620] [18:41:18.620] getGlobalsAndPackages() ... DONE [18:41:18.620] - globals found/used: [n=1] 'FUN' [18:41:18.620] - needed namespaces: [n=0] [18:41:18.620] Finding globals ... DONE [18:41:18.621] - use_args: TRUE [18:41:18.621] - Getting '...' globals ... [18:41:18.621] resolve() on list ... [18:41:18.621] recursive: 0 [18:41:18.621] length: 1 [18:41:18.622] elements: '...' [18:41:18.622] length: 0 (resolved future 1) [18:41:18.622] resolve() on list ... DONE [18:41:18.622] - '...' content: [n=1] 'length' [18:41:18.622] List of 1 [18:41:18.622] $ ...:List of 1 [18:41:18.622] ..$ length: int 2 [18:41:18.622] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:18.622] - attr(*, "where")=List of 1 [18:41:18.622] ..$ ...: [18:41:18.622] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:18.622] - attr(*, "resolved")= logi TRUE [18:41:18.622] - attr(*, "total_size")= num NA [18:41:18.626] - Getting '...' globals ... DONE [18:41:18.626] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:18.626] List of 2 [18:41:18.626] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:18.626] $ ... :List of 1 [18:41:18.626] ..$ length: int 2 [18:41:18.626] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:18.626] - attr(*, "where")=List of 2 [18:41:18.626] ..$ ...future.FUN: [18:41:18.626] ..$ ... : [18:41:18.626] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:18.626] - attr(*, "resolved")= logi FALSE [18:41:18.626] - attr(*, "total_size")= int 4324 [18:41:18.631] Packages to be attached in all futures: [n=0] [18:41:18.631] getGlobalsAndPackagesXApply() ... DONE [18:41:18.631] Number of futures (= number of chunks): 1 [18:41:18.632] Launching 1 futures (chunks) ... [18:41:18.632] Chunk #1 of 1 ... [18:41:18.632] - Finding globals in 'X' for chunk #1 ... [18:41:18.632] getGlobalsAndPackages() ... [18:41:18.632] Searching for globals... [18:41:18.633] [18:41:18.633] Searching for globals ... DONE [18:41:18.633] - globals: [0] [18:41:18.633] getGlobalsAndPackages() ... DONE [18:41:18.633] + additional globals found: [n=0] [18:41:18.633] + additional namespaces needed: [n=0] [18:41:18.634] - Finding globals in 'X' for chunk #1 ... DONE [18:41:18.634] - seeds: [18:41:18.634] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.634] getGlobalsAndPackages() ... [18:41:18.634] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.634] Resolving globals: FALSE [18:41:18.635] Tweak future expression to call with '...' arguments ... [18:41:18.635] { [18:41:18.635] do.call(function(...) { [18:41:18.635] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.635] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:18.635] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.635] on.exit(options(oopts), add = TRUE) [18:41:18.635] } [18:41:18.635] { [18:41:18.635] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:18.635] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.635] ...future.FUN(...future.X_jj, ...) [18:41:18.635] }) [18:41:18.635] } [18:41:18.635] }, args = future.call.arguments) [18:41:18.635] } [18:41:18.635] Tweak future expression to call with '...' arguments ... DONE [18:41:18.638] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.638] [18:41:18.638] getGlobalsAndPackages() ... DONE [18:41:18.638] run() for 'Future' ... [18:41:18.639] - state: 'created' [18:41:18.639] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:18.641] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:18.641] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:18.642] - Field: 'label' [18:41:18.642] - Field: 'local' [18:41:18.642] - Field: 'owner' [18:41:18.642] - Field: 'envir' [18:41:18.642] - Field: 'packages' [18:41:18.642] - Field: 'gc' [18:41:18.643] - Field: 'conditions' [18:41:18.643] - Field: 'expr' [18:41:18.643] - Field: 'uuid' [18:41:18.643] - Field: 'seed' [18:41:18.643] - Field: 'version' [18:41:18.644] - Field: 'result' [18:41:18.644] - Field: 'asynchronous' [18:41:18.644] - Field: 'calls' [18:41:18.644] - Field: 'globals' [18:41:18.644] - Field: 'stdout' [18:41:18.644] - Field: 'earlySignal' [18:41:18.645] - Field: 'lazy' [18:41:18.645] - Field: 'state' [18:41:18.645] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:18.645] - Launch lazy future ... [18:41:18.645] Packages needed by the future expression (n = 0): [18:41:18.645] Packages needed by future strategies (n = 0): [18:41:18.646] { [18:41:18.646] { [18:41:18.646] { [18:41:18.646] ...future.startTime <- base::Sys.time() [18:41:18.646] { [18:41:18.646] { [18:41:18.646] { [18:41:18.646] base::local({ [18:41:18.646] has_future <- base::requireNamespace("future", [18:41:18.646] quietly = TRUE) [18:41:18.646] if (has_future) { [18:41:18.646] ns <- base::getNamespace("future") [18:41:18.646] version <- ns[[".package"]][["version"]] [18:41:18.646] if (is.null(version)) [18:41:18.646] version <- utils::packageVersion("future") [18:41:18.646] } [18:41:18.646] else { [18:41:18.646] version <- NULL [18:41:18.646] } [18:41:18.646] if (!has_future || version < "1.8.0") { [18:41:18.646] info <- base::c(r_version = base::gsub("R version ", [18:41:18.646] "", base::R.version$version.string), [18:41:18.646] platform = base::sprintf("%s (%s-bit)", [18:41:18.646] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:18.646] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:18.646] "release", "version")], collapse = " "), [18:41:18.646] hostname = base::Sys.info()[["nodename"]]) [18:41:18.646] info <- base::sprintf("%s: %s", base::names(info), [18:41:18.646] info) [18:41:18.646] info <- base::paste(info, collapse = "; ") [18:41:18.646] if (!has_future) { [18:41:18.646] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:18.646] info) [18:41:18.646] } [18:41:18.646] else { [18:41:18.646] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:18.646] info, version) [18:41:18.646] } [18:41:18.646] base::stop(msg) [18:41:18.646] } [18:41:18.646] }) [18:41:18.646] } [18:41:18.646] ...future.strategy.old <- future::plan("list") [18:41:18.646] options(future.plan = NULL) [18:41:18.646] Sys.unsetenv("R_FUTURE_PLAN") [18:41:18.646] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:18.646] } [18:41:18.646] ...future.workdir <- getwd() [18:41:18.646] } [18:41:18.646] ...future.oldOptions <- base::as.list(base::.Options) [18:41:18.646] ...future.oldEnvVars <- base::Sys.getenv() [18:41:18.646] } [18:41:18.646] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:18.646] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:18.646] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:18.646] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:18.646] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:18.646] future.stdout.windows.reencode = NULL, width = 80L) [18:41:18.646] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:18.646] base::names(...future.oldOptions)) [18:41:18.646] } [18:41:18.646] if (FALSE) { [18:41:18.646] } [18:41:18.646] else { [18:41:18.646] if (TRUE) { [18:41:18.646] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:18.646] open = "w") [18:41:18.646] } [18:41:18.646] else { [18:41:18.646] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:18.646] windows = "NUL", "/dev/null"), open = "w") [18:41:18.646] } [18:41:18.646] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:18.646] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:18.646] base::sink(type = "output", split = FALSE) [18:41:18.646] base::close(...future.stdout) [18:41:18.646] }, add = TRUE) [18:41:18.646] } [18:41:18.646] ...future.frame <- base::sys.nframe() [18:41:18.646] ...future.conditions <- base::list() [18:41:18.646] ...future.rng <- base::globalenv()$.Random.seed [18:41:18.646] if (FALSE) { [18:41:18.646] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:18.646] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:18.646] } [18:41:18.646] ...future.result <- base::tryCatch({ [18:41:18.646] base::withCallingHandlers({ [18:41:18.646] ...future.value <- base::withVisible(base::local({ [18:41:18.646] do.call(function(...) { [18:41:18.646] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.646] if (!identical(...future.globals.maxSize.org, [18:41:18.646] ...future.globals.maxSize)) { [18:41:18.646] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.646] on.exit(options(oopts), add = TRUE) [18:41:18.646] } [18:41:18.646] { [18:41:18.646] lapply(seq_along(...future.elements_ii), [18:41:18.646] FUN = function(jj) { [18:41:18.646] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.646] ...future.FUN(...future.X_jj, ...) [18:41:18.646] }) [18:41:18.646] } [18:41:18.646] }, args = future.call.arguments) [18:41:18.646] })) [18:41:18.646] future::FutureResult(value = ...future.value$value, [18:41:18.646] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:18.646] ...future.rng), globalenv = if (FALSE) [18:41:18.646] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:18.646] ...future.globalenv.names)) [18:41:18.646] else NULL, started = ...future.startTime, version = "1.8") [18:41:18.646] }, condition = base::local({ [18:41:18.646] c <- base::c [18:41:18.646] inherits <- base::inherits [18:41:18.646] invokeRestart <- base::invokeRestart [18:41:18.646] length <- base::length [18:41:18.646] list <- base::list [18:41:18.646] seq.int <- base::seq.int [18:41:18.646] signalCondition <- base::signalCondition [18:41:18.646] sys.calls <- base::sys.calls [18:41:18.646] `[[` <- base::`[[` [18:41:18.646] `+` <- base::`+` [18:41:18.646] `<<-` <- base::`<<-` [18:41:18.646] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:18.646] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:18.646] 3L)] [18:41:18.646] } [18:41:18.646] function(cond) { [18:41:18.646] is_error <- inherits(cond, "error") [18:41:18.646] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:18.646] NULL) [18:41:18.646] if (is_error) { [18:41:18.646] sessionInformation <- function() { [18:41:18.646] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:18.646] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:18.646] search = base::search(), system = base::Sys.info()) [18:41:18.646] } [18:41:18.646] ...future.conditions[[length(...future.conditions) + [18:41:18.646] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:18.646] cond$call), session = sessionInformation(), [18:41:18.646] timestamp = base::Sys.time(), signaled = 0L) [18:41:18.646] signalCondition(cond) [18:41:18.646] } [18:41:18.646] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:18.646] "immediateCondition"))) { [18:41:18.646] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:18.646] ...future.conditions[[length(...future.conditions) + [18:41:18.646] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:18.646] if (TRUE && !signal) { [18:41:18.646] muffleCondition <- function (cond, pattern = "^muffle") [18:41:18.646] { [18:41:18.646] inherits <- base::inherits [18:41:18.646] invokeRestart <- base::invokeRestart [18:41:18.646] is.null <- base::is.null [18:41:18.646] muffled <- FALSE [18:41:18.646] if (inherits(cond, "message")) { [18:41:18.646] muffled <- grepl(pattern, "muffleMessage") [18:41:18.646] if (muffled) [18:41:18.646] invokeRestart("muffleMessage") [18:41:18.646] } [18:41:18.646] else if (inherits(cond, "warning")) { [18:41:18.646] muffled <- grepl(pattern, "muffleWarning") [18:41:18.646] if (muffled) [18:41:18.646] invokeRestart("muffleWarning") [18:41:18.646] } [18:41:18.646] else if (inherits(cond, "condition")) { [18:41:18.646] if (!is.null(pattern)) { [18:41:18.646] computeRestarts <- base::computeRestarts [18:41:18.646] grepl <- base::grepl [18:41:18.646] restarts <- computeRestarts(cond) [18:41:18.646] for (restart in restarts) { [18:41:18.646] name <- restart$name [18:41:18.646] if (is.null(name)) [18:41:18.646] next [18:41:18.646] if (!grepl(pattern, name)) [18:41:18.646] next [18:41:18.646] invokeRestart(restart) [18:41:18.646] muffled <- TRUE [18:41:18.646] break [18:41:18.646] } [18:41:18.646] } [18:41:18.646] } [18:41:18.646] invisible(muffled) [18:41:18.646] } [18:41:18.646] muffleCondition(cond, pattern = "^muffle") [18:41:18.646] } [18:41:18.646] } [18:41:18.646] else { [18:41:18.646] if (TRUE) { [18:41:18.646] muffleCondition <- function (cond, pattern = "^muffle") [18:41:18.646] { [18:41:18.646] inherits <- base::inherits [18:41:18.646] invokeRestart <- base::invokeRestart [18:41:18.646] is.null <- base::is.null [18:41:18.646] muffled <- FALSE [18:41:18.646] if (inherits(cond, "message")) { [18:41:18.646] muffled <- grepl(pattern, "muffleMessage") [18:41:18.646] if (muffled) [18:41:18.646] invokeRestart("muffleMessage") [18:41:18.646] } [18:41:18.646] else if (inherits(cond, "warning")) { [18:41:18.646] muffled <- grepl(pattern, "muffleWarning") [18:41:18.646] if (muffled) [18:41:18.646] invokeRestart("muffleWarning") [18:41:18.646] } [18:41:18.646] else if (inherits(cond, "condition")) { [18:41:18.646] if (!is.null(pattern)) { [18:41:18.646] computeRestarts <- base::computeRestarts [18:41:18.646] grepl <- base::grepl [18:41:18.646] restarts <- computeRestarts(cond) [18:41:18.646] for (restart in restarts) { [18:41:18.646] name <- restart$name [18:41:18.646] if (is.null(name)) [18:41:18.646] next [18:41:18.646] if (!grepl(pattern, name)) [18:41:18.646] next [18:41:18.646] invokeRestart(restart) [18:41:18.646] muffled <- TRUE [18:41:18.646] break [18:41:18.646] } [18:41:18.646] } [18:41:18.646] } [18:41:18.646] invisible(muffled) [18:41:18.646] } [18:41:18.646] muffleCondition(cond, pattern = "^muffle") [18:41:18.646] } [18:41:18.646] } [18:41:18.646] } [18:41:18.646] })) [18:41:18.646] }, error = function(ex) { [18:41:18.646] base::structure(base::list(value = NULL, visible = NULL, [18:41:18.646] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:18.646] ...future.rng), started = ...future.startTime, [18:41:18.646] finished = Sys.time(), session_uuid = NA_character_, [18:41:18.646] version = "1.8"), class = "FutureResult") [18:41:18.646] }, finally = { [18:41:18.646] if (!identical(...future.workdir, getwd())) [18:41:18.646] setwd(...future.workdir) [18:41:18.646] { [18:41:18.646] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:18.646] ...future.oldOptions$nwarnings <- NULL [18:41:18.646] } [18:41:18.646] base::options(...future.oldOptions) [18:41:18.646] if (.Platform$OS.type == "windows") { [18:41:18.646] old_names <- names(...future.oldEnvVars) [18:41:18.646] envs <- base::Sys.getenv() [18:41:18.646] names <- names(envs) [18:41:18.646] common <- intersect(names, old_names) [18:41:18.646] added <- setdiff(names, old_names) [18:41:18.646] removed <- setdiff(old_names, names) [18:41:18.646] changed <- common[...future.oldEnvVars[common] != [18:41:18.646] envs[common]] [18:41:18.646] NAMES <- toupper(changed) [18:41:18.646] args <- list() [18:41:18.646] for (kk in seq_along(NAMES)) { [18:41:18.646] name <- changed[[kk]] [18:41:18.646] NAME <- NAMES[[kk]] [18:41:18.646] if (name != NAME && is.element(NAME, old_names)) [18:41:18.646] next [18:41:18.646] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:18.646] } [18:41:18.646] NAMES <- toupper(added) [18:41:18.646] for (kk in seq_along(NAMES)) { [18:41:18.646] name <- added[[kk]] [18:41:18.646] NAME <- NAMES[[kk]] [18:41:18.646] if (name != NAME && is.element(NAME, old_names)) [18:41:18.646] next [18:41:18.646] args[[name]] <- "" [18:41:18.646] } [18:41:18.646] NAMES <- toupper(removed) [18:41:18.646] for (kk in seq_along(NAMES)) { [18:41:18.646] name <- removed[[kk]] [18:41:18.646] NAME <- NAMES[[kk]] [18:41:18.646] if (name != NAME && is.element(NAME, old_names)) [18:41:18.646] next [18:41:18.646] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:18.646] } [18:41:18.646] if (length(args) > 0) [18:41:18.646] base::do.call(base::Sys.setenv, args = args) [18:41:18.646] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:18.646] } [18:41:18.646] else { [18:41:18.646] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:18.646] } [18:41:18.646] { [18:41:18.646] if (base::length(...future.futureOptionsAdded) > [18:41:18.646] 0L) { [18:41:18.646] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:18.646] base::names(opts) <- ...future.futureOptionsAdded [18:41:18.646] base::options(opts) [18:41:18.646] } [18:41:18.646] { [18:41:18.646] { [18:41:18.646] NULL [18:41:18.646] RNGkind("Mersenne-Twister") [18:41:18.646] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:18.646] inherits = FALSE) [18:41:18.646] } [18:41:18.646] options(future.plan = NULL) [18:41:18.646] if (is.na(NA_character_)) [18:41:18.646] Sys.unsetenv("R_FUTURE_PLAN") [18:41:18.646] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:18.646] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:18.646] .init = FALSE) [18:41:18.646] } [18:41:18.646] } [18:41:18.646] } [18:41:18.646] }) [18:41:18.646] if (TRUE) { [18:41:18.646] base::sink(type = "output", split = FALSE) [18:41:18.646] if (TRUE) { [18:41:18.646] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:18.646] } [18:41:18.646] else { [18:41:18.646] ...future.result["stdout"] <- base::list(NULL) [18:41:18.646] } [18:41:18.646] base::close(...future.stdout) [18:41:18.646] ...future.stdout <- NULL [18:41:18.646] } [18:41:18.646] ...future.result$conditions <- ...future.conditions [18:41:18.646] ...future.result$finished <- base::Sys.time() [18:41:18.646] ...future.result [18:41:18.646] } [18:41:18.650] assign_globals() ... [18:41:18.650] List of 5 [18:41:18.650] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:18.650] $ future.call.arguments :List of 1 [18:41:18.650] ..$ length: int 2 [18:41:18.650] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:18.650] $ ...future.elements_ii :List of 4 [18:41:18.650] ..$ a: chr "integer" [18:41:18.650] ..$ b: chr "numeric" [18:41:18.650] ..$ c: chr "character" [18:41:18.650] ..$ c: chr "list" [18:41:18.650] $ ...future.seeds_ii : NULL [18:41:18.650] $ ...future.globals.maxSize: NULL [18:41:18.650] - attr(*, "where")=List of 5 [18:41:18.650] ..$ ...future.FUN : [18:41:18.650] ..$ future.call.arguments : [18:41:18.650] ..$ ...future.elements_ii : [18:41:18.650] ..$ ...future.seeds_ii : [18:41:18.650] ..$ ...future.globals.maxSize: [18:41:18.650] - attr(*, "resolved")= logi FALSE [18:41:18.650] - attr(*, "total_size")= num 4324 [18:41:18.650] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:18.650] - attr(*, "already-done")= logi TRUE [18:41:18.657] - copied '...future.FUN' to environment [18:41:18.657] - copied 'future.call.arguments' to environment [18:41:18.657] - copied '...future.elements_ii' to environment [18:41:18.657] - copied '...future.seeds_ii' to environment [18:41:18.658] - copied '...future.globals.maxSize' to environment [18:41:18.658] assign_globals() ... done [18:41:18.658] plan(): Setting new future strategy stack: [18:41:18.658] List of future strategies: [18:41:18.658] 1. sequential: [18:41:18.658] - args: function (..., envir = parent.frame(), workers = "") [18:41:18.658] - tweaked: FALSE [18:41:18.658] - call: NULL [18:41:18.659] plan(): nbrOfWorkers() = 1 [18:41:18.660] plan(): Setting new future strategy stack: [18:41:18.661] List of future strategies: [18:41:18.661] 1. multisession: [18:41:18.661] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:41:18.661] - tweaked: FALSE [18:41:18.661] - call: plan(strategy) [18:41:18.663] plan(): nbrOfWorkers() = 1 [18:41:18.663] SequentialFuture started (and completed) [18:41:18.664] - Launch lazy future ... done [18:41:18.664] run() for 'SequentialFuture' ... done [18:41:18.664] Created future: [18:41:18.664] SequentialFuture: [18:41:18.664] Label: 'future_lapply-1' [18:41:18.664] Expression: [18:41:18.664] { [18:41:18.664] do.call(function(...) { [18:41:18.664] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.664] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:18.664] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.664] on.exit(options(oopts), add = TRUE) [18:41:18.664] } [18:41:18.664] { [18:41:18.664] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:18.664] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.664] ...future.FUN(...future.X_jj, ...) [18:41:18.664] }) [18:41:18.664] } [18:41:18.664] }, args = future.call.arguments) [18:41:18.664] } [18:41:18.664] Lazy evaluation: FALSE [18:41:18.664] Asynchronous evaluation: FALSE [18:41:18.664] Local evaluation: TRUE [18:41:18.664] Environment: R_GlobalEnv [18:41:18.664] Capture standard output: TRUE [18:41:18.664] Capture condition classes: 'condition' (excluding 'nothing') [18:41:18.664] Globals: 5 objects totaling 853 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 191 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:18.664] Packages: [18:41:18.664] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:18.664] Resolved: TRUE [18:41:18.664] Value: 111 bytes of class 'list' [18:41:18.664] Early signaling: FALSE [18:41:18.664] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:18.664] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:18.665] Chunk #1 of 1 ... DONE [18:41:18.666] Launching 1 futures (chunks) ... DONE [18:41:18.666] Resolving 1 futures (chunks) ... [18:41:18.666] resolve() on list ... [18:41:18.666] recursive: 0 [18:41:18.666] length: 1 [18:41:18.666] [18:41:18.667] resolved() for 'SequentialFuture' ... [18:41:18.667] - state: 'finished' [18:41:18.667] - run: TRUE [18:41:18.667] - result: 'FutureResult' [18:41:18.667] resolved() for 'SequentialFuture' ... done [18:41:18.668] Future #1 [18:41:18.668] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:18.668] - nx: 1 [18:41:18.668] - relay: TRUE [18:41:18.668] - stdout: TRUE [18:41:18.668] - signal: TRUE [18:41:18.669] - resignal: FALSE [18:41:18.669] - force: TRUE [18:41:18.669] - relayed: [n=1] FALSE [18:41:18.669] - queued futures: [n=1] FALSE [18:41:18.669] - until=1 [18:41:18.669] - relaying element #1 [18:41:18.670] - relayed: [n=1] TRUE [18:41:18.670] - queued futures: [n=1] TRUE [18:41:18.670] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:18.670] length: 0 (resolved future 1) [18:41:18.670] Relaying remaining futures [18:41:18.671] signalConditionsASAP(NULL, pos=0) ... [18:41:18.671] - nx: 1 [18:41:18.671] - relay: TRUE [18:41:18.671] - stdout: TRUE [18:41:18.671] - signal: TRUE [18:41:18.671] - resignal: FALSE [18:41:18.672] - force: TRUE [18:41:18.672] - relayed: [n=1] TRUE [18:41:18.672] - queued futures: [n=1] TRUE - flush all [18:41:18.672] - relayed: [n=1] TRUE [18:41:18.672] - queued futures: [n=1] TRUE [18:41:18.672] signalConditionsASAP(NULL, pos=0) ... done [18:41:18.673] resolve() on list ... DONE [18:41:18.673] - Number of value chunks collected: 1 [18:41:18.673] Resolving 1 futures (chunks) ... DONE [18:41:18.673] Reducing values from 1 chunks ... [18:41:18.673] - Number of values collected after concatenation: 4 [18:41:18.674] - Number of values expected: 4 [18:41:18.674] Reducing values from 1 chunks ... DONE [18:41:18.674] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL - future_lapply(x, FUN = base::vector, ...) ... [18:41:18.677] future_lapply() ... [18:41:18.680] Number of chunks: 1 [18:41:18.680] getGlobalsAndPackagesXApply() ... [18:41:18.680] - future.globals: TRUE [18:41:18.680] getGlobalsAndPackages() ... [18:41:18.680] Searching for globals... [18:41:18.682] - globals found: [2] 'FUN', '.Internal' [18:41:18.682] Searching for globals ... DONE [18:41:18.682] Resolving globals: FALSE [18:41:18.683] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:18.683] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:18.683] - globals: [1] 'FUN' [18:41:18.683] [18:41:18.684] getGlobalsAndPackages() ... DONE [18:41:18.684] - globals found/used: [n=1] 'FUN' [18:41:18.684] - needed namespaces: [n=0] [18:41:18.684] Finding globals ... DONE [18:41:18.684] - use_args: TRUE [18:41:18.685] - Getting '...' globals ... [18:41:18.685] resolve() on list ... [18:41:18.685] recursive: 0 [18:41:18.685] length: 1 [18:41:18.685] elements: '...' [18:41:18.686] length: 0 (resolved future 1) [18:41:18.686] resolve() on list ... DONE [18:41:18.686] - '...' content: [n=1] 'length' [18:41:18.686] List of 1 [18:41:18.686] $ ...:List of 1 [18:41:18.686] ..$ length: int 2 [18:41:18.686] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:18.686] - attr(*, "where")=List of 1 [18:41:18.686] ..$ ...: [18:41:18.686] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:18.686] - attr(*, "resolved")= logi TRUE [18:41:18.686] - attr(*, "total_size")= num NA [18:41:18.689] - Getting '...' globals ... DONE [18:41:18.690] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:18.690] List of 2 [18:41:18.690] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:18.690] $ ... :List of 1 [18:41:18.690] ..$ length: int 2 [18:41:18.690] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:18.690] - attr(*, "where")=List of 2 [18:41:18.690] ..$ ...future.FUN: [18:41:18.690] ..$ ... : [18:41:18.690] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:18.690] - attr(*, "resolved")= logi FALSE [18:41:18.690] - attr(*, "total_size")= int 4406 [18:41:18.694] Packages to be attached in all futures: [n=0] [18:41:18.694] getGlobalsAndPackagesXApply() ... DONE [18:41:18.694] Number of futures (= number of chunks): 1 [18:41:18.694] Launching 1 futures (chunks) ... [18:41:18.694] Chunk #1 of 1 ... [18:41:18.695] - Finding globals in 'X' for chunk #1 ... [18:41:18.695] getGlobalsAndPackages() ... [18:41:18.695] Searching for globals... [18:41:18.695] [18:41:18.695] Searching for globals ... DONE [18:41:18.696] - globals: [0] [18:41:18.696] getGlobalsAndPackages() ... DONE [18:41:18.696] + additional globals found: [n=0] [18:41:18.696] + additional namespaces needed: [n=0] [18:41:18.696] - Finding globals in 'X' for chunk #1 ... DONE [18:41:18.696] - seeds: [18:41:18.696] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.697] getGlobalsAndPackages() ... [18:41:18.697] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.697] Resolving globals: FALSE [18:41:18.697] Tweak future expression to call with '...' arguments ... [18:41:18.697] { [18:41:18.697] do.call(function(...) { [18:41:18.697] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.697] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:18.697] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.697] on.exit(options(oopts), add = TRUE) [18:41:18.697] } [18:41:18.697] { [18:41:18.697] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:18.697] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.697] ...future.FUN(...future.X_jj, ...) [18:41:18.697] }) [18:41:18.697] } [18:41:18.697] }, args = future.call.arguments) [18:41:18.697] } [18:41:18.698] Tweak future expression to call with '...' arguments ... DONE [18:41:18.698] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.698] [18:41:18.699] getGlobalsAndPackages() ... DONE [18:41:18.699] run() for 'Future' ... [18:41:18.699] - state: 'created' [18:41:18.699] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:18.702] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:18.702] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:18.702] - Field: 'label' [18:41:18.702] - Field: 'local' [18:41:18.702] - Field: 'owner' [18:41:18.703] - Field: 'envir' [18:41:18.703] - Field: 'packages' [18:41:18.703] - Field: 'gc' [18:41:18.703] - Field: 'conditions' [18:41:18.703] - Field: 'expr' [18:41:18.703] - Field: 'uuid' [18:41:18.704] - Field: 'seed' [18:41:18.704] - Field: 'version' [18:41:18.704] - Field: 'result' [18:41:18.704] - Field: 'asynchronous' [18:41:18.704] - Field: 'calls' [18:41:18.704] - Field: 'globals' [18:41:18.705] - Field: 'stdout' [18:41:18.705] - Field: 'earlySignal' [18:41:18.705] - Field: 'lazy' [18:41:18.705] - Field: 'state' [18:41:18.705] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:18.705] - Launch lazy future ... [18:41:18.706] Packages needed by the future expression (n = 0): [18:41:18.706] Packages needed by future strategies (n = 0): [18:41:18.706] { [18:41:18.706] { [18:41:18.706] { [18:41:18.706] ...future.startTime <- base::Sys.time() [18:41:18.706] { [18:41:18.706] { [18:41:18.706] { [18:41:18.706] base::local({ [18:41:18.706] has_future <- base::requireNamespace("future", [18:41:18.706] quietly = TRUE) [18:41:18.706] if (has_future) { [18:41:18.706] ns <- base::getNamespace("future") [18:41:18.706] version <- ns[[".package"]][["version"]] [18:41:18.706] if (is.null(version)) [18:41:18.706] version <- utils::packageVersion("future") [18:41:18.706] } [18:41:18.706] else { [18:41:18.706] version <- NULL [18:41:18.706] } [18:41:18.706] if (!has_future || version < "1.8.0") { [18:41:18.706] info <- base::c(r_version = base::gsub("R version ", [18:41:18.706] "", base::R.version$version.string), [18:41:18.706] platform = base::sprintf("%s (%s-bit)", [18:41:18.706] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:18.706] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:18.706] "release", "version")], collapse = " "), [18:41:18.706] hostname = base::Sys.info()[["nodename"]]) [18:41:18.706] info <- base::sprintf("%s: %s", base::names(info), [18:41:18.706] info) [18:41:18.706] info <- base::paste(info, collapse = "; ") [18:41:18.706] if (!has_future) { [18:41:18.706] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:18.706] info) [18:41:18.706] } [18:41:18.706] else { [18:41:18.706] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:18.706] info, version) [18:41:18.706] } [18:41:18.706] base::stop(msg) [18:41:18.706] } [18:41:18.706] }) [18:41:18.706] } [18:41:18.706] ...future.strategy.old <- future::plan("list") [18:41:18.706] options(future.plan = NULL) [18:41:18.706] Sys.unsetenv("R_FUTURE_PLAN") [18:41:18.706] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:18.706] } [18:41:18.706] ...future.workdir <- getwd() [18:41:18.706] } [18:41:18.706] ...future.oldOptions <- base::as.list(base::.Options) [18:41:18.706] ...future.oldEnvVars <- base::Sys.getenv() [18:41:18.706] } [18:41:18.706] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:18.706] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:18.706] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:18.706] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:18.706] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:18.706] future.stdout.windows.reencode = NULL, width = 80L) [18:41:18.706] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:18.706] base::names(...future.oldOptions)) [18:41:18.706] } [18:41:18.706] if (FALSE) { [18:41:18.706] } [18:41:18.706] else { [18:41:18.706] if (TRUE) { [18:41:18.706] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:18.706] open = "w") [18:41:18.706] } [18:41:18.706] else { [18:41:18.706] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:18.706] windows = "NUL", "/dev/null"), open = "w") [18:41:18.706] } [18:41:18.706] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:18.706] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:18.706] base::sink(type = "output", split = FALSE) [18:41:18.706] base::close(...future.stdout) [18:41:18.706] }, add = TRUE) [18:41:18.706] } [18:41:18.706] ...future.frame <- base::sys.nframe() [18:41:18.706] ...future.conditions <- base::list() [18:41:18.706] ...future.rng <- base::globalenv()$.Random.seed [18:41:18.706] if (FALSE) { [18:41:18.706] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:18.706] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:18.706] } [18:41:18.706] ...future.result <- base::tryCatch({ [18:41:18.706] base::withCallingHandlers({ [18:41:18.706] ...future.value <- base::withVisible(base::local({ [18:41:18.706] do.call(function(...) { [18:41:18.706] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.706] if (!identical(...future.globals.maxSize.org, [18:41:18.706] ...future.globals.maxSize)) { [18:41:18.706] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.706] on.exit(options(oopts), add = TRUE) [18:41:18.706] } [18:41:18.706] { [18:41:18.706] lapply(seq_along(...future.elements_ii), [18:41:18.706] FUN = function(jj) { [18:41:18.706] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.706] ...future.FUN(...future.X_jj, ...) [18:41:18.706] }) [18:41:18.706] } [18:41:18.706] }, args = future.call.arguments) [18:41:18.706] })) [18:41:18.706] future::FutureResult(value = ...future.value$value, [18:41:18.706] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:18.706] ...future.rng), globalenv = if (FALSE) [18:41:18.706] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:18.706] ...future.globalenv.names)) [18:41:18.706] else NULL, started = ...future.startTime, version = "1.8") [18:41:18.706] }, condition = base::local({ [18:41:18.706] c <- base::c [18:41:18.706] inherits <- base::inherits [18:41:18.706] invokeRestart <- base::invokeRestart [18:41:18.706] length <- base::length [18:41:18.706] list <- base::list [18:41:18.706] seq.int <- base::seq.int [18:41:18.706] signalCondition <- base::signalCondition [18:41:18.706] sys.calls <- base::sys.calls [18:41:18.706] `[[` <- base::`[[` [18:41:18.706] `+` <- base::`+` [18:41:18.706] `<<-` <- base::`<<-` [18:41:18.706] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:18.706] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:18.706] 3L)] [18:41:18.706] } [18:41:18.706] function(cond) { [18:41:18.706] is_error <- inherits(cond, "error") [18:41:18.706] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:18.706] NULL) [18:41:18.706] if (is_error) { [18:41:18.706] sessionInformation <- function() { [18:41:18.706] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:18.706] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:18.706] search = base::search(), system = base::Sys.info()) [18:41:18.706] } [18:41:18.706] ...future.conditions[[length(...future.conditions) + [18:41:18.706] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:18.706] cond$call), session = sessionInformation(), [18:41:18.706] timestamp = base::Sys.time(), signaled = 0L) [18:41:18.706] signalCondition(cond) [18:41:18.706] } [18:41:18.706] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:18.706] "immediateCondition"))) { [18:41:18.706] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:18.706] ...future.conditions[[length(...future.conditions) + [18:41:18.706] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:18.706] if (TRUE && !signal) { [18:41:18.706] muffleCondition <- function (cond, pattern = "^muffle") [18:41:18.706] { [18:41:18.706] inherits <- base::inherits [18:41:18.706] invokeRestart <- base::invokeRestart [18:41:18.706] is.null <- base::is.null [18:41:18.706] muffled <- FALSE [18:41:18.706] if (inherits(cond, "message")) { [18:41:18.706] muffled <- grepl(pattern, "muffleMessage") [18:41:18.706] if (muffled) [18:41:18.706] invokeRestart("muffleMessage") [18:41:18.706] } [18:41:18.706] else if (inherits(cond, "warning")) { [18:41:18.706] muffled <- grepl(pattern, "muffleWarning") [18:41:18.706] if (muffled) [18:41:18.706] invokeRestart("muffleWarning") [18:41:18.706] } [18:41:18.706] else if (inherits(cond, "condition")) { [18:41:18.706] if (!is.null(pattern)) { [18:41:18.706] computeRestarts <- base::computeRestarts [18:41:18.706] grepl <- base::grepl [18:41:18.706] restarts <- computeRestarts(cond) [18:41:18.706] for (restart in restarts) { [18:41:18.706] name <- restart$name [18:41:18.706] if (is.null(name)) [18:41:18.706] next [18:41:18.706] if (!grepl(pattern, name)) [18:41:18.706] next [18:41:18.706] invokeRestart(restart) [18:41:18.706] muffled <- TRUE [18:41:18.706] break [18:41:18.706] } [18:41:18.706] } [18:41:18.706] } [18:41:18.706] invisible(muffled) [18:41:18.706] } [18:41:18.706] muffleCondition(cond, pattern = "^muffle") [18:41:18.706] } [18:41:18.706] } [18:41:18.706] else { [18:41:18.706] if (TRUE) { [18:41:18.706] muffleCondition <- function (cond, pattern = "^muffle") [18:41:18.706] { [18:41:18.706] inherits <- base::inherits [18:41:18.706] invokeRestart <- base::invokeRestart [18:41:18.706] is.null <- base::is.null [18:41:18.706] muffled <- FALSE [18:41:18.706] if (inherits(cond, "message")) { [18:41:18.706] muffled <- grepl(pattern, "muffleMessage") [18:41:18.706] if (muffled) [18:41:18.706] invokeRestart("muffleMessage") [18:41:18.706] } [18:41:18.706] else if (inherits(cond, "warning")) { [18:41:18.706] muffled <- grepl(pattern, "muffleWarning") [18:41:18.706] if (muffled) [18:41:18.706] invokeRestart("muffleWarning") [18:41:18.706] } [18:41:18.706] else if (inherits(cond, "condition")) { [18:41:18.706] if (!is.null(pattern)) { [18:41:18.706] computeRestarts <- base::computeRestarts [18:41:18.706] grepl <- base::grepl [18:41:18.706] restarts <- computeRestarts(cond) [18:41:18.706] for (restart in restarts) { [18:41:18.706] name <- restart$name [18:41:18.706] if (is.null(name)) [18:41:18.706] next [18:41:18.706] if (!grepl(pattern, name)) [18:41:18.706] next [18:41:18.706] invokeRestart(restart) [18:41:18.706] muffled <- TRUE [18:41:18.706] break [18:41:18.706] } [18:41:18.706] } [18:41:18.706] } [18:41:18.706] invisible(muffled) [18:41:18.706] } [18:41:18.706] muffleCondition(cond, pattern = "^muffle") [18:41:18.706] } [18:41:18.706] } [18:41:18.706] } [18:41:18.706] })) [18:41:18.706] }, error = function(ex) { [18:41:18.706] base::structure(base::list(value = NULL, visible = NULL, [18:41:18.706] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:18.706] ...future.rng), started = ...future.startTime, [18:41:18.706] finished = Sys.time(), session_uuid = NA_character_, [18:41:18.706] version = "1.8"), class = "FutureResult") [18:41:18.706] }, finally = { [18:41:18.706] if (!identical(...future.workdir, getwd())) [18:41:18.706] setwd(...future.workdir) [18:41:18.706] { [18:41:18.706] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:18.706] ...future.oldOptions$nwarnings <- NULL [18:41:18.706] } [18:41:18.706] base::options(...future.oldOptions) [18:41:18.706] if (.Platform$OS.type == "windows") { [18:41:18.706] old_names <- names(...future.oldEnvVars) [18:41:18.706] envs <- base::Sys.getenv() [18:41:18.706] names <- names(envs) [18:41:18.706] common <- intersect(names, old_names) [18:41:18.706] added <- setdiff(names, old_names) [18:41:18.706] removed <- setdiff(old_names, names) [18:41:18.706] changed <- common[...future.oldEnvVars[common] != [18:41:18.706] envs[common]] [18:41:18.706] NAMES <- toupper(changed) [18:41:18.706] args <- list() [18:41:18.706] for (kk in seq_along(NAMES)) { [18:41:18.706] name <- changed[[kk]] [18:41:18.706] NAME <- NAMES[[kk]] [18:41:18.706] if (name != NAME && is.element(NAME, old_names)) [18:41:18.706] next [18:41:18.706] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:18.706] } [18:41:18.706] NAMES <- toupper(added) [18:41:18.706] for (kk in seq_along(NAMES)) { [18:41:18.706] name <- added[[kk]] [18:41:18.706] NAME <- NAMES[[kk]] [18:41:18.706] if (name != NAME && is.element(NAME, old_names)) [18:41:18.706] next [18:41:18.706] args[[name]] <- "" [18:41:18.706] } [18:41:18.706] NAMES <- toupper(removed) [18:41:18.706] for (kk in seq_along(NAMES)) { [18:41:18.706] name <- removed[[kk]] [18:41:18.706] NAME <- NAMES[[kk]] [18:41:18.706] if (name != NAME && is.element(NAME, old_names)) [18:41:18.706] next [18:41:18.706] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:18.706] } [18:41:18.706] if (length(args) > 0) [18:41:18.706] base::do.call(base::Sys.setenv, args = args) [18:41:18.706] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:18.706] } [18:41:18.706] else { [18:41:18.706] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:18.706] } [18:41:18.706] { [18:41:18.706] if (base::length(...future.futureOptionsAdded) > [18:41:18.706] 0L) { [18:41:18.706] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:18.706] base::names(opts) <- ...future.futureOptionsAdded [18:41:18.706] base::options(opts) [18:41:18.706] } [18:41:18.706] { [18:41:18.706] { [18:41:18.706] NULL [18:41:18.706] RNGkind("Mersenne-Twister") [18:41:18.706] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:18.706] inherits = FALSE) [18:41:18.706] } [18:41:18.706] options(future.plan = NULL) [18:41:18.706] if (is.na(NA_character_)) [18:41:18.706] Sys.unsetenv("R_FUTURE_PLAN") [18:41:18.706] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:18.706] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:18.706] .init = FALSE) [18:41:18.706] } [18:41:18.706] } [18:41:18.706] } [18:41:18.706] }) [18:41:18.706] if (TRUE) { [18:41:18.706] base::sink(type = "output", split = FALSE) [18:41:18.706] if (TRUE) { [18:41:18.706] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:18.706] } [18:41:18.706] else { [18:41:18.706] ...future.result["stdout"] <- base::list(NULL) [18:41:18.706] } [18:41:18.706] base::close(...future.stdout) [18:41:18.706] ...future.stdout <- NULL [18:41:18.706] } [18:41:18.706] ...future.result$conditions <- ...future.conditions [18:41:18.706] ...future.result$finished <- base::Sys.time() [18:41:18.706] ...future.result [18:41:18.706] } [18:41:18.710] assign_globals() ... [18:41:18.711] List of 5 [18:41:18.711] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:18.711] $ future.call.arguments :List of 1 [18:41:18.711] ..$ length: int 2 [18:41:18.711] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:18.711] $ ...future.elements_ii :List of 4 [18:41:18.711] ..$ a: chr "integer" [18:41:18.711] ..$ b: chr "numeric" [18:41:18.711] ..$ c: chr "character" [18:41:18.711] ..$ c: chr "list" [18:41:18.711] $ ...future.seeds_ii : NULL [18:41:18.711] $ ...future.globals.maxSize: NULL [18:41:18.711] - attr(*, "where")=List of 5 [18:41:18.711] ..$ ...future.FUN : [18:41:18.711] ..$ future.call.arguments : [18:41:18.711] ..$ ...future.elements_ii : [18:41:18.711] ..$ ...future.seeds_ii : [18:41:18.711] ..$ ...future.globals.maxSize: [18:41:18.711] - attr(*, "resolved")= logi FALSE [18:41:18.711] - attr(*, "total_size")= num 4406 [18:41:18.711] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:18.711] - attr(*, "already-done")= logi TRUE [18:41:18.718] - copied '...future.FUN' to environment [18:41:18.718] - copied 'future.call.arguments' to environment [18:41:18.718] - copied '...future.elements_ii' to environment [18:41:18.718] - copied '...future.seeds_ii' to environment [18:41:18.718] - copied '...future.globals.maxSize' to environment [18:41:18.718] assign_globals() ... done [18:41:18.719] plan(): Setting new future strategy stack: [18:41:18.719] List of future strategies: [18:41:18.719] 1. sequential: [18:41:18.719] - args: function (..., envir = parent.frame(), workers = "") [18:41:18.719] - tweaked: FALSE [18:41:18.719] - call: NULL [18:41:18.720] plan(): nbrOfWorkers() = 1 [18:41:18.721] plan(): Setting new future strategy stack: [18:41:18.721] List of future strategies: [18:41:18.721] 1. multisession: [18:41:18.721] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:41:18.721] - tweaked: FALSE [18:41:18.721] - call: plan(strategy) [18:41:18.724] plan(): nbrOfWorkers() = 1 [18:41:18.724] SequentialFuture started (and completed) [18:41:18.724] - Launch lazy future ... done [18:41:18.724] run() for 'SequentialFuture' ... done [18:41:18.725] Created future: [18:41:18.725] SequentialFuture: [18:41:18.725] Label: 'future_lapply-1' [18:41:18.725] Expression: [18:41:18.725] { [18:41:18.725] do.call(function(...) { [18:41:18.725] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.725] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:18.725] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.725] on.exit(options(oopts), add = TRUE) [18:41:18.725] } [18:41:18.725] { [18:41:18.725] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:18.725] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.725] ...future.FUN(...future.X_jj, ...) [18:41:18.725] }) [18:41:18.725] } [18:41:18.725] }, args = future.call.arguments) [18:41:18.725] } [18:41:18.725] Lazy evaluation: FALSE [18:41:18.725] Asynchronous evaluation: FALSE [18:41:18.725] Local evaluation: TRUE [18:41:18.725] Environment: R_GlobalEnv [18:41:18.725] Capture standard output: TRUE [18:41:18.725] Capture condition classes: 'condition' (excluding 'nothing') [18:41:18.725] Globals: 5 objects totaling 853 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 191 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:18.725] Packages: [18:41:18.725] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:18.725] Resolved: TRUE [18:41:18.725] Value: 111 bytes of class 'list' [18:41:18.725] Early signaling: FALSE [18:41:18.725] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:18.725] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:18.726] Chunk #1 of 1 ... DONE [18:41:18.726] Launching 1 futures (chunks) ... DONE [18:41:18.726] Resolving 1 futures (chunks) ... [18:41:18.726] resolve() on list ... [18:41:18.727] recursive: 0 [18:41:18.727] length: 1 [18:41:18.727] [18:41:18.727] resolved() for 'SequentialFuture' ... [18:41:18.727] - state: 'finished' [18:41:18.727] - run: TRUE [18:41:18.728] - result: 'FutureResult' [18:41:18.728] resolved() for 'SequentialFuture' ... done [18:41:18.728] Future #1 [18:41:18.728] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:18.728] - nx: 1 [18:41:18.728] - relay: TRUE [18:41:18.729] - stdout: TRUE [18:41:18.729] - signal: TRUE [18:41:18.729] - resignal: FALSE [18:41:18.729] - force: TRUE [18:41:18.729] - relayed: [n=1] FALSE [18:41:18.729] - queued futures: [n=1] FALSE [18:41:18.730] - until=1 [18:41:18.730] - relaying element #1 [18:41:18.730] - relayed: [n=1] TRUE [18:41:18.730] - queued futures: [n=1] TRUE [18:41:18.730] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:18.730] length: 0 (resolved future 1) [18:41:18.731] Relaying remaining futures [18:41:18.731] signalConditionsASAP(NULL, pos=0) ... [18:41:18.731] - nx: 1 [18:41:18.731] - relay: TRUE [18:41:18.731] - stdout: TRUE [18:41:18.731] - signal: TRUE [18:41:18.732] - resignal: FALSE [18:41:18.732] - force: TRUE [18:41:18.732] - relayed: [n=1] TRUE [18:41:18.732] - queued futures: [n=1] TRUE - flush all [18:41:18.732] - relayed: [n=1] TRUE [18:41:18.732] - queued futures: [n=1] TRUE [18:41:18.733] signalConditionsASAP(NULL, pos=0) ... done [18:41:18.733] resolve() on list ... DONE [18:41:18.733] - Number of value chunks collected: 1 [18:41:18.733] Resolving 1 futures (chunks) ... DONE [18:41:18.733] Reducing values from 1 chunks ... [18:41:18.733] - Number of values collected after concatenation: 4 [18:41:18.734] - Number of values expected: 4 [18:41:18.734] Reducing values from 1 chunks ... DONE [18:41:18.734] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL - future_lapply(x, FUN = future:::hpaste, ...) ... [18:41:18.737] future_lapply() ... [18:41:18.747] Number of chunks: 1 [18:41:18.747] getGlobalsAndPackagesXApply() ... [18:41:18.747] - future.globals: TRUE [18:41:18.747] getGlobalsAndPackages() ... [18:41:18.748] Searching for globals... [18:41:18.759] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [18:41:18.759] Searching for globals ... DONE [18:41:18.760] Resolving globals: FALSE [18:41:18.761] The total size of the 1 globals is 7.17 KiB (7342 bytes) [18:41:18.761] The total size of the 1 globals exported for future expression ('FUN(collapse = "; ", maxHead = 3L)') is 7.17 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (7.17 KiB of class 'function') [18:41:18.761] - globals: [1] 'FUN' [18:41:18.762] - packages: [1] 'future' [18:41:18.762] getGlobalsAndPackages() ... DONE [18:41:18.762] - globals found/used: [n=1] 'FUN' [18:41:18.762] - needed namespaces: [n=1] 'future' [18:41:18.762] Finding globals ... DONE [18:41:18.762] - use_args: TRUE [18:41:18.763] - Getting '...' globals ... [18:41:18.763] resolve() on list ... [18:41:18.763] recursive: 0 [18:41:18.763] length: 1 [18:41:18.764] elements: '...' [18:41:18.764] length: 0 (resolved future 1) [18:41:18.764] resolve() on list ... DONE [18:41:18.764] - '...' content: [n=2] 'collapse', 'maxHead' [18:41:18.764] List of 1 [18:41:18.764] $ ...:List of 2 [18:41:18.764] ..$ collapse: chr "; " [18:41:18.764] ..$ maxHead : int 3 [18:41:18.764] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:18.764] - attr(*, "where")=List of 1 [18:41:18.764] ..$ ...: [18:41:18.764] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:18.764] - attr(*, "resolved")= logi TRUE [18:41:18.764] - attr(*, "total_size")= num NA [18:41:18.768] - Getting '...' globals ... DONE [18:41:18.768] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:18.768] List of 2 [18:41:18.768] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [18:41:18.768] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [18:41:18.768] $ ... :List of 2 [18:41:18.768] ..$ collapse: chr "; " [18:41:18.768] ..$ maxHead : int 3 [18:41:18.768] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:18.768] - attr(*, "where")=List of 2 [18:41:18.768] ..$ ...future.FUN: [18:41:18.768] ..$ ... : [18:41:18.768] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:18.768] - attr(*, "resolved")= logi FALSE [18:41:18.768] - attr(*, "total_size")= int 20301 [18:41:18.772] Packages to be attached in all futures: [n=1] 'future' [18:41:18.773] getGlobalsAndPackagesXApply() ... DONE [18:41:18.773] Number of futures (= number of chunks): 1 [18:41:18.773] Launching 1 futures (chunks) ... [18:41:18.773] Chunk #1 of 1 ... [18:41:18.773] - Finding globals in 'X' for chunk #1 ... [18:41:18.773] getGlobalsAndPackages() ... [18:41:18.774] Searching for globals... [18:41:18.774] [18:41:18.774] Searching for globals ... DONE [18:41:18.774] - globals: [0] [18:41:18.774] getGlobalsAndPackages() ... DONE [18:41:18.775] + additional globals found: [n=0] [18:41:18.775] + additional namespaces needed: [n=0] [18:41:18.775] - Finding globals in 'X' for chunk #1 ... DONE [18:41:18.775] - seeds: [18:41:18.775] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.775] getGlobalsAndPackages() ... [18:41:18.776] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.776] Resolving globals: FALSE [18:41:18.776] Tweak future expression to call with '...' arguments ... [18:41:18.776] { [18:41:18.776] do.call(function(...) { [18:41:18.776] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.776] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:18.776] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.776] on.exit(options(oopts), add = TRUE) [18:41:18.776] } [18:41:18.776] { [18:41:18.776] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:18.776] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.776] ...future.FUN(...future.X_jj, ...) [18:41:18.776] }) [18:41:18.776] } [18:41:18.776] }, args = future.call.arguments) [18:41:18.776] } [18:41:18.777] Tweak future expression to call with '...' arguments ... DONE [18:41:18.777] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.777] - packages: [1] 'future' [18:41:18.777] getGlobalsAndPackages() ... DONE [18:41:18.778] run() for 'Future' ... [18:41:18.778] - state: 'created' [18:41:18.778] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:18.780] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:18.781] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:18.781] - Field: 'label' [18:41:18.781] - Field: 'local' [18:41:18.781] - Field: 'owner' [18:41:18.781] - Field: 'envir' [18:41:18.782] - Field: 'packages' [18:41:18.782] - Field: 'gc' [18:41:18.782] - Field: 'conditions' [18:41:18.782] - Field: 'expr' [18:41:18.782] - Field: 'uuid' [18:41:18.782] - Field: 'seed' [18:41:18.783] - Field: 'version' [18:41:18.783] - Field: 'result' [18:41:18.783] - Field: 'asynchronous' [18:41:18.783] - Field: 'calls' [18:41:18.783] - Field: 'globals' [18:41:18.784] - Field: 'stdout' [18:41:18.784] - Field: 'earlySignal' [18:41:18.784] - Field: 'lazy' [18:41:18.784] - Field: 'state' [18:41:18.784] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:18.784] - Launch lazy future ... [18:41:18.785] Packages needed by the future expression (n = 1): 'future' [18:41:18.785] Packages needed by future strategies (n = 0): [18:41:18.785] { [18:41:18.785] { [18:41:18.785] { [18:41:18.785] ...future.startTime <- base::Sys.time() [18:41:18.785] { [18:41:18.785] { [18:41:18.785] { [18:41:18.785] { [18:41:18.785] base::local({ [18:41:18.785] has_future <- base::requireNamespace("future", [18:41:18.785] quietly = TRUE) [18:41:18.785] if (has_future) { [18:41:18.785] ns <- base::getNamespace("future") [18:41:18.785] version <- ns[[".package"]][["version"]] [18:41:18.785] if (is.null(version)) [18:41:18.785] version <- utils::packageVersion("future") [18:41:18.785] } [18:41:18.785] else { [18:41:18.785] version <- NULL [18:41:18.785] } [18:41:18.785] if (!has_future || version < "1.8.0") { [18:41:18.785] info <- base::c(r_version = base::gsub("R version ", [18:41:18.785] "", base::R.version$version.string), [18:41:18.785] platform = base::sprintf("%s (%s-bit)", [18:41:18.785] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:18.785] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:18.785] "release", "version")], collapse = " "), [18:41:18.785] hostname = base::Sys.info()[["nodename"]]) [18:41:18.785] info <- base::sprintf("%s: %s", base::names(info), [18:41:18.785] info) [18:41:18.785] info <- base::paste(info, collapse = "; ") [18:41:18.785] if (!has_future) { [18:41:18.785] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:18.785] info) [18:41:18.785] } [18:41:18.785] else { [18:41:18.785] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:18.785] info, version) [18:41:18.785] } [18:41:18.785] base::stop(msg) [18:41:18.785] } [18:41:18.785] }) [18:41:18.785] } [18:41:18.785] base::local({ [18:41:18.785] for (pkg in "future") { [18:41:18.785] base::loadNamespace(pkg) [18:41:18.785] base::library(pkg, character.only = TRUE) [18:41:18.785] } [18:41:18.785] }) [18:41:18.785] } [18:41:18.785] ...future.strategy.old <- future::plan("list") [18:41:18.785] options(future.plan = NULL) [18:41:18.785] Sys.unsetenv("R_FUTURE_PLAN") [18:41:18.785] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:18.785] } [18:41:18.785] ...future.workdir <- getwd() [18:41:18.785] } [18:41:18.785] ...future.oldOptions <- base::as.list(base::.Options) [18:41:18.785] ...future.oldEnvVars <- base::Sys.getenv() [18:41:18.785] } [18:41:18.785] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:18.785] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:18.785] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:18.785] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:18.785] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:18.785] future.stdout.windows.reencode = NULL, width = 80L) [18:41:18.785] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:18.785] base::names(...future.oldOptions)) [18:41:18.785] } [18:41:18.785] if (FALSE) { [18:41:18.785] } [18:41:18.785] else { [18:41:18.785] if (TRUE) { [18:41:18.785] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:18.785] open = "w") [18:41:18.785] } [18:41:18.785] else { [18:41:18.785] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:18.785] windows = "NUL", "/dev/null"), open = "w") [18:41:18.785] } [18:41:18.785] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:18.785] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:18.785] base::sink(type = "output", split = FALSE) [18:41:18.785] base::close(...future.stdout) [18:41:18.785] }, add = TRUE) [18:41:18.785] } [18:41:18.785] ...future.frame <- base::sys.nframe() [18:41:18.785] ...future.conditions <- base::list() [18:41:18.785] ...future.rng <- base::globalenv()$.Random.seed [18:41:18.785] if (FALSE) { [18:41:18.785] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:18.785] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:18.785] } [18:41:18.785] ...future.result <- base::tryCatch({ [18:41:18.785] base::withCallingHandlers({ [18:41:18.785] ...future.value <- base::withVisible(base::local({ [18:41:18.785] do.call(function(...) { [18:41:18.785] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.785] if (!identical(...future.globals.maxSize.org, [18:41:18.785] ...future.globals.maxSize)) { [18:41:18.785] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.785] on.exit(options(oopts), add = TRUE) [18:41:18.785] } [18:41:18.785] { [18:41:18.785] lapply(seq_along(...future.elements_ii), [18:41:18.785] FUN = function(jj) { [18:41:18.785] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.785] ...future.FUN(...future.X_jj, ...) [18:41:18.785] }) [18:41:18.785] } [18:41:18.785] }, args = future.call.arguments) [18:41:18.785] })) [18:41:18.785] future::FutureResult(value = ...future.value$value, [18:41:18.785] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:18.785] ...future.rng), globalenv = if (FALSE) [18:41:18.785] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:18.785] ...future.globalenv.names)) [18:41:18.785] else NULL, started = ...future.startTime, version = "1.8") [18:41:18.785] }, condition = base::local({ [18:41:18.785] c <- base::c [18:41:18.785] inherits <- base::inherits [18:41:18.785] invokeRestart <- base::invokeRestart [18:41:18.785] length <- base::length [18:41:18.785] list <- base::list [18:41:18.785] seq.int <- base::seq.int [18:41:18.785] signalCondition <- base::signalCondition [18:41:18.785] sys.calls <- base::sys.calls [18:41:18.785] `[[` <- base::`[[` [18:41:18.785] `+` <- base::`+` [18:41:18.785] `<<-` <- base::`<<-` [18:41:18.785] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:18.785] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:18.785] 3L)] [18:41:18.785] } [18:41:18.785] function(cond) { [18:41:18.785] is_error <- inherits(cond, "error") [18:41:18.785] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:18.785] NULL) [18:41:18.785] if (is_error) { [18:41:18.785] sessionInformation <- function() { [18:41:18.785] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:18.785] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:18.785] search = base::search(), system = base::Sys.info()) [18:41:18.785] } [18:41:18.785] ...future.conditions[[length(...future.conditions) + [18:41:18.785] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:18.785] cond$call), session = sessionInformation(), [18:41:18.785] timestamp = base::Sys.time(), signaled = 0L) [18:41:18.785] signalCondition(cond) [18:41:18.785] } [18:41:18.785] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:18.785] "immediateCondition"))) { [18:41:18.785] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:18.785] ...future.conditions[[length(...future.conditions) + [18:41:18.785] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:18.785] if (TRUE && !signal) { [18:41:18.785] muffleCondition <- function (cond, pattern = "^muffle") [18:41:18.785] { [18:41:18.785] inherits <- base::inherits [18:41:18.785] invokeRestart <- base::invokeRestart [18:41:18.785] is.null <- base::is.null [18:41:18.785] muffled <- FALSE [18:41:18.785] if (inherits(cond, "message")) { [18:41:18.785] muffled <- grepl(pattern, "muffleMessage") [18:41:18.785] if (muffled) [18:41:18.785] invokeRestart("muffleMessage") [18:41:18.785] } [18:41:18.785] else if (inherits(cond, "warning")) { [18:41:18.785] muffled <- grepl(pattern, "muffleWarning") [18:41:18.785] if (muffled) [18:41:18.785] invokeRestart("muffleWarning") [18:41:18.785] } [18:41:18.785] else if (inherits(cond, "condition")) { [18:41:18.785] if (!is.null(pattern)) { [18:41:18.785] computeRestarts <- base::computeRestarts [18:41:18.785] grepl <- base::grepl [18:41:18.785] restarts <- computeRestarts(cond) [18:41:18.785] for (restart in restarts) { [18:41:18.785] name <- restart$name [18:41:18.785] if (is.null(name)) [18:41:18.785] next [18:41:18.785] if (!grepl(pattern, name)) [18:41:18.785] next [18:41:18.785] invokeRestart(restart) [18:41:18.785] muffled <- TRUE [18:41:18.785] break [18:41:18.785] } [18:41:18.785] } [18:41:18.785] } [18:41:18.785] invisible(muffled) [18:41:18.785] } [18:41:18.785] muffleCondition(cond, pattern = "^muffle") [18:41:18.785] } [18:41:18.785] } [18:41:18.785] else { [18:41:18.785] if (TRUE) { [18:41:18.785] muffleCondition <- function (cond, pattern = "^muffle") [18:41:18.785] { [18:41:18.785] inherits <- base::inherits [18:41:18.785] invokeRestart <- base::invokeRestart [18:41:18.785] is.null <- base::is.null [18:41:18.785] muffled <- FALSE [18:41:18.785] if (inherits(cond, "message")) { [18:41:18.785] muffled <- grepl(pattern, "muffleMessage") [18:41:18.785] if (muffled) [18:41:18.785] invokeRestart("muffleMessage") [18:41:18.785] } [18:41:18.785] else if (inherits(cond, "warning")) { [18:41:18.785] muffled <- grepl(pattern, "muffleWarning") [18:41:18.785] if (muffled) [18:41:18.785] invokeRestart("muffleWarning") [18:41:18.785] } [18:41:18.785] else if (inherits(cond, "condition")) { [18:41:18.785] if (!is.null(pattern)) { [18:41:18.785] computeRestarts <- base::computeRestarts [18:41:18.785] grepl <- base::grepl [18:41:18.785] restarts <- computeRestarts(cond) [18:41:18.785] for (restart in restarts) { [18:41:18.785] name <- restart$name [18:41:18.785] if (is.null(name)) [18:41:18.785] next [18:41:18.785] if (!grepl(pattern, name)) [18:41:18.785] next [18:41:18.785] invokeRestart(restart) [18:41:18.785] muffled <- TRUE [18:41:18.785] break [18:41:18.785] } [18:41:18.785] } [18:41:18.785] } [18:41:18.785] invisible(muffled) [18:41:18.785] } [18:41:18.785] muffleCondition(cond, pattern = "^muffle") [18:41:18.785] } [18:41:18.785] } [18:41:18.785] } [18:41:18.785] })) [18:41:18.785] }, error = function(ex) { [18:41:18.785] base::structure(base::list(value = NULL, visible = NULL, [18:41:18.785] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:18.785] ...future.rng), started = ...future.startTime, [18:41:18.785] finished = Sys.time(), session_uuid = NA_character_, [18:41:18.785] version = "1.8"), class = "FutureResult") [18:41:18.785] }, finally = { [18:41:18.785] if (!identical(...future.workdir, getwd())) [18:41:18.785] setwd(...future.workdir) [18:41:18.785] { [18:41:18.785] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:18.785] ...future.oldOptions$nwarnings <- NULL [18:41:18.785] } [18:41:18.785] base::options(...future.oldOptions) [18:41:18.785] if (.Platform$OS.type == "windows") { [18:41:18.785] old_names <- names(...future.oldEnvVars) [18:41:18.785] envs <- base::Sys.getenv() [18:41:18.785] names <- names(envs) [18:41:18.785] common <- intersect(names, old_names) [18:41:18.785] added <- setdiff(names, old_names) [18:41:18.785] removed <- setdiff(old_names, names) [18:41:18.785] changed <- common[...future.oldEnvVars[common] != [18:41:18.785] envs[common]] [18:41:18.785] NAMES <- toupper(changed) [18:41:18.785] args <- list() [18:41:18.785] for (kk in seq_along(NAMES)) { [18:41:18.785] name <- changed[[kk]] [18:41:18.785] NAME <- NAMES[[kk]] [18:41:18.785] if (name != NAME && is.element(NAME, old_names)) [18:41:18.785] next [18:41:18.785] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:18.785] } [18:41:18.785] NAMES <- toupper(added) [18:41:18.785] for (kk in seq_along(NAMES)) { [18:41:18.785] name <- added[[kk]] [18:41:18.785] NAME <- NAMES[[kk]] [18:41:18.785] if (name != NAME && is.element(NAME, old_names)) [18:41:18.785] next [18:41:18.785] args[[name]] <- "" [18:41:18.785] } [18:41:18.785] NAMES <- toupper(removed) [18:41:18.785] for (kk in seq_along(NAMES)) { [18:41:18.785] name <- removed[[kk]] [18:41:18.785] NAME <- NAMES[[kk]] [18:41:18.785] if (name != NAME && is.element(NAME, old_names)) [18:41:18.785] next [18:41:18.785] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:18.785] } [18:41:18.785] if (length(args) > 0) [18:41:18.785] base::do.call(base::Sys.setenv, args = args) [18:41:18.785] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:18.785] } [18:41:18.785] else { [18:41:18.785] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:18.785] } [18:41:18.785] { [18:41:18.785] if (base::length(...future.futureOptionsAdded) > [18:41:18.785] 0L) { [18:41:18.785] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:18.785] base::names(opts) <- ...future.futureOptionsAdded [18:41:18.785] base::options(opts) [18:41:18.785] } [18:41:18.785] { [18:41:18.785] { [18:41:18.785] NULL [18:41:18.785] RNGkind("Mersenne-Twister") [18:41:18.785] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:18.785] inherits = FALSE) [18:41:18.785] } [18:41:18.785] options(future.plan = NULL) [18:41:18.785] if (is.na(NA_character_)) [18:41:18.785] Sys.unsetenv("R_FUTURE_PLAN") [18:41:18.785] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:18.785] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:18.785] .init = FALSE) [18:41:18.785] } [18:41:18.785] } [18:41:18.785] } [18:41:18.785] }) [18:41:18.785] if (TRUE) { [18:41:18.785] base::sink(type = "output", split = FALSE) [18:41:18.785] if (TRUE) { [18:41:18.785] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:18.785] } [18:41:18.785] else { [18:41:18.785] ...future.result["stdout"] <- base::list(NULL) [18:41:18.785] } [18:41:18.785] base::close(...future.stdout) [18:41:18.785] ...future.stdout <- NULL [18:41:18.785] } [18:41:18.785] ...future.result$conditions <- ...future.conditions [18:41:18.785] ...future.result$finished <- base::Sys.time() [18:41:18.785] ...future.result [18:41:18.785] } [18:41:18.789] assign_globals() ... [18:41:18.789] List of 5 [18:41:18.789] $ ...future.FUN :function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [18:41:18.789] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [18:41:18.789] $ future.call.arguments :List of 2 [18:41:18.789] ..$ collapse: chr "; " [18:41:18.789] ..$ maxHead : int 3 [18:41:18.789] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:18.789] $ ...future.elements_ii :List of 1 [18:41:18.789] ..$ a: Named chr [1:101] "hello" "1" "2" "3" ... [18:41:18.789] .. ..- attr(*, "names")= chr [1:101] "" "b1" "b2" "b3" ... [18:41:18.789] $ ...future.seeds_ii : NULL [18:41:18.789] $ ...future.globals.maxSize: NULL [18:41:18.789] - attr(*, "where")=List of 5 [18:41:18.789] ..$ ...future.FUN : [18:41:18.789] ..$ future.call.arguments : [18:41:18.789] ..$ ...future.elements_ii : [18:41:18.789] ..$ ...future.seeds_ii : [18:41:18.789] ..$ ...future.globals.maxSize: [18:41:18.789] - attr(*, "resolved")= logi FALSE [18:41:18.789] - attr(*, "total_size")= num 20301 [18:41:18.789] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:18.789] - attr(*, "already-done")= logi TRUE [18:41:18.796] - copied '...future.FUN' to environment [18:41:18.797] - copied 'future.call.arguments' to environment [18:41:18.797] - copied '...future.elements_ii' to environment [18:41:18.797] - copied '...future.seeds_ii' to environment [18:41:18.797] - copied '...future.globals.maxSize' to environment [18:41:18.797] assign_globals() ... done [18:41:18.798] plan(): Setting new future strategy stack: [18:41:18.798] List of future strategies: [18:41:18.798] 1. sequential: [18:41:18.798] - args: function (..., envir = parent.frame(), workers = "") [18:41:18.798] - tweaked: FALSE [18:41:18.798] - call: NULL [18:41:18.799] plan(): nbrOfWorkers() = 1 [18:41:18.800] plan(): Setting new future strategy stack: [18:41:18.800] List of future strategies: [18:41:18.800] 1. multisession: [18:41:18.800] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:41:18.800] - tweaked: FALSE [18:41:18.800] - call: plan(strategy) [18:41:18.803] plan(): nbrOfWorkers() = 1 [18:41:18.803] SequentialFuture started (and completed) [18:41:18.803] - Launch lazy future ... done [18:41:18.803] run() for 'SequentialFuture' ... done [18:41:18.804] Created future: [18:41:18.804] SequentialFuture: [18:41:18.804] Label: 'future_lapply-1' [18:41:18.804] Expression: [18:41:18.804] { [18:41:18.804] do.call(function(...) { [18:41:18.804] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.804] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:18.804] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.804] on.exit(options(oopts), add = TRUE) [18:41:18.804] } [18:41:18.804] { [18:41:18.804] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:18.804] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.804] ...future.FUN(...future.X_jj, ...) [18:41:18.804] }) [18:41:18.804] } [18:41:18.804] }, args = future.call.arguments) [18:41:18.804] } [18:41:18.804] Lazy evaluation: FALSE [18:41:18.804] Asynchronous evaluation: FALSE [18:41:18.804] Local evaluation: TRUE [18:41:18.804] Environment: R_GlobalEnv [18:41:18.804] Capture standard output: TRUE [18:41:18.804] Capture condition classes: 'condition' (excluding 'nothing') [18:41:18.804] Globals: 5 objects totaling 9.56 KiB (function '...future.FUN' of 7.17 KiB, DotDotDotList 'future.call.arguments' of 187 bytes, list '...future.elements_ii' of 2.15 KiB, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:18.804] Packages: 1 packages ('future') [18:41:18.804] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:18.804] Resolved: TRUE [18:41:18.804] Value: 68 bytes of class 'list' [18:41:18.804] Early signaling: FALSE [18:41:18.804] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:18.804] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:18.805] Chunk #1 of 1 ... DONE [18:41:18.805] Launching 1 futures (chunks) ... DONE [18:41:18.805] Resolving 1 futures (chunks) ... [18:41:18.805] resolve() on list ... [18:41:18.806] recursive: 0 [18:41:18.806] length: 1 [18:41:18.806] [18:41:18.806] resolved() for 'SequentialFuture' ... [18:41:18.806] - state: 'finished' [18:41:18.806] - run: TRUE [18:41:18.807] - result: 'FutureResult' [18:41:18.807] resolved() for 'SequentialFuture' ... done [18:41:18.807] Future #1 [18:41:18.807] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:18.807] - nx: 1 [18:41:18.807] - relay: TRUE [18:41:18.808] - stdout: TRUE [18:41:18.808] - signal: TRUE [18:41:18.808] - resignal: FALSE [18:41:18.808] - force: TRUE [18:41:18.808] - relayed: [n=1] FALSE [18:41:18.808] - queued futures: [n=1] FALSE [18:41:18.808] - until=1 [18:41:18.809] - relaying element #1 [18:41:18.809] - relayed: [n=1] TRUE [18:41:18.809] - queued futures: [n=1] TRUE [18:41:18.809] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:18.809] length: 0 (resolved future 1) [18:41:18.810] Relaying remaining futures [18:41:18.810] signalConditionsASAP(NULL, pos=0) ... [18:41:18.810] - nx: 1 [18:41:18.810] - relay: TRUE [18:41:18.810] - stdout: TRUE [18:41:18.810] - signal: TRUE [18:41:18.810] - resignal: FALSE [18:41:18.811] - force: TRUE [18:41:18.811] - relayed: [n=1] TRUE [18:41:18.811] - queued futures: [n=1] TRUE - flush all [18:41:18.811] - relayed: [n=1] TRUE [18:41:18.811] - queued futures: [n=1] TRUE [18:41:18.811] signalConditionsASAP(NULL, pos=0) ... done [18:41:18.812] resolve() on list ... DONE [18:41:18.812] - Number of value chunks collected: 1 [18:41:18.812] Resolving 1 futures (chunks) ... DONE [18:41:18.812] Reducing values from 1 chunks ... [18:41:18.812] - Number of values collected after concatenation: 1 [18:41:18.812] - Number of values expected: 1 [18:41:18.813] Reducing values from 1 chunks ... DONE [18:41:18.813] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [18:41:18.814] future_lapply() ... [18:41:18.817] Number of chunks: 1 [18:41:18.817] getGlobalsAndPackagesXApply() ... [18:41:18.817] - future.globals: TRUE [18:41:18.817] getGlobalsAndPackages() ... [18:41:18.817] Searching for globals... [18:41:18.819] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [18:41:18.819] Searching for globals ... DONE [18:41:18.819] Resolving globals: FALSE [18:41:18.819] The total size of the 1 globals is 911 bytes (911 bytes) [18:41:18.820] The total size of the 1 globals exported for future expression ('FUN()') is 911 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (911 bytes of class 'function') [18:41:18.820] - globals: [1] 'FUN' [18:41:18.820] - packages: [1] 'listenv' [18:41:18.821] getGlobalsAndPackages() ... DONE [18:41:18.821] - globals found/used: [n=1] 'FUN' [18:41:18.821] - needed namespaces: [n=1] 'listenv' [18:41:18.821] Finding globals ... DONE [18:41:18.821] - use_args: TRUE [18:41:18.822] - Getting '...' globals ... [18:41:18.822] resolve() on list ... [18:41:18.822] recursive: 0 [18:41:18.822] length: 1 [18:41:18.822] elements: '...' [18:41:18.823] length: 0 (resolved future 1) [18:41:18.823] resolve() on list ... DONE [18:41:18.823] - '...' content: [n=0] [18:41:18.823] List of 1 [18:41:18.823] $ ...: list() [18:41:18.823] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:18.823] - attr(*, "where")=List of 1 [18:41:18.823] ..$ ...: [18:41:18.823] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:18.823] - attr(*, "resolved")= logi TRUE [18:41:18.823] - attr(*, "total_size")= num NA [18:41:18.826] - Getting '...' globals ... DONE [18:41:18.826] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:18.826] List of 2 [18:41:18.826] $ ...future.FUN:function (x, ...) [18:41:18.826] $ ... : list() [18:41:18.826] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:18.826] - attr(*, "where")=List of 2 [18:41:18.826] ..$ ...future.FUN: [18:41:18.826] ..$ ... : [18:41:18.826] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:18.826] - attr(*, "resolved")= logi FALSE [18:41:18.826] - attr(*, "total_size")= int 8145 [18:41:18.830] Packages to be attached in all futures: [n=1] 'listenv' [18:41:18.830] getGlobalsAndPackagesXApply() ... DONE [18:41:18.830] Number of futures (= number of chunks): 1 [18:41:18.830] Launching 1 futures (chunks) ... [18:41:18.830] Chunk #1 of 1 ... [18:41:18.831] - Finding globals in 'X' for chunk #1 ... [18:41:18.831] getGlobalsAndPackages() ... [18:41:18.831] Searching for globals... [18:41:18.831] [18:41:18.832] Searching for globals ... DONE [18:41:18.832] - globals: [0] [18:41:18.832] getGlobalsAndPackages() ... DONE [18:41:18.832] + additional globals found: [n=0] [18:41:18.832] + additional namespaces needed: [n=0] [18:41:18.833] - Finding globals in 'X' for chunk #1 ... DONE [18:41:18.833] - seeds: [18:41:18.833] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.833] getGlobalsAndPackages() ... [18:41:18.833] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.833] Resolving globals: FALSE [18:41:18.834] Tweak future expression to call with '...' arguments ... [18:41:18.834] { [18:41:18.834] do.call(function(...) { [18:41:18.834] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.834] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:18.834] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.834] on.exit(options(oopts), add = TRUE) [18:41:18.834] } [18:41:18.834] { [18:41:18.834] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:18.834] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.834] ...future.FUN(...future.X_jj, ...) [18:41:18.834] }) [18:41:18.834] } [18:41:18.834] }, args = future.call.arguments) [18:41:18.834] } [18:41:18.834] Tweak future expression to call with '...' arguments ... DONE [18:41:18.835] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.835] - packages: [1] 'listenv' [18:41:18.835] getGlobalsAndPackages() ... DONE [18:41:18.835] run() for 'Future' ... [18:41:18.836] - state: 'created' [18:41:18.836] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:18.838] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:18.838] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:18.839] - Field: 'label' [18:41:18.839] - Field: 'local' [18:41:18.839] - Field: 'owner' [18:41:18.839] - Field: 'envir' [18:41:18.839] - Field: 'packages' [18:41:18.839] - Field: 'gc' [18:41:18.840] - Field: 'conditions' [18:41:18.840] - Field: 'expr' [18:41:18.840] - Field: 'uuid' [18:41:18.840] - Field: 'seed' [18:41:18.840] - Field: 'version' [18:41:18.840] - Field: 'result' [18:41:18.841] - Field: 'asynchronous' [18:41:18.841] - Field: 'calls' [18:41:18.841] - Field: 'globals' [18:41:18.841] - Field: 'stdout' [18:41:18.841] - Field: 'earlySignal' [18:41:18.842] - Field: 'lazy' [18:41:18.842] - Field: 'state' [18:41:18.842] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:18.842] - Launch lazy future ... [18:41:18.842] Packages needed by the future expression (n = 1): 'listenv' [18:41:18.842] Packages needed by future strategies (n = 0): [18:41:18.843] { [18:41:18.843] { [18:41:18.843] { [18:41:18.843] ...future.startTime <- base::Sys.time() [18:41:18.843] { [18:41:18.843] { [18:41:18.843] { [18:41:18.843] { [18:41:18.843] base::local({ [18:41:18.843] has_future <- base::requireNamespace("future", [18:41:18.843] quietly = TRUE) [18:41:18.843] if (has_future) { [18:41:18.843] ns <- base::getNamespace("future") [18:41:18.843] version <- ns[[".package"]][["version"]] [18:41:18.843] if (is.null(version)) [18:41:18.843] version <- utils::packageVersion("future") [18:41:18.843] } [18:41:18.843] else { [18:41:18.843] version <- NULL [18:41:18.843] } [18:41:18.843] if (!has_future || version < "1.8.0") { [18:41:18.843] info <- base::c(r_version = base::gsub("R version ", [18:41:18.843] "", base::R.version$version.string), [18:41:18.843] platform = base::sprintf("%s (%s-bit)", [18:41:18.843] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:18.843] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:18.843] "release", "version")], collapse = " "), [18:41:18.843] hostname = base::Sys.info()[["nodename"]]) [18:41:18.843] info <- base::sprintf("%s: %s", base::names(info), [18:41:18.843] info) [18:41:18.843] info <- base::paste(info, collapse = "; ") [18:41:18.843] if (!has_future) { [18:41:18.843] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:18.843] info) [18:41:18.843] } [18:41:18.843] else { [18:41:18.843] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:18.843] info, version) [18:41:18.843] } [18:41:18.843] base::stop(msg) [18:41:18.843] } [18:41:18.843] }) [18:41:18.843] } [18:41:18.843] base::local({ [18:41:18.843] for (pkg in "listenv") { [18:41:18.843] base::loadNamespace(pkg) [18:41:18.843] base::library(pkg, character.only = TRUE) [18:41:18.843] } [18:41:18.843] }) [18:41:18.843] } [18:41:18.843] ...future.strategy.old <- future::plan("list") [18:41:18.843] options(future.plan = NULL) [18:41:18.843] Sys.unsetenv("R_FUTURE_PLAN") [18:41:18.843] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:18.843] } [18:41:18.843] ...future.workdir <- getwd() [18:41:18.843] } [18:41:18.843] ...future.oldOptions <- base::as.list(base::.Options) [18:41:18.843] ...future.oldEnvVars <- base::Sys.getenv() [18:41:18.843] } [18:41:18.843] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:18.843] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:18.843] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:18.843] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:18.843] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:18.843] future.stdout.windows.reencode = NULL, width = 80L) [18:41:18.843] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:18.843] base::names(...future.oldOptions)) [18:41:18.843] } [18:41:18.843] if (FALSE) { [18:41:18.843] } [18:41:18.843] else { [18:41:18.843] if (TRUE) { [18:41:18.843] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:18.843] open = "w") [18:41:18.843] } [18:41:18.843] else { [18:41:18.843] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:18.843] windows = "NUL", "/dev/null"), open = "w") [18:41:18.843] } [18:41:18.843] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:18.843] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:18.843] base::sink(type = "output", split = FALSE) [18:41:18.843] base::close(...future.stdout) [18:41:18.843] }, add = TRUE) [18:41:18.843] } [18:41:18.843] ...future.frame <- base::sys.nframe() [18:41:18.843] ...future.conditions <- base::list() [18:41:18.843] ...future.rng <- base::globalenv()$.Random.seed [18:41:18.843] if (FALSE) { [18:41:18.843] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:18.843] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:18.843] } [18:41:18.843] ...future.result <- base::tryCatch({ [18:41:18.843] base::withCallingHandlers({ [18:41:18.843] ...future.value <- base::withVisible(base::local({ [18:41:18.843] do.call(function(...) { [18:41:18.843] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.843] if (!identical(...future.globals.maxSize.org, [18:41:18.843] ...future.globals.maxSize)) { [18:41:18.843] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.843] on.exit(options(oopts), add = TRUE) [18:41:18.843] } [18:41:18.843] { [18:41:18.843] lapply(seq_along(...future.elements_ii), [18:41:18.843] FUN = function(jj) { [18:41:18.843] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.843] ...future.FUN(...future.X_jj, ...) [18:41:18.843] }) [18:41:18.843] } [18:41:18.843] }, args = future.call.arguments) [18:41:18.843] })) [18:41:18.843] future::FutureResult(value = ...future.value$value, [18:41:18.843] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:18.843] ...future.rng), globalenv = if (FALSE) [18:41:18.843] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:18.843] ...future.globalenv.names)) [18:41:18.843] else NULL, started = ...future.startTime, version = "1.8") [18:41:18.843] }, condition = base::local({ [18:41:18.843] c <- base::c [18:41:18.843] inherits <- base::inherits [18:41:18.843] invokeRestart <- base::invokeRestart [18:41:18.843] length <- base::length [18:41:18.843] list <- base::list [18:41:18.843] seq.int <- base::seq.int [18:41:18.843] signalCondition <- base::signalCondition [18:41:18.843] sys.calls <- base::sys.calls [18:41:18.843] `[[` <- base::`[[` [18:41:18.843] `+` <- base::`+` [18:41:18.843] `<<-` <- base::`<<-` [18:41:18.843] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:18.843] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:18.843] 3L)] [18:41:18.843] } [18:41:18.843] function(cond) { [18:41:18.843] is_error <- inherits(cond, "error") [18:41:18.843] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:18.843] NULL) [18:41:18.843] if (is_error) { [18:41:18.843] sessionInformation <- function() { [18:41:18.843] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:18.843] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:18.843] search = base::search(), system = base::Sys.info()) [18:41:18.843] } [18:41:18.843] ...future.conditions[[length(...future.conditions) + [18:41:18.843] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:18.843] cond$call), session = sessionInformation(), [18:41:18.843] timestamp = base::Sys.time(), signaled = 0L) [18:41:18.843] signalCondition(cond) [18:41:18.843] } [18:41:18.843] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:18.843] "immediateCondition"))) { [18:41:18.843] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:18.843] ...future.conditions[[length(...future.conditions) + [18:41:18.843] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:18.843] if (TRUE && !signal) { [18:41:18.843] muffleCondition <- function (cond, pattern = "^muffle") [18:41:18.843] { [18:41:18.843] inherits <- base::inherits [18:41:18.843] invokeRestart <- base::invokeRestart [18:41:18.843] is.null <- base::is.null [18:41:18.843] muffled <- FALSE [18:41:18.843] if (inherits(cond, "message")) { [18:41:18.843] muffled <- grepl(pattern, "muffleMessage") [18:41:18.843] if (muffled) [18:41:18.843] invokeRestart("muffleMessage") [18:41:18.843] } [18:41:18.843] else if (inherits(cond, "warning")) { [18:41:18.843] muffled <- grepl(pattern, "muffleWarning") [18:41:18.843] if (muffled) [18:41:18.843] invokeRestart("muffleWarning") [18:41:18.843] } [18:41:18.843] else if (inherits(cond, "condition")) { [18:41:18.843] if (!is.null(pattern)) { [18:41:18.843] computeRestarts <- base::computeRestarts [18:41:18.843] grepl <- base::grepl [18:41:18.843] restarts <- computeRestarts(cond) [18:41:18.843] for (restart in restarts) { [18:41:18.843] name <- restart$name [18:41:18.843] if (is.null(name)) [18:41:18.843] next [18:41:18.843] if (!grepl(pattern, name)) [18:41:18.843] next [18:41:18.843] invokeRestart(restart) [18:41:18.843] muffled <- TRUE [18:41:18.843] break [18:41:18.843] } [18:41:18.843] } [18:41:18.843] } [18:41:18.843] invisible(muffled) [18:41:18.843] } [18:41:18.843] muffleCondition(cond, pattern = "^muffle") [18:41:18.843] } [18:41:18.843] } [18:41:18.843] else { [18:41:18.843] if (TRUE) { [18:41:18.843] muffleCondition <- function (cond, pattern = "^muffle") [18:41:18.843] { [18:41:18.843] inherits <- base::inherits [18:41:18.843] invokeRestart <- base::invokeRestart [18:41:18.843] is.null <- base::is.null [18:41:18.843] muffled <- FALSE [18:41:18.843] if (inherits(cond, "message")) { [18:41:18.843] muffled <- grepl(pattern, "muffleMessage") [18:41:18.843] if (muffled) [18:41:18.843] invokeRestart("muffleMessage") [18:41:18.843] } [18:41:18.843] else if (inherits(cond, "warning")) { [18:41:18.843] muffled <- grepl(pattern, "muffleWarning") [18:41:18.843] if (muffled) [18:41:18.843] invokeRestart("muffleWarning") [18:41:18.843] } [18:41:18.843] else if (inherits(cond, "condition")) { [18:41:18.843] if (!is.null(pattern)) { [18:41:18.843] computeRestarts <- base::computeRestarts [18:41:18.843] grepl <- base::grepl [18:41:18.843] restarts <- computeRestarts(cond) [18:41:18.843] for (restart in restarts) { [18:41:18.843] name <- restart$name [18:41:18.843] if (is.null(name)) [18:41:18.843] next [18:41:18.843] if (!grepl(pattern, name)) [18:41:18.843] next [18:41:18.843] invokeRestart(restart) [18:41:18.843] muffled <- TRUE [18:41:18.843] break [18:41:18.843] } [18:41:18.843] } [18:41:18.843] } [18:41:18.843] invisible(muffled) [18:41:18.843] } [18:41:18.843] muffleCondition(cond, pattern = "^muffle") [18:41:18.843] } [18:41:18.843] } [18:41:18.843] } [18:41:18.843] })) [18:41:18.843] }, error = function(ex) { [18:41:18.843] base::structure(base::list(value = NULL, visible = NULL, [18:41:18.843] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:18.843] ...future.rng), started = ...future.startTime, [18:41:18.843] finished = Sys.time(), session_uuid = NA_character_, [18:41:18.843] version = "1.8"), class = "FutureResult") [18:41:18.843] }, finally = { [18:41:18.843] if (!identical(...future.workdir, getwd())) [18:41:18.843] setwd(...future.workdir) [18:41:18.843] { [18:41:18.843] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:18.843] ...future.oldOptions$nwarnings <- NULL [18:41:18.843] } [18:41:18.843] base::options(...future.oldOptions) [18:41:18.843] if (.Platform$OS.type == "windows") { [18:41:18.843] old_names <- names(...future.oldEnvVars) [18:41:18.843] envs <- base::Sys.getenv() [18:41:18.843] names <- names(envs) [18:41:18.843] common <- intersect(names, old_names) [18:41:18.843] added <- setdiff(names, old_names) [18:41:18.843] removed <- setdiff(old_names, names) [18:41:18.843] changed <- common[...future.oldEnvVars[common] != [18:41:18.843] envs[common]] [18:41:18.843] NAMES <- toupper(changed) [18:41:18.843] args <- list() [18:41:18.843] for (kk in seq_along(NAMES)) { [18:41:18.843] name <- changed[[kk]] [18:41:18.843] NAME <- NAMES[[kk]] [18:41:18.843] if (name != NAME && is.element(NAME, old_names)) [18:41:18.843] next [18:41:18.843] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:18.843] } [18:41:18.843] NAMES <- toupper(added) [18:41:18.843] for (kk in seq_along(NAMES)) { [18:41:18.843] name <- added[[kk]] [18:41:18.843] NAME <- NAMES[[kk]] [18:41:18.843] if (name != NAME && is.element(NAME, old_names)) [18:41:18.843] next [18:41:18.843] args[[name]] <- "" [18:41:18.843] } [18:41:18.843] NAMES <- toupper(removed) [18:41:18.843] for (kk in seq_along(NAMES)) { [18:41:18.843] name <- removed[[kk]] [18:41:18.843] NAME <- NAMES[[kk]] [18:41:18.843] if (name != NAME && is.element(NAME, old_names)) [18:41:18.843] next [18:41:18.843] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:18.843] } [18:41:18.843] if (length(args) > 0) [18:41:18.843] base::do.call(base::Sys.setenv, args = args) [18:41:18.843] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:18.843] } [18:41:18.843] else { [18:41:18.843] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:18.843] } [18:41:18.843] { [18:41:18.843] if (base::length(...future.futureOptionsAdded) > [18:41:18.843] 0L) { [18:41:18.843] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:18.843] base::names(opts) <- ...future.futureOptionsAdded [18:41:18.843] base::options(opts) [18:41:18.843] } [18:41:18.843] { [18:41:18.843] { [18:41:18.843] NULL [18:41:18.843] RNGkind("Mersenne-Twister") [18:41:18.843] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:18.843] inherits = FALSE) [18:41:18.843] } [18:41:18.843] options(future.plan = NULL) [18:41:18.843] if (is.na(NA_character_)) [18:41:18.843] Sys.unsetenv("R_FUTURE_PLAN") [18:41:18.843] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:18.843] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:18.843] .init = FALSE) [18:41:18.843] } [18:41:18.843] } [18:41:18.843] } [18:41:18.843] }) [18:41:18.843] if (TRUE) { [18:41:18.843] base::sink(type = "output", split = FALSE) [18:41:18.843] if (TRUE) { [18:41:18.843] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:18.843] } [18:41:18.843] else { [18:41:18.843] ...future.result["stdout"] <- base::list(NULL) [18:41:18.843] } [18:41:18.843] base::close(...future.stdout) [18:41:18.843] ...future.stdout <- NULL [18:41:18.843] } [18:41:18.843] ...future.result$conditions <- ...future.conditions [18:41:18.843] ...future.result$finished <- base::Sys.time() [18:41:18.843] ...future.result [18:41:18.843] } [18:41:18.847] assign_globals() ... [18:41:18.847] List of 5 [18:41:18.847] $ ...future.FUN :function (x, ...) [18:41:18.847] $ future.call.arguments : list() [18:41:18.847] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:18.847] $ ...future.elements_ii :List of 2 [18:41:18.847] ..$ a:Classes 'listenv', 'environment' [18:41:18.847] ..$ b:Classes 'listenv', 'environment' [18:41:18.847] $ ...future.seeds_ii : NULL [18:41:18.847] $ ...future.globals.maxSize: NULL [18:41:18.847] - attr(*, "where")=List of 5 [18:41:18.847] ..$ ...future.FUN : [18:41:18.847] ..$ future.call.arguments : [18:41:18.847] ..$ ...future.elements_ii : [18:41:18.847] ..$ ...future.seeds_ii : [18:41:18.847] ..$ ...future.globals.maxSize: [18:41:18.847] - attr(*, "resolved")= logi FALSE [18:41:18.847] - attr(*, "total_size")= num 8145 [18:41:18.847] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:18.847] - attr(*, "already-done")= logi TRUE [18:41:18.853] - copied '...future.FUN' to environment [18:41:18.853] - copied 'future.call.arguments' to environment [18:41:18.853] - copied '...future.elements_ii' to environment [18:41:18.854] - copied '...future.seeds_ii' to environment [18:41:18.854] - copied '...future.globals.maxSize' to environment [18:41:18.854] assign_globals() ... done [18:41:18.855] plan(): Setting new future strategy stack: [18:41:18.855] List of future strategies: [18:41:18.855] 1. sequential: [18:41:18.855] - args: function (..., envir = parent.frame(), workers = "") [18:41:18.855] - tweaked: FALSE [18:41:18.855] - call: NULL [18:41:18.855] plan(): nbrOfWorkers() = 1 [18:41:18.857] plan(): Setting new future strategy stack: [18:41:18.857] List of future strategies: [18:41:18.857] 1. multisession: [18:41:18.857] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:41:18.857] - tweaked: FALSE [18:41:18.857] - call: plan(strategy) [18:41:18.859] plan(): nbrOfWorkers() = 1 [18:41:18.862] SequentialFuture started (and completed) [18:41:18.862] - Launch lazy future ... done [18:41:18.862] run() for 'SequentialFuture' ... done [18:41:18.862] Created future: [18:41:18.863] SequentialFuture: [18:41:18.863] Label: 'future_lapply-1' [18:41:18.863] Expression: [18:41:18.863] { [18:41:18.863] do.call(function(...) { [18:41:18.863] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.863] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:18.863] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.863] on.exit(options(oopts), add = TRUE) [18:41:18.863] } [18:41:18.863] { [18:41:18.863] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:18.863] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.863] ...future.FUN(...future.X_jj, ...) [18:41:18.863] }) [18:41:18.863] } [18:41:18.863] }, args = future.call.arguments) [18:41:18.863] } [18:41:18.863] Lazy evaluation: FALSE [18:41:18.863] Asynchronous evaluation: FALSE [18:41:18.863] Local evaluation: TRUE [18:41:18.863] Environment: R_GlobalEnv [18:41:18.863] Capture standard output: TRUE [18:41:18.863] Capture condition classes: 'condition' (excluding 'nothing') [18:41:18.863] Globals: 5 objects totaling 4.14 KiB (function '...future.FUN' of 911 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 3.10 KiB, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:18.863] Packages: 1 packages ('listenv') [18:41:18.863] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:18.863] Resolved: TRUE [18:41:18.863] Value: 154 bytes of class 'list' [18:41:18.863] Early signaling: FALSE [18:41:18.863] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:18.863] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:18.864] Chunk #1 of 1 ... DONE [18:41:18.864] Launching 1 futures (chunks) ... DONE [18:41:18.864] Resolving 1 futures (chunks) ... [18:41:18.864] resolve() on list ... [18:41:18.864] recursive: 0 [18:41:18.865] length: 1 [18:41:18.865] [18:41:18.865] resolved() for 'SequentialFuture' ... [18:41:18.865] - state: 'finished' [18:41:18.865] - run: TRUE [18:41:18.865] - result: 'FutureResult' [18:41:18.866] resolved() for 'SequentialFuture' ... done [18:41:18.866] Future #1 [18:41:18.866] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:18.866] - nx: 1 [18:41:18.866] - relay: TRUE [18:41:18.866] - stdout: TRUE [18:41:18.867] - signal: TRUE [18:41:18.867] - resignal: FALSE [18:41:18.867] - force: TRUE [18:41:18.867] - relayed: [n=1] FALSE [18:41:18.867] - queued futures: [n=1] FALSE [18:41:18.867] - until=1 [18:41:18.867] - relaying element #1 [18:41:18.868] - relayed: [n=1] TRUE [18:41:18.868] - queued futures: [n=1] TRUE [18:41:18.868] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:18.868] length: 0 (resolved future 1) [18:41:18.868] Relaying remaining futures [18:41:18.869] signalConditionsASAP(NULL, pos=0) ... [18:41:18.869] - nx: 1 [18:41:18.869] - relay: TRUE [18:41:18.869] - stdout: TRUE [18:41:18.869] - signal: TRUE [18:41:18.869] - resignal: FALSE [18:41:18.869] - force: TRUE [18:41:18.870] - relayed: [n=1] TRUE [18:41:18.870] - queued futures: [n=1] TRUE - flush all [18:41:18.870] - relayed: [n=1] TRUE [18:41:18.870] - queued futures: [n=1] TRUE [18:41:18.870] signalConditionsASAP(NULL, pos=0) ... done [18:41:18.870] resolve() on list ... DONE [18:41:18.871] - Number of value chunks collected: 1 [18:41:18.871] Resolving 1 futures (chunks) ... DONE [18:41:18.871] Reducing values from 1 chunks ... [18:41:18.871] - Number of values collected after concatenation: 2 [18:41:18.871] - Number of values expected: 2 [18:41:18.871] Reducing values from 1 chunks ... DONE [18:41:18.872] future_lapply() ... DONE List of 1 $ y:List of 2 ..$ a: Named chr "A" .. ..- attr(*, "names")= chr "A" ..$ b: Named chr [1:2] "A" "B" .. ..- attr(*, "names")= chr [1:2] "A" "B" - future_lapply(x, FUN = vector, ...) ... [18:41:18.874] future_lapply() ... [18:41:18.876] Number of chunks: 1 [18:41:18.876] Index remapping (attribute 'ordering'): [n = 4] 4, 1, 3, 2 [18:41:18.877] getGlobalsAndPackagesXApply() ... [18:41:18.877] - future.globals: TRUE [18:41:18.877] getGlobalsAndPackages() ... [18:41:18.877] Searching for globals... [18:41:18.878] - globals found: [2] 'FUN', '.Internal' [18:41:18.879] Searching for globals ... DONE [18:41:18.879] Resolving globals: FALSE [18:41:18.879] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:18.880] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:18.880] - globals: [1] 'FUN' [18:41:18.880] [18:41:18.880] getGlobalsAndPackages() ... DONE [18:41:18.880] - globals found/used: [n=1] 'FUN' [18:41:18.881] - needed namespaces: [n=0] [18:41:18.881] Finding globals ... DONE [18:41:18.881] - use_args: TRUE [18:41:18.881] - Getting '...' globals ... [18:41:18.881] resolve() on list ... [18:41:18.882] recursive: 0 [18:41:18.882] length: 1 [18:41:18.882] elements: '...' [18:41:18.882] length: 0 (resolved future 1) [18:41:18.882] resolve() on list ... DONE [18:41:18.882] - '...' content: [n=1] 'length' [18:41:18.883] List of 1 [18:41:18.883] $ ...:List of 1 [18:41:18.883] ..$ length: int 2 [18:41:18.883] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:18.883] - attr(*, "where")=List of 1 [18:41:18.883] ..$ ...: [18:41:18.883] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:18.883] - attr(*, "resolved")= logi TRUE [18:41:18.883] - attr(*, "total_size")= num NA [18:41:18.886] - Getting '...' globals ... DONE [18:41:18.886] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:18.886] List of 2 [18:41:18.886] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:18.886] $ ... :List of 1 [18:41:18.886] ..$ length: int 2 [18:41:18.886] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:18.886] - attr(*, "where")=List of 2 [18:41:18.886] ..$ ...future.FUN: [18:41:18.886] ..$ ... : [18:41:18.886] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:18.886] - attr(*, "resolved")= logi FALSE [18:41:18.886] - attr(*, "total_size")= int 4338 [18:41:18.890] Packages to be attached in all futures: [n=0] [18:41:18.890] getGlobalsAndPackagesXApply() ... DONE [18:41:18.891] Number of futures (= number of chunks): 1 [18:41:18.891] Launching 1 futures (chunks) ... [18:41:18.891] Chunk #1 of 1 ... [18:41:18.891] - Finding globals in 'X' for chunk #1 ... [18:41:18.891] getGlobalsAndPackages() ... [18:41:18.891] Searching for globals... [18:41:18.892] [18:41:18.892] Searching for globals ... DONE [18:41:18.892] - globals: [0] [18:41:18.892] getGlobalsAndPackages() ... DONE [18:41:18.893] + additional globals found: [n=0] [18:41:18.893] + additional namespaces needed: [n=0] [18:41:18.893] - Finding globals in 'X' for chunk #1 ... DONE [18:41:18.893] - seeds: [18:41:18.893] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.893] getGlobalsAndPackages() ... [18:41:18.894] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.894] Resolving globals: FALSE [18:41:18.894] Tweak future expression to call with '...' arguments ... [18:41:18.894] { [18:41:18.894] do.call(function(...) { [18:41:18.894] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.894] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:18.894] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.894] on.exit(options(oopts), add = TRUE) [18:41:18.894] } [18:41:18.894] { [18:41:18.894] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:18.894] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.894] ...future.FUN(...future.X_jj, ...) [18:41:18.894] }) [18:41:18.894] } [18:41:18.894] }, args = future.call.arguments) [18:41:18.894] } [18:41:18.894] Tweak future expression to call with '...' arguments ... DONE [18:41:18.895] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.895] [18:41:18.895] getGlobalsAndPackages() ... DONE [18:41:18.896] run() for 'Future' ... [18:41:18.896] - state: 'created' [18:41:18.896] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:18.898] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:18.899] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:18.899] - Field: 'label' [18:41:18.899] - Field: 'local' [18:41:18.899] - Field: 'owner' [18:41:18.899] - Field: 'envir' [18:41:18.899] - Field: 'packages' [18:41:18.900] - Field: 'gc' [18:41:18.900] - Field: 'conditions' [18:41:18.900] - Field: 'expr' [18:41:18.900] - Field: 'uuid' [18:41:18.900] - Field: 'seed' [18:41:18.901] - Field: 'version' [18:41:18.901] - Field: 'result' [18:41:18.901] - Field: 'asynchronous' [18:41:18.901] - Field: 'calls' [18:41:18.901] - Field: 'globals' [18:41:18.901] - Field: 'stdout' [18:41:18.902] - Field: 'earlySignal' [18:41:18.902] - Field: 'lazy' [18:41:18.902] - Field: 'state' [18:41:18.902] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:18.902] - Launch lazy future ... [18:41:18.902] Packages needed by the future expression (n = 0): [18:41:18.903] Packages needed by future strategies (n = 0): [18:41:18.903] { [18:41:18.903] { [18:41:18.903] { [18:41:18.903] ...future.startTime <- base::Sys.time() [18:41:18.903] { [18:41:18.903] { [18:41:18.903] { [18:41:18.903] base::local({ [18:41:18.903] has_future <- base::requireNamespace("future", [18:41:18.903] quietly = TRUE) [18:41:18.903] if (has_future) { [18:41:18.903] ns <- base::getNamespace("future") [18:41:18.903] version <- ns[[".package"]][["version"]] [18:41:18.903] if (is.null(version)) [18:41:18.903] version <- utils::packageVersion("future") [18:41:18.903] } [18:41:18.903] else { [18:41:18.903] version <- NULL [18:41:18.903] } [18:41:18.903] if (!has_future || version < "1.8.0") { [18:41:18.903] info <- base::c(r_version = base::gsub("R version ", [18:41:18.903] "", base::R.version$version.string), [18:41:18.903] platform = base::sprintf("%s (%s-bit)", [18:41:18.903] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:18.903] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:18.903] "release", "version")], collapse = " "), [18:41:18.903] hostname = base::Sys.info()[["nodename"]]) [18:41:18.903] info <- base::sprintf("%s: %s", base::names(info), [18:41:18.903] info) [18:41:18.903] info <- base::paste(info, collapse = "; ") [18:41:18.903] if (!has_future) { [18:41:18.903] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:18.903] info) [18:41:18.903] } [18:41:18.903] else { [18:41:18.903] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:18.903] info, version) [18:41:18.903] } [18:41:18.903] base::stop(msg) [18:41:18.903] } [18:41:18.903] }) [18:41:18.903] } [18:41:18.903] ...future.strategy.old <- future::plan("list") [18:41:18.903] options(future.plan = NULL) [18:41:18.903] Sys.unsetenv("R_FUTURE_PLAN") [18:41:18.903] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:18.903] } [18:41:18.903] ...future.workdir <- getwd() [18:41:18.903] } [18:41:18.903] ...future.oldOptions <- base::as.list(base::.Options) [18:41:18.903] ...future.oldEnvVars <- base::Sys.getenv() [18:41:18.903] } [18:41:18.903] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:18.903] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:18.903] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:18.903] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:18.903] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:18.903] future.stdout.windows.reencode = NULL, width = 80L) [18:41:18.903] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:18.903] base::names(...future.oldOptions)) [18:41:18.903] } [18:41:18.903] if (FALSE) { [18:41:18.903] } [18:41:18.903] else { [18:41:18.903] if (TRUE) { [18:41:18.903] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:18.903] open = "w") [18:41:18.903] } [18:41:18.903] else { [18:41:18.903] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:18.903] windows = "NUL", "/dev/null"), open = "w") [18:41:18.903] } [18:41:18.903] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:18.903] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:18.903] base::sink(type = "output", split = FALSE) [18:41:18.903] base::close(...future.stdout) [18:41:18.903] }, add = TRUE) [18:41:18.903] } [18:41:18.903] ...future.frame <- base::sys.nframe() [18:41:18.903] ...future.conditions <- base::list() [18:41:18.903] ...future.rng <- base::globalenv()$.Random.seed [18:41:18.903] if (FALSE) { [18:41:18.903] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:18.903] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:18.903] } [18:41:18.903] ...future.result <- base::tryCatch({ [18:41:18.903] base::withCallingHandlers({ [18:41:18.903] ...future.value <- base::withVisible(base::local({ [18:41:18.903] do.call(function(...) { [18:41:18.903] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.903] if (!identical(...future.globals.maxSize.org, [18:41:18.903] ...future.globals.maxSize)) { [18:41:18.903] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.903] on.exit(options(oopts), add = TRUE) [18:41:18.903] } [18:41:18.903] { [18:41:18.903] lapply(seq_along(...future.elements_ii), [18:41:18.903] FUN = function(jj) { [18:41:18.903] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.903] ...future.FUN(...future.X_jj, ...) [18:41:18.903] }) [18:41:18.903] } [18:41:18.903] }, args = future.call.arguments) [18:41:18.903] })) [18:41:18.903] future::FutureResult(value = ...future.value$value, [18:41:18.903] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:18.903] ...future.rng), globalenv = if (FALSE) [18:41:18.903] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:18.903] ...future.globalenv.names)) [18:41:18.903] else NULL, started = ...future.startTime, version = "1.8") [18:41:18.903] }, condition = base::local({ [18:41:18.903] c <- base::c [18:41:18.903] inherits <- base::inherits [18:41:18.903] invokeRestart <- base::invokeRestart [18:41:18.903] length <- base::length [18:41:18.903] list <- base::list [18:41:18.903] seq.int <- base::seq.int [18:41:18.903] signalCondition <- base::signalCondition [18:41:18.903] sys.calls <- base::sys.calls [18:41:18.903] `[[` <- base::`[[` [18:41:18.903] `+` <- base::`+` [18:41:18.903] `<<-` <- base::`<<-` [18:41:18.903] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:18.903] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:18.903] 3L)] [18:41:18.903] } [18:41:18.903] function(cond) { [18:41:18.903] is_error <- inherits(cond, "error") [18:41:18.903] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:18.903] NULL) [18:41:18.903] if (is_error) { [18:41:18.903] sessionInformation <- function() { [18:41:18.903] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:18.903] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:18.903] search = base::search(), system = base::Sys.info()) [18:41:18.903] } [18:41:18.903] ...future.conditions[[length(...future.conditions) + [18:41:18.903] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:18.903] cond$call), session = sessionInformation(), [18:41:18.903] timestamp = base::Sys.time(), signaled = 0L) [18:41:18.903] signalCondition(cond) [18:41:18.903] } [18:41:18.903] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:18.903] "immediateCondition"))) { [18:41:18.903] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:18.903] ...future.conditions[[length(...future.conditions) + [18:41:18.903] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:18.903] if (TRUE && !signal) { [18:41:18.903] muffleCondition <- function (cond, pattern = "^muffle") [18:41:18.903] { [18:41:18.903] inherits <- base::inherits [18:41:18.903] invokeRestart <- base::invokeRestart [18:41:18.903] is.null <- base::is.null [18:41:18.903] muffled <- FALSE [18:41:18.903] if (inherits(cond, "message")) { [18:41:18.903] muffled <- grepl(pattern, "muffleMessage") [18:41:18.903] if (muffled) [18:41:18.903] invokeRestart("muffleMessage") [18:41:18.903] } [18:41:18.903] else if (inherits(cond, "warning")) { [18:41:18.903] muffled <- grepl(pattern, "muffleWarning") [18:41:18.903] if (muffled) [18:41:18.903] invokeRestart("muffleWarning") [18:41:18.903] } [18:41:18.903] else if (inherits(cond, "condition")) { [18:41:18.903] if (!is.null(pattern)) { [18:41:18.903] computeRestarts <- base::computeRestarts [18:41:18.903] grepl <- base::grepl [18:41:18.903] restarts <- computeRestarts(cond) [18:41:18.903] for (restart in restarts) { [18:41:18.903] name <- restart$name [18:41:18.903] if (is.null(name)) [18:41:18.903] next [18:41:18.903] if (!grepl(pattern, name)) [18:41:18.903] next [18:41:18.903] invokeRestart(restart) [18:41:18.903] muffled <- TRUE [18:41:18.903] break [18:41:18.903] } [18:41:18.903] } [18:41:18.903] } [18:41:18.903] invisible(muffled) [18:41:18.903] } [18:41:18.903] muffleCondition(cond, pattern = "^muffle") [18:41:18.903] } [18:41:18.903] } [18:41:18.903] else { [18:41:18.903] if (TRUE) { [18:41:18.903] muffleCondition <- function (cond, pattern = "^muffle") [18:41:18.903] { [18:41:18.903] inherits <- base::inherits [18:41:18.903] invokeRestart <- base::invokeRestart [18:41:18.903] is.null <- base::is.null [18:41:18.903] muffled <- FALSE [18:41:18.903] if (inherits(cond, "message")) { [18:41:18.903] muffled <- grepl(pattern, "muffleMessage") [18:41:18.903] if (muffled) [18:41:18.903] invokeRestart("muffleMessage") [18:41:18.903] } [18:41:18.903] else if (inherits(cond, "warning")) { [18:41:18.903] muffled <- grepl(pattern, "muffleWarning") [18:41:18.903] if (muffled) [18:41:18.903] invokeRestart("muffleWarning") [18:41:18.903] } [18:41:18.903] else if (inherits(cond, "condition")) { [18:41:18.903] if (!is.null(pattern)) { [18:41:18.903] computeRestarts <- base::computeRestarts [18:41:18.903] grepl <- base::grepl [18:41:18.903] restarts <- computeRestarts(cond) [18:41:18.903] for (restart in restarts) { [18:41:18.903] name <- restart$name [18:41:18.903] if (is.null(name)) [18:41:18.903] next [18:41:18.903] if (!grepl(pattern, name)) [18:41:18.903] next [18:41:18.903] invokeRestart(restart) [18:41:18.903] muffled <- TRUE [18:41:18.903] break [18:41:18.903] } [18:41:18.903] } [18:41:18.903] } [18:41:18.903] invisible(muffled) [18:41:18.903] } [18:41:18.903] muffleCondition(cond, pattern = "^muffle") [18:41:18.903] } [18:41:18.903] } [18:41:18.903] } [18:41:18.903] })) [18:41:18.903] }, error = function(ex) { [18:41:18.903] base::structure(base::list(value = NULL, visible = NULL, [18:41:18.903] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:18.903] ...future.rng), started = ...future.startTime, [18:41:18.903] finished = Sys.time(), session_uuid = NA_character_, [18:41:18.903] version = "1.8"), class = "FutureResult") [18:41:18.903] }, finally = { [18:41:18.903] if (!identical(...future.workdir, getwd())) [18:41:18.903] setwd(...future.workdir) [18:41:18.903] { [18:41:18.903] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:18.903] ...future.oldOptions$nwarnings <- NULL [18:41:18.903] } [18:41:18.903] base::options(...future.oldOptions) [18:41:18.903] if (.Platform$OS.type == "windows") { [18:41:18.903] old_names <- names(...future.oldEnvVars) [18:41:18.903] envs <- base::Sys.getenv() [18:41:18.903] names <- names(envs) [18:41:18.903] common <- intersect(names, old_names) [18:41:18.903] added <- setdiff(names, old_names) [18:41:18.903] removed <- setdiff(old_names, names) [18:41:18.903] changed <- common[...future.oldEnvVars[common] != [18:41:18.903] envs[common]] [18:41:18.903] NAMES <- toupper(changed) [18:41:18.903] args <- list() [18:41:18.903] for (kk in seq_along(NAMES)) { [18:41:18.903] name <- changed[[kk]] [18:41:18.903] NAME <- NAMES[[kk]] [18:41:18.903] if (name != NAME && is.element(NAME, old_names)) [18:41:18.903] next [18:41:18.903] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:18.903] } [18:41:18.903] NAMES <- toupper(added) [18:41:18.903] for (kk in seq_along(NAMES)) { [18:41:18.903] name <- added[[kk]] [18:41:18.903] NAME <- NAMES[[kk]] [18:41:18.903] if (name != NAME && is.element(NAME, old_names)) [18:41:18.903] next [18:41:18.903] args[[name]] <- "" [18:41:18.903] } [18:41:18.903] NAMES <- toupper(removed) [18:41:18.903] for (kk in seq_along(NAMES)) { [18:41:18.903] name <- removed[[kk]] [18:41:18.903] NAME <- NAMES[[kk]] [18:41:18.903] if (name != NAME && is.element(NAME, old_names)) [18:41:18.903] next [18:41:18.903] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:18.903] } [18:41:18.903] if (length(args) > 0) [18:41:18.903] base::do.call(base::Sys.setenv, args = args) [18:41:18.903] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:18.903] } [18:41:18.903] else { [18:41:18.903] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:18.903] } [18:41:18.903] { [18:41:18.903] if (base::length(...future.futureOptionsAdded) > [18:41:18.903] 0L) { [18:41:18.903] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:18.903] base::names(opts) <- ...future.futureOptionsAdded [18:41:18.903] base::options(opts) [18:41:18.903] } [18:41:18.903] { [18:41:18.903] { [18:41:18.903] NULL [18:41:18.903] RNGkind("Mersenne-Twister") [18:41:18.903] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:18.903] inherits = FALSE) [18:41:18.903] } [18:41:18.903] options(future.plan = NULL) [18:41:18.903] if (is.na(NA_character_)) [18:41:18.903] Sys.unsetenv("R_FUTURE_PLAN") [18:41:18.903] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:18.903] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:18.903] .init = FALSE) [18:41:18.903] } [18:41:18.903] } [18:41:18.903] } [18:41:18.903] }) [18:41:18.903] if (TRUE) { [18:41:18.903] base::sink(type = "output", split = FALSE) [18:41:18.903] if (TRUE) { [18:41:18.903] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:18.903] } [18:41:18.903] else { [18:41:18.903] ...future.result["stdout"] <- base::list(NULL) [18:41:18.903] } [18:41:18.903] base::close(...future.stdout) [18:41:18.903] ...future.stdout <- NULL [18:41:18.903] } [18:41:18.903] ...future.result$conditions <- ...future.conditions [18:41:18.903] ...future.result$finished <- base::Sys.time() [18:41:18.903] ...future.result [18:41:18.903] } [18:41:18.907] assign_globals() ... [18:41:18.907] List of 5 [18:41:18.907] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:18.907] $ future.call.arguments :List of 1 [18:41:18.907] ..$ length: int 2 [18:41:18.907] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:18.907] $ ...future.elements_ii :List of 4 [18:41:18.907] ..$ c: chr "list" [18:41:18.907] ..$ a: chr "integer" [18:41:18.907] ..$ c: chr "character" [18:41:18.907] ..$ b: chr "numeric" [18:41:18.907] $ ...future.seeds_ii : NULL [18:41:18.907] $ ...future.globals.maxSize: NULL [18:41:18.907] - attr(*, "where")=List of 5 [18:41:18.907] ..$ ...future.FUN : [18:41:18.907] ..$ future.call.arguments : [18:41:18.907] ..$ ...future.elements_ii : [18:41:18.907] ..$ ...future.seeds_ii : [18:41:18.907] ..$ ...future.globals.maxSize: [18:41:18.907] - attr(*, "resolved")= logi FALSE [18:41:18.907] - attr(*, "total_size")= num 4338 [18:41:18.907] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:18.907] - attr(*, "already-done")= logi TRUE [18:41:18.914] - copied '...future.FUN' to environment [18:41:18.914] - copied 'future.call.arguments' to environment [18:41:18.914] - copied '...future.elements_ii' to environment [18:41:18.915] - copied '...future.seeds_ii' to environment [18:41:18.915] - copied '...future.globals.maxSize' to environment [18:41:18.915] assign_globals() ... done [18:41:18.915] plan(): Setting new future strategy stack: [18:41:18.915] List of future strategies: [18:41:18.915] 1. sequential: [18:41:18.915] - args: function (..., envir = parent.frame(), workers = "") [18:41:18.915] - tweaked: FALSE [18:41:18.915] - call: NULL [18:41:18.916] plan(): nbrOfWorkers() = 1 [18:41:18.917] plan(): Setting new future strategy stack: [18:41:18.917] List of future strategies: [18:41:18.917] 1. multisession: [18:41:18.917] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:41:18.917] - tweaked: FALSE [18:41:18.917] - call: plan(strategy) [18:41:18.920] plan(): nbrOfWorkers() = 1 [18:41:18.920] SequentialFuture started (and completed) [18:41:18.920] - Launch lazy future ... done [18:41:18.920] run() for 'SequentialFuture' ... done [18:41:18.921] Created future: [18:41:18.921] SequentialFuture: [18:41:18.921] Label: 'future_lapply-1' [18:41:18.921] Expression: [18:41:18.921] { [18:41:18.921] do.call(function(...) { [18:41:18.921] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.921] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:18.921] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.921] on.exit(options(oopts), add = TRUE) [18:41:18.921] } [18:41:18.921] { [18:41:18.921] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:18.921] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.921] ...future.FUN(...future.X_jj, ...) [18:41:18.921] }) [18:41:18.921] } [18:41:18.921] }, args = future.call.arguments) [18:41:18.921] } [18:41:18.921] Lazy evaluation: FALSE [18:41:18.921] Asynchronous evaluation: FALSE [18:41:18.921] Local evaluation: TRUE [18:41:18.921] Environment: R_GlobalEnv [18:41:18.921] Capture standard output: TRUE [18:41:18.921] Capture condition classes: 'condition' (excluding 'nothing') [18:41:18.921] Globals: 5 objects totaling 853 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 191 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:18.921] Packages: [18:41:18.921] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:18.921] Resolved: TRUE [18:41:18.921] Value: 111 bytes of class 'list' [18:41:18.921] Early signaling: FALSE [18:41:18.921] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:18.921] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:18.922] Chunk #1 of 1 ... DONE [18:41:18.922] Launching 1 futures (chunks) ... DONE [18:41:18.922] Resolving 1 futures (chunks) ... [18:41:18.922] resolve() on list ... [18:41:18.923] recursive: 0 [18:41:18.923] length: 1 [18:41:18.923] [18:41:18.923] resolved() for 'SequentialFuture' ... [18:41:18.923] - state: 'finished' [18:41:18.923] - run: TRUE [18:41:18.924] - result: 'FutureResult' [18:41:18.924] resolved() for 'SequentialFuture' ... done [18:41:18.924] Future #1 [18:41:18.924] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:18.924] - nx: 1 [18:41:18.925] - relay: TRUE [18:41:18.925] - stdout: TRUE [18:41:18.925] - signal: TRUE [18:41:18.925] - resignal: FALSE [18:41:18.925] - force: TRUE [18:41:18.925] - relayed: [n=1] FALSE [18:41:18.925] - queued futures: [n=1] FALSE [18:41:18.926] - until=1 [18:41:18.926] - relaying element #1 [18:41:18.926] - relayed: [n=1] TRUE [18:41:18.926] - queued futures: [n=1] TRUE [18:41:18.926] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:18.927] length: 0 (resolved future 1) [18:41:18.927] Relaying remaining futures [18:41:18.927] signalConditionsASAP(NULL, pos=0) ... [18:41:18.927] - nx: 1 [18:41:18.927] - relay: TRUE [18:41:18.927] - stdout: TRUE [18:41:18.927] - signal: TRUE [18:41:18.928] - resignal: FALSE [18:41:18.928] - force: TRUE [18:41:18.928] - relayed: [n=1] TRUE [18:41:18.928] - queued futures: [n=1] TRUE - flush all [18:41:18.928] - relayed: [n=1] TRUE [18:41:18.928] - queued futures: [n=1] TRUE [18:41:18.929] signalConditionsASAP(NULL, pos=0) ... done [18:41:18.929] resolve() on list ... DONE [18:41:18.929] - Number of value chunks collected: 1 [18:41:18.929] Resolving 1 futures (chunks) ... DONE [18:41:18.929] Reducing values from 1 chunks ... [18:41:18.929] - Number of values collected after concatenation: 4 [18:41:18.930] - Number of values expected: 4 [18:41:18.930] Reverse index remapping (attribute 'ordering'): [n = 4] 2, 4, 3, 1 [18:41:18.930] Reducing values from 1 chunks ... DONE [18:41:18.930] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL [18:41:18.933] future_lapply() ... [18:41:18.935] Number of chunks: 1 [18:41:18.935] Index remapping (attribute 'ordering'): [n = 4] 3, 2, 4, 1 [18:41:18.936] getGlobalsAndPackagesXApply() ... [18:41:18.936] - future.globals: TRUE [18:41:18.936] getGlobalsAndPackages() ... [18:41:18.936] Searching for globals... [18:41:18.937] - globals found: [2] 'FUN', '.Internal' [18:41:18.938] Searching for globals ... DONE [18:41:18.938] Resolving globals: FALSE [18:41:18.938] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:18.939] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:18.939] - globals: [1] 'FUN' [18:41:18.939] [18:41:18.939] getGlobalsAndPackages() ... DONE [18:41:18.940] - globals found/used: [n=1] 'FUN' [18:41:18.940] - needed namespaces: [n=0] [18:41:18.940] Finding globals ... DONE [18:41:18.940] - use_args: TRUE [18:41:18.940] - Getting '...' globals ... [18:41:18.941] resolve() on list ... [18:41:18.941] recursive: 0 [18:41:18.941] length: 1 [18:41:18.941] elements: '...' [18:41:18.942] length: 0 (resolved future 1) [18:41:18.942] resolve() on list ... DONE [18:41:18.942] - '...' content: [n=1] 'length' [18:41:18.942] List of 1 [18:41:18.942] $ ...:List of 1 [18:41:18.942] ..$ length: int 2 [18:41:18.942] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:18.942] - attr(*, "where")=List of 1 [18:41:18.942] ..$ ...: [18:41:18.942] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:18.942] - attr(*, "resolved")= logi TRUE [18:41:18.942] - attr(*, "total_size")= num NA [18:41:18.945] - Getting '...' globals ... DONE [18:41:18.946] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:18.946] List of 2 [18:41:18.946] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:18.946] $ ... :List of 1 [18:41:18.946] ..$ length: int 2 [18:41:18.946] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:18.946] - attr(*, "where")=List of 2 [18:41:18.946] ..$ ...future.FUN: [18:41:18.946] ..$ ... : [18:41:18.946] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:18.946] - attr(*, "resolved")= logi FALSE [18:41:18.946] - attr(*, "total_size")= int 4374 [18:41:18.949] Packages to be attached in all futures: [n=0] [18:41:18.950] getGlobalsAndPackagesXApply() ... DONE [18:41:18.950] Number of futures (= number of chunks): 1 [18:41:18.950] Launching 1 futures (chunks) ... [18:41:18.950] Chunk #1 of 1 ... [18:41:18.950] - Finding globals in 'X' for chunk #1 ... [18:41:18.951] getGlobalsAndPackages() ... [18:41:18.951] Searching for globals... [18:41:18.951] [18:41:18.951] Searching for globals ... DONE [18:41:18.951] - globals: [0] [18:41:18.952] getGlobalsAndPackages() ... DONE [18:41:18.952] + additional globals found: [n=0] [18:41:18.952] + additional namespaces needed: [n=0] [18:41:18.952] - Finding globals in 'X' for chunk #1 ... DONE [18:41:18.952] - seeds: [18:41:18.952] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.952] getGlobalsAndPackages() ... [18:41:18.953] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.953] Resolving globals: FALSE [18:41:18.953] Tweak future expression to call with '...' arguments ... [18:41:18.953] { [18:41:18.953] do.call(function(...) { [18:41:18.953] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.953] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:18.953] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.953] on.exit(options(oopts), add = TRUE) [18:41:18.953] } [18:41:18.953] { [18:41:18.953] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:18.953] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.953] ...future.FUN(...future.X_jj, ...) [18:41:18.953] }) [18:41:18.953] } [18:41:18.953] }, args = future.call.arguments) [18:41:18.953] } [18:41:18.954] Tweak future expression to call with '...' arguments ... DONE [18:41:18.954] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:18.954] [18:41:18.954] getGlobalsAndPackages() ... DONE [18:41:18.955] run() for 'Future' ... [18:41:18.955] - state: 'created' [18:41:18.955] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:18.957] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:18.958] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:18.958] - Field: 'label' [18:41:18.958] - Field: 'local' [18:41:18.958] - Field: 'owner' [18:41:18.958] - Field: 'envir' [18:41:18.959] - Field: 'packages' [18:41:18.959] - Field: 'gc' [18:41:18.959] - Field: 'conditions' [18:41:18.959] - Field: 'expr' [18:41:18.959] - Field: 'uuid' [18:41:18.959] - Field: 'seed' [18:41:18.960] - Field: 'version' [18:41:18.960] - Field: 'result' [18:41:18.960] - Field: 'asynchronous' [18:41:18.960] - Field: 'calls' [18:41:18.960] - Field: 'globals' [18:41:18.960] - Field: 'stdout' [18:41:18.961] - Field: 'earlySignal' [18:41:18.961] - Field: 'lazy' [18:41:18.961] - Field: 'state' [18:41:18.961] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:18.961] - Launch lazy future ... [18:41:18.962] Packages needed by the future expression (n = 0): [18:41:18.962] Packages needed by future strategies (n = 0): [18:41:18.962] { [18:41:18.962] { [18:41:18.962] { [18:41:18.962] ...future.startTime <- base::Sys.time() [18:41:18.962] { [18:41:18.962] { [18:41:18.962] { [18:41:18.962] base::local({ [18:41:18.962] has_future <- base::requireNamespace("future", [18:41:18.962] quietly = TRUE) [18:41:18.962] if (has_future) { [18:41:18.962] ns <- base::getNamespace("future") [18:41:18.962] version <- ns[[".package"]][["version"]] [18:41:18.962] if (is.null(version)) [18:41:18.962] version <- utils::packageVersion("future") [18:41:18.962] } [18:41:18.962] else { [18:41:18.962] version <- NULL [18:41:18.962] } [18:41:18.962] if (!has_future || version < "1.8.0") { [18:41:18.962] info <- base::c(r_version = base::gsub("R version ", [18:41:18.962] "", base::R.version$version.string), [18:41:18.962] platform = base::sprintf("%s (%s-bit)", [18:41:18.962] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:18.962] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:18.962] "release", "version")], collapse = " "), [18:41:18.962] hostname = base::Sys.info()[["nodename"]]) [18:41:18.962] info <- base::sprintf("%s: %s", base::names(info), [18:41:18.962] info) [18:41:18.962] info <- base::paste(info, collapse = "; ") [18:41:18.962] if (!has_future) { [18:41:18.962] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:18.962] info) [18:41:18.962] } [18:41:18.962] else { [18:41:18.962] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:18.962] info, version) [18:41:18.962] } [18:41:18.962] base::stop(msg) [18:41:18.962] } [18:41:18.962] }) [18:41:18.962] } [18:41:18.962] ...future.strategy.old <- future::plan("list") [18:41:18.962] options(future.plan = NULL) [18:41:18.962] Sys.unsetenv("R_FUTURE_PLAN") [18:41:18.962] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:18.962] } [18:41:18.962] ...future.workdir <- getwd() [18:41:18.962] } [18:41:18.962] ...future.oldOptions <- base::as.list(base::.Options) [18:41:18.962] ...future.oldEnvVars <- base::Sys.getenv() [18:41:18.962] } [18:41:18.962] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:18.962] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:18.962] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:18.962] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:18.962] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:18.962] future.stdout.windows.reencode = NULL, width = 80L) [18:41:18.962] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:18.962] base::names(...future.oldOptions)) [18:41:18.962] } [18:41:18.962] if (FALSE) { [18:41:18.962] } [18:41:18.962] else { [18:41:18.962] if (TRUE) { [18:41:18.962] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:18.962] open = "w") [18:41:18.962] } [18:41:18.962] else { [18:41:18.962] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:18.962] windows = "NUL", "/dev/null"), open = "w") [18:41:18.962] } [18:41:18.962] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:18.962] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:18.962] base::sink(type = "output", split = FALSE) [18:41:18.962] base::close(...future.stdout) [18:41:18.962] }, add = TRUE) [18:41:18.962] } [18:41:18.962] ...future.frame <- base::sys.nframe() [18:41:18.962] ...future.conditions <- base::list() [18:41:18.962] ...future.rng <- base::globalenv()$.Random.seed [18:41:18.962] if (FALSE) { [18:41:18.962] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:18.962] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:18.962] } [18:41:18.962] ...future.result <- base::tryCatch({ [18:41:18.962] base::withCallingHandlers({ [18:41:18.962] ...future.value <- base::withVisible(base::local({ [18:41:18.962] do.call(function(...) { [18:41:18.962] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.962] if (!identical(...future.globals.maxSize.org, [18:41:18.962] ...future.globals.maxSize)) { [18:41:18.962] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.962] on.exit(options(oopts), add = TRUE) [18:41:18.962] } [18:41:18.962] { [18:41:18.962] lapply(seq_along(...future.elements_ii), [18:41:18.962] FUN = function(jj) { [18:41:18.962] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.962] ...future.FUN(...future.X_jj, ...) [18:41:18.962] }) [18:41:18.962] } [18:41:18.962] }, args = future.call.arguments) [18:41:18.962] })) [18:41:18.962] future::FutureResult(value = ...future.value$value, [18:41:18.962] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:18.962] ...future.rng), globalenv = if (FALSE) [18:41:18.962] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:18.962] ...future.globalenv.names)) [18:41:18.962] else NULL, started = ...future.startTime, version = "1.8") [18:41:18.962] }, condition = base::local({ [18:41:18.962] c <- base::c [18:41:18.962] inherits <- base::inherits [18:41:18.962] invokeRestart <- base::invokeRestart [18:41:18.962] length <- base::length [18:41:18.962] list <- base::list [18:41:18.962] seq.int <- base::seq.int [18:41:18.962] signalCondition <- base::signalCondition [18:41:18.962] sys.calls <- base::sys.calls [18:41:18.962] `[[` <- base::`[[` [18:41:18.962] `+` <- base::`+` [18:41:18.962] `<<-` <- base::`<<-` [18:41:18.962] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:18.962] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:18.962] 3L)] [18:41:18.962] } [18:41:18.962] function(cond) { [18:41:18.962] is_error <- inherits(cond, "error") [18:41:18.962] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:18.962] NULL) [18:41:18.962] if (is_error) { [18:41:18.962] sessionInformation <- function() { [18:41:18.962] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:18.962] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:18.962] search = base::search(), system = base::Sys.info()) [18:41:18.962] } [18:41:18.962] ...future.conditions[[length(...future.conditions) + [18:41:18.962] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:18.962] cond$call), session = sessionInformation(), [18:41:18.962] timestamp = base::Sys.time(), signaled = 0L) [18:41:18.962] signalCondition(cond) [18:41:18.962] } [18:41:18.962] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:18.962] "immediateCondition"))) { [18:41:18.962] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:18.962] ...future.conditions[[length(...future.conditions) + [18:41:18.962] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:18.962] if (TRUE && !signal) { [18:41:18.962] muffleCondition <- function (cond, pattern = "^muffle") [18:41:18.962] { [18:41:18.962] inherits <- base::inherits [18:41:18.962] invokeRestart <- base::invokeRestart [18:41:18.962] is.null <- base::is.null [18:41:18.962] muffled <- FALSE [18:41:18.962] if (inherits(cond, "message")) { [18:41:18.962] muffled <- grepl(pattern, "muffleMessage") [18:41:18.962] if (muffled) [18:41:18.962] invokeRestart("muffleMessage") [18:41:18.962] } [18:41:18.962] else if (inherits(cond, "warning")) { [18:41:18.962] muffled <- grepl(pattern, "muffleWarning") [18:41:18.962] if (muffled) [18:41:18.962] invokeRestart("muffleWarning") [18:41:18.962] } [18:41:18.962] else if (inherits(cond, "condition")) { [18:41:18.962] if (!is.null(pattern)) { [18:41:18.962] computeRestarts <- base::computeRestarts [18:41:18.962] grepl <- base::grepl [18:41:18.962] restarts <- computeRestarts(cond) [18:41:18.962] for (restart in restarts) { [18:41:18.962] name <- restart$name [18:41:18.962] if (is.null(name)) [18:41:18.962] next [18:41:18.962] if (!grepl(pattern, name)) [18:41:18.962] next [18:41:18.962] invokeRestart(restart) [18:41:18.962] muffled <- TRUE [18:41:18.962] break [18:41:18.962] } [18:41:18.962] } [18:41:18.962] } [18:41:18.962] invisible(muffled) [18:41:18.962] } [18:41:18.962] muffleCondition(cond, pattern = "^muffle") [18:41:18.962] } [18:41:18.962] } [18:41:18.962] else { [18:41:18.962] if (TRUE) { [18:41:18.962] muffleCondition <- function (cond, pattern = "^muffle") [18:41:18.962] { [18:41:18.962] inherits <- base::inherits [18:41:18.962] invokeRestart <- base::invokeRestart [18:41:18.962] is.null <- base::is.null [18:41:18.962] muffled <- FALSE [18:41:18.962] if (inherits(cond, "message")) { [18:41:18.962] muffled <- grepl(pattern, "muffleMessage") [18:41:18.962] if (muffled) [18:41:18.962] invokeRestart("muffleMessage") [18:41:18.962] } [18:41:18.962] else if (inherits(cond, "warning")) { [18:41:18.962] muffled <- grepl(pattern, "muffleWarning") [18:41:18.962] if (muffled) [18:41:18.962] invokeRestart("muffleWarning") [18:41:18.962] } [18:41:18.962] else if (inherits(cond, "condition")) { [18:41:18.962] if (!is.null(pattern)) { [18:41:18.962] computeRestarts <- base::computeRestarts [18:41:18.962] grepl <- base::grepl [18:41:18.962] restarts <- computeRestarts(cond) [18:41:18.962] for (restart in restarts) { [18:41:18.962] name <- restart$name [18:41:18.962] if (is.null(name)) [18:41:18.962] next [18:41:18.962] if (!grepl(pattern, name)) [18:41:18.962] next [18:41:18.962] invokeRestart(restart) [18:41:18.962] muffled <- TRUE [18:41:18.962] break [18:41:18.962] } [18:41:18.962] } [18:41:18.962] } [18:41:18.962] invisible(muffled) [18:41:18.962] } [18:41:18.962] muffleCondition(cond, pattern = "^muffle") [18:41:18.962] } [18:41:18.962] } [18:41:18.962] } [18:41:18.962] })) [18:41:18.962] }, error = function(ex) { [18:41:18.962] base::structure(base::list(value = NULL, visible = NULL, [18:41:18.962] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:18.962] ...future.rng), started = ...future.startTime, [18:41:18.962] finished = Sys.time(), session_uuid = NA_character_, [18:41:18.962] version = "1.8"), class = "FutureResult") [18:41:18.962] }, finally = { [18:41:18.962] if (!identical(...future.workdir, getwd())) [18:41:18.962] setwd(...future.workdir) [18:41:18.962] { [18:41:18.962] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:18.962] ...future.oldOptions$nwarnings <- NULL [18:41:18.962] } [18:41:18.962] base::options(...future.oldOptions) [18:41:18.962] if (.Platform$OS.type == "windows") { [18:41:18.962] old_names <- names(...future.oldEnvVars) [18:41:18.962] envs <- base::Sys.getenv() [18:41:18.962] names <- names(envs) [18:41:18.962] common <- intersect(names, old_names) [18:41:18.962] added <- setdiff(names, old_names) [18:41:18.962] removed <- setdiff(old_names, names) [18:41:18.962] changed <- common[...future.oldEnvVars[common] != [18:41:18.962] envs[common]] [18:41:18.962] NAMES <- toupper(changed) [18:41:18.962] args <- list() [18:41:18.962] for (kk in seq_along(NAMES)) { [18:41:18.962] name <- changed[[kk]] [18:41:18.962] NAME <- NAMES[[kk]] [18:41:18.962] if (name != NAME && is.element(NAME, old_names)) [18:41:18.962] next [18:41:18.962] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:18.962] } [18:41:18.962] NAMES <- toupper(added) [18:41:18.962] for (kk in seq_along(NAMES)) { [18:41:18.962] name <- added[[kk]] [18:41:18.962] NAME <- NAMES[[kk]] [18:41:18.962] if (name != NAME && is.element(NAME, old_names)) [18:41:18.962] next [18:41:18.962] args[[name]] <- "" [18:41:18.962] } [18:41:18.962] NAMES <- toupper(removed) [18:41:18.962] for (kk in seq_along(NAMES)) { [18:41:18.962] name <- removed[[kk]] [18:41:18.962] NAME <- NAMES[[kk]] [18:41:18.962] if (name != NAME && is.element(NAME, old_names)) [18:41:18.962] next [18:41:18.962] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:18.962] } [18:41:18.962] if (length(args) > 0) [18:41:18.962] base::do.call(base::Sys.setenv, args = args) [18:41:18.962] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:18.962] } [18:41:18.962] else { [18:41:18.962] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:18.962] } [18:41:18.962] { [18:41:18.962] if (base::length(...future.futureOptionsAdded) > [18:41:18.962] 0L) { [18:41:18.962] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:18.962] base::names(opts) <- ...future.futureOptionsAdded [18:41:18.962] base::options(opts) [18:41:18.962] } [18:41:18.962] { [18:41:18.962] { [18:41:18.962] NULL [18:41:18.962] RNGkind("Mersenne-Twister") [18:41:18.962] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:18.962] inherits = FALSE) [18:41:18.962] } [18:41:18.962] options(future.plan = NULL) [18:41:18.962] if (is.na(NA_character_)) [18:41:18.962] Sys.unsetenv("R_FUTURE_PLAN") [18:41:18.962] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:18.962] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:18.962] .init = FALSE) [18:41:18.962] } [18:41:18.962] } [18:41:18.962] } [18:41:18.962] }) [18:41:18.962] if (TRUE) { [18:41:18.962] base::sink(type = "output", split = FALSE) [18:41:18.962] if (TRUE) { [18:41:18.962] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:18.962] } [18:41:18.962] else { [18:41:18.962] ...future.result["stdout"] <- base::list(NULL) [18:41:18.962] } [18:41:18.962] base::close(...future.stdout) [18:41:18.962] ...future.stdout <- NULL [18:41:18.962] } [18:41:18.962] ...future.result$conditions <- ...future.conditions [18:41:18.962] ...future.result$finished <- base::Sys.time() [18:41:18.962] ...future.result [18:41:18.962] } [18:41:18.966] assign_globals() ... [18:41:18.966] List of 5 [18:41:18.966] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:18.966] $ future.call.arguments :List of 1 [18:41:18.966] ..$ length: int 2 [18:41:18.966] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:18.966] $ ...future.elements_ii :List of 4 [18:41:18.966] ..$ c: chr "character" [18:41:18.966] ..$ b: chr "numeric" [18:41:18.966] ..$ c: chr "list" [18:41:18.966] ..$ a: chr "integer" [18:41:18.966] $ ...future.seeds_ii : NULL [18:41:18.966] $ ...future.globals.maxSize: NULL [18:41:18.966] - attr(*, "where")=List of 5 [18:41:18.966] ..$ ...future.FUN : [18:41:18.966] ..$ future.call.arguments : [18:41:18.966] ..$ ...future.elements_ii : [18:41:18.966] ..$ ...future.seeds_ii : [18:41:18.966] ..$ ...future.globals.maxSize: [18:41:18.966] - attr(*, "resolved")= logi FALSE [18:41:18.966] - attr(*, "total_size")= num 4374 [18:41:18.966] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:18.966] - attr(*, "already-done")= logi TRUE [18:41:18.975] - copied '...future.FUN' to environment [18:41:18.975] - copied 'future.call.arguments' to environment [18:41:18.976] - copied '...future.elements_ii' to environment [18:41:18.976] - copied '...future.seeds_ii' to environment [18:41:18.976] - copied '...future.globals.maxSize' to environment [18:41:18.976] assign_globals() ... done [18:41:18.977] plan(): Setting new future strategy stack: [18:41:18.977] List of future strategies: [18:41:18.977] 1. sequential: [18:41:18.977] - args: function (..., envir = parent.frame(), workers = "") [18:41:18.977] - tweaked: FALSE [18:41:18.977] - call: NULL [18:41:18.977] plan(): nbrOfWorkers() = 1 [18:41:18.978] plan(): Setting new future strategy stack: [18:41:18.979] List of future strategies: [18:41:18.979] 1. multisession: [18:41:18.979] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:41:18.979] - tweaked: FALSE [18:41:18.979] - call: plan(strategy) [18:41:18.981] plan(): nbrOfWorkers() = 1 [18:41:18.981] SequentialFuture started (and completed) [18:41:18.981] - Launch lazy future ... done [18:41:18.982] run() for 'SequentialFuture' ... done [18:41:18.982] Created future: [18:41:18.982] SequentialFuture: [18:41:18.982] Label: 'future_lapply-1' [18:41:18.982] Expression: [18:41:18.982] { [18:41:18.982] do.call(function(...) { [18:41:18.982] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:18.982] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:18.982] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:18.982] on.exit(options(oopts), add = TRUE) [18:41:18.982] } [18:41:18.982] { [18:41:18.982] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:18.982] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:18.982] ...future.FUN(...future.X_jj, ...) [18:41:18.982] }) [18:41:18.982] } [18:41:18.982] }, args = future.call.arguments) [18:41:18.982] } [18:41:18.982] Lazy evaluation: FALSE [18:41:18.982] Asynchronous evaluation: FALSE [18:41:18.982] Local evaluation: TRUE [18:41:18.982] Environment: R_GlobalEnv [18:41:18.982] Capture standard output: TRUE [18:41:18.982] Capture condition classes: 'condition' (excluding 'nothing') [18:41:18.982] Globals: 5 objects totaling 853 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 191 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:18.982] Packages: [18:41:18.982] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:18.982] Resolved: TRUE [18:41:18.982] Value: 111 bytes of class 'list' [18:41:18.982] Early signaling: FALSE [18:41:18.982] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:18.982] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:18.983] Chunk #1 of 1 ... DONE [18:41:18.983] Launching 1 futures (chunks) ... DONE [18:41:18.983] Resolving 1 futures (chunks) ... [18:41:18.984] resolve() on list ... [18:41:18.984] recursive: 0 [18:41:18.984] length: 1 [18:41:18.984] [18:41:18.984] resolved() for 'SequentialFuture' ... [18:41:18.984] - state: 'finished' [18:41:18.985] - run: TRUE [18:41:18.985] - result: 'FutureResult' [18:41:18.985] resolved() for 'SequentialFuture' ... done [18:41:18.985] Future #1 [18:41:18.985] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:18.986] - nx: 1 [18:41:18.986] - relay: TRUE [18:41:18.986] - stdout: TRUE [18:41:18.986] - signal: TRUE [18:41:18.986] - resignal: FALSE [18:41:18.986] - force: TRUE [18:41:18.987] - relayed: [n=1] FALSE [18:41:18.987] - queued futures: [n=1] FALSE [18:41:18.987] - until=1 [18:41:18.987] - relaying element #1 [18:41:18.987] - relayed: [n=1] TRUE [18:41:18.987] - queued futures: [n=1] TRUE [18:41:18.988] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:18.988] length: 0 (resolved future 1) [18:41:18.988] Relaying remaining futures [18:41:18.988] signalConditionsASAP(NULL, pos=0) ... [18:41:18.988] - nx: 1 [18:41:18.988] - relay: TRUE [18:41:18.989] - stdout: TRUE [18:41:18.989] - signal: TRUE [18:41:18.989] - resignal: FALSE [18:41:18.989] - force: TRUE [18:41:18.989] - relayed: [n=1] TRUE [18:41:18.989] - queued futures: [n=1] TRUE - flush all [18:41:18.990] - relayed: [n=1] TRUE [18:41:18.990] - queued futures: [n=1] TRUE [18:41:18.990] signalConditionsASAP(NULL, pos=0) ... done [18:41:18.990] resolve() on list ... DONE [18:41:18.990] - Number of value chunks collected: 1 [18:41:18.990] Resolving 1 futures (chunks) ... DONE [18:41:18.991] Reducing values from 1 chunks ... [18:41:18.991] - Number of values collected after concatenation: 4 [18:41:18.991] - Number of values expected: 4 [18:41:18.991] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 2, 1, 3 [18:41:18.991] Reducing values from 1 chunks ... DONE [18:41:18.991] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL - future_lapply(x, FUN = base::vector, ...) ... [18:41:18.994] future_lapply() ... [18:41:18.997] Number of chunks: 1 [18:41:18.997] Index remapping (attribute 'ordering'): [n = 4] 3, 1, 4, 2 [18:41:18.997] getGlobalsAndPackagesXApply() ... [18:41:18.997] - future.globals: TRUE [18:41:18.997] getGlobalsAndPackages() ... [18:41:18.997] Searching for globals... [18:41:18.999] - globals found: [2] 'FUN', '.Internal' [18:41:18.999] Searching for globals ... DONE [18:41:18.999] Resolving globals: FALSE [18:41:19.000] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:19.000] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:19.000] - globals: [1] 'FUN' [18:41:19.000] [18:41:19.001] getGlobalsAndPackages() ... DONE [18:41:19.001] - globals found/used: [n=1] 'FUN' [18:41:19.001] - needed namespaces: [n=0] [18:41:19.001] Finding globals ... DONE [18:41:19.001] - use_args: TRUE [18:41:19.001] - Getting '...' globals ... [18:41:19.002] resolve() on list ... [18:41:19.002] recursive: 0 [18:41:19.002] length: 1 [18:41:19.002] elements: '...' [18:41:19.002] length: 0 (resolved future 1) [18:41:19.003] resolve() on list ... DONE [18:41:19.003] - '...' content: [n=1] 'length' [18:41:19.003] List of 1 [18:41:19.003] $ ...:List of 1 [18:41:19.003] ..$ length: int 2 [18:41:19.003] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:19.003] - attr(*, "where")=List of 1 [18:41:19.003] ..$ ...: [18:41:19.003] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:19.003] - attr(*, "resolved")= logi TRUE [18:41:19.003] - attr(*, "total_size")= num NA [18:41:19.006] - Getting '...' globals ... DONE [18:41:19.006] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:19.007] List of 2 [18:41:19.007] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:19.007] $ ... :List of 1 [18:41:19.007] ..$ length: int 2 [18:41:19.007] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:19.007] - attr(*, "where")=List of 2 [18:41:19.007] ..$ ...future.FUN: [18:41:19.007] ..$ ... : [18:41:19.007] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:19.007] - attr(*, "resolved")= logi FALSE [18:41:19.007] - attr(*, "total_size")= int 4456 [18:41:19.010] Packages to be attached in all futures: [n=0] [18:41:19.011] getGlobalsAndPackagesXApply() ... DONE [18:41:19.011] Number of futures (= number of chunks): 1 [18:41:19.011] Launching 1 futures (chunks) ... [18:41:19.011] Chunk #1 of 1 ... [18:41:19.011] - Finding globals in 'X' for chunk #1 ... [18:41:19.012] getGlobalsAndPackages() ... [18:41:19.012] Searching for globals... [18:41:19.012] [18:41:19.012] Searching for globals ... DONE [18:41:19.012] - globals: [0] [18:41:19.012] getGlobalsAndPackages() ... DONE [18:41:19.013] + additional globals found: [n=0] [18:41:19.013] + additional namespaces needed: [n=0] [18:41:19.013] - Finding globals in 'X' for chunk #1 ... DONE [18:41:19.013] - seeds: [18:41:19.013] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.013] getGlobalsAndPackages() ... [18:41:19.014] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.014] Resolving globals: FALSE [18:41:19.014] Tweak future expression to call with '...' arguments ... [18:41:19.014] { [18:41:19.014] do.call(function(...) { [18:41:19.014] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:19.014] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:19.014] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:19.014] on.exit(options(oopts), add = TRUE) [18:41:19.014] } [18:41:19.014] { [18:41:19.014] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:19.014] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:19.014] ...future.FUN(...future.X_jj, ...) [18:41:19.014] }) [18:41:19.014] } [18:41:19.014] }, args = future.call.arguments) [18:41:19.014] } [18:41:19.014] Tweak future expression to call with '...' arguments ... DONE [18:41:19.015] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.015] [18:41:19.015] getGlobalsAndPackages() ... DONE [18:41:19.016] run() for 'Future' ... [18:41:19.016] - state: 'created' [18:41:19.016] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:19.018] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:19.019] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:19.019] - Field: 'label' [18:41:19.019] - Field: 'local' [18:41:19.019] - Field: 'owner' [18:41:19.019] - Field: 'envir' [18:41:19.019] - Field: 'packages' [18:41:19.020] - Field: 'gc' [18:41:19.020] - Field: 'conditions' [18:41:19.020] - Field: 'expr' [18:41:19.020] - Field: 'uuid' [18:41:19.020] - Field: 'seed' [18:41:19.021] - Field: 'version' [18:41:19.021] - Field: 'result' [18:41:19.021] - Field: 'asynchronous' [18:41:19.021] - Field: 'calls' [18:41:19.021] - Field: 'globals' [18:41:19.021] - Field: 'stdout' [18:41:19.022] - Field: 'earlySignal' [18:41:19.022] - Field: 'lazy' [18:41:19.022] - Field: 'state' [18:41:19.022] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:19.022] - Launch lazy future ... [18:41:19.022] Packages needed by the future expression (n = 0): [18:41:19.023] Packages needed by future strategies (n = 0): [18:41:19.023] { [18:41:19.023] { [18:41:19.023] { [18:41:19.023] ...future.startTime <- base::Sys.time() [18:41:19.023] { [18:41:19.023] { [18:41:19.023] { [18:41:19.023] base::local({ [18:41:19.023] has_future <- base::requireNamespace("future", [18:41:19.023] quietly = TRUE) [18:41:19.023] if (has_future) { [18:41:19.023] ns <- base::getNamespace("future") [18:41:19.023] version <- ns[[".package"]][["version"]] [18:41:19.023] if (is.null(version)) [18:41:19.023] version <- utils::packageVersion("future") [18:41:19.023] } [18:41:19.023] else { [18:41:19.023] version <- NULL [18:41:19.023] } [18:41:19.023] if (!has_future || version < "1.8.0") { [18:41:19.023] info <- base::c(r_version = base::gsub("R version ", [18:41:19.023] "", base::R.version$version.string), [18:41:19.023] platform = base::sprintf("%s (%s-bit)", [18:41:19.023] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:19.023] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:19.023] "release", "version")], collapse = " "), [18:41:19.023] hostname = base::Sys.info()[["nodename"]]) [18:41:19.023] info <- base::sprintf("%s: %s", base::names(info), [18:41:19.023] info) [18:41:19.023] info <- base::paste(info, collapse = "; ") [18:41:19.023] if (!has_future) { [18:41:19.023] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:19.023] info) [18:41:19.023] } [18:41:19.023] else { [18:41:19.023] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:19.023] info, version) [18:41:19.023] } [18:41:19.023] base::stop(msg) [18:41:19.023] } [18:41:19.023] }) [18:41:19.023] } [18:41:19.023] ...future.strategy.old <- future::plan("list") [18:41:19.023] options(future.plan = NULL) [18:41:19.023] Sys.unsetenv("R_FUTURE_PLAN") [18:41:19.023] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:19.023] } [18:41:19.023] ...future.workdir <- getwd() [18:41:19.023] } [18:41:19.023] ...future.oldOptions <- base::as.list(base::.Options) [18:41:19.023] ...future.oldEnvVars <- base::Sys.getenv() [18:41:19.023] } [18:41:19.023] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:19.023] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:19.023] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:19.023] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:19.023] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:19.023] future.stdout.windows.reencode = NULL, width = 80L) [18:41:19.023] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:19.023] base::names(...future.oldOptions)) [18:41:19.023] } [18:41:19.023] if (FALSE) { [18:41:19.023] } [18:41:19.023] else { [18:41:19.023] if (TRUE) { [18:41:19.023] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:19.023] open = "w") [18:41:19.023] } [18:41:19.023] else { [18:41:19.023] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:19.023] windows = "NUL", "/dev/null"), open = "w") [18:41:19.023] } [18:41:19.023] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:19.023] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:19.023] base::sink(type = "output", split = FALSE) [18:41:19.023] base::close(...future.stdout) [18:41:19.023] }, add = TRUE) [18:41:19.023] } [18:41:19.023] ...future.frame <- base::sys.nframe() [18:41:19.023] ...future.conditions <- base::list() [18:41:19.023] ...future.rng <- base::globalenv()$.Random.seed [18:41:19.023] if (FALSE) { [18:41:19.023] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:19.023] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:19.023] } [18:41:19.023] ...future.result <- base::tryCatch({ [18:41:19.023] base::withCallingHandlers({ [18:41:19.023] ...future.value <- base::withVisible(base::local({ [18:41:19.023] do.call(function(...) { [18:41:19.023] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:19.023] if (!identical(...future.globals.maxSize.org, [18:41:19.023] ...future.globals.maxSize)) { [18:41:19.023] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:19.023] on.exit(options(oopts), add = TRUE) [18:41:19.023] } [18:41:19.023] { [18:41:19.023] lapply(seq_along(...future.elements_ii), [18:41:19.023] FUN = function(jj) { [18:41:19.023] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:19.023] ...future.FUN(...future.X_jj, ...) [18:41:19.023] }) [18:41:19.023] } [18:41:19.023] }, args = future.call.arguments) [18:41:19.023] })) [18:41:19.023] future::FutureResult(value = ...future.value$value, [18:41:19.023] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:19.023] ...future.rng), globalenv = if (FALSE) [18:41:19.023] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:19.023] ...future.globalenv.names)) [18:41:19.023] else NULL, started = ...future.startTime, version = "1.8") [18:41:19.023] }, condition = base::local({ [18:41:19.023] c <- base::c [18:41:19.023] inherits <- base::inherits [18:41:19.023] invokeRestart <- base::invokeRestart [18:41:19.023] length <- base::length [18:41:19.023] list <- base::list [18:41:19.023] seq.int <- base::seq.int [18:41:19.023] signalCondition <- base::signalCondition [18:41:19.023] sys.calls <- base::sys.calls [18:41:19.023] `[[` <- base::`[[` [18:41:19.023] `+` <- base::`+` [18:41:19.023] `<<-` <- base::`<<-` [18:41:19.023] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:19.023] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:19.023] 3L)] [18:41:19.023] } [18:41:19.023] function(cond) { [18:41:19.023] is_error <- inherits(cond, "error") [18:41:19.023] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:19.023] NULL) [18:41:19.023] if (is_error) { [18:41:19.023] sessionInformation <- function() { [18:41:19.023] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:19.023] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:19.023] search = base::search(), system = base::Sys.info()) [18:41:19.023] } [18:41:19.023] ...future.conditions[[length(...future.conditions) + [18:41:19.023] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:19.023] cond$call), session = sessionInformation(), [18:41:19.023] timestamp = base::Sys.time(), signaled = 0L) [18:41:19.023] signalCondition(cond) [18:41:19.023] } [18:41:19.023] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:19.023] "immediateCondition"))) { [18:41:19.023] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:19.023] ...future.conditions[[length(...future.conditions) + [18:41:19.023] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:19.023] if (TRUE && !signal) { [18:41:19.023] muffleCondition <- function (cond, pattern = "^muffle") [18:41:19.023] { [18:41:19.023] inherits <- base::inherits [18:41:19.023] invokeRestart <- base::invokeRestart [18:41:19.023] is.null <- base::is.null [18:41:19.023] muffled <- FALSE [18:41:19.023] if (inherits(cond, "message")) { [18:41:19.023] muffled <- grepl(pattern, "muffleMessage") [18:41:19.023] if (muffled) [18:41:19.023] invokeRestart("muffleMessage") [18:41:19.023] } [18:41:19.023] else if (inherits(cond, "warning")) { [18:41:19.023] muffled <- grepl(pattern, "muffleWarning") [18:41:19.023] if (muffled) [18:41:19.023] invokeRestart("muffleWarning") [18:41:19.023] } [18:41:19.023] else if (inherits(cond, "condition")) { [18:41:19.023] if (!is.null(pattern)) { [18:41:19.023] computeRestarts <- base::computeRestarts [18:41:19.023] grepl <- base::grepl [18:41:19.023] restarts <- computeRestarts(cond) [18:41:19.023] for (restart in restarts) { [18:41:19.023] name <- restart$name [18:41:19.023] if (is.null(name)) [18:41:19.023] next [18:41:19.023] if (!grepl(pattern, name)) [18:41:19.023] next [18:41:19.023] invokeRestart(restart) [18:41:19.023] muffled <- TRUE [18:41:19.023] break [18:41:19.023] } [18:41:19.023] } [18:41:19.023] } [18:41:19.023] invisible(muffled) [18:41:19.023] } [18:41:19.023] muffleCondition(cond, pattern = "^muffle") [18:41:19.023] } [18:41:19.023] } [18:41:19.023] else { [18:41:19.023] if (TRUE) { [18:41:19.023] muffleCondition <- function (cond, pattern = "^muffle") [18:41:19.023] { [18:41:19.023] inherits <- base::inherits [18:41:19.023] invokeRestart <- base::invokeRestart [18:41:19.023] is.null <- base::is.null [18:41:19.023] muffled <- FALSE [18:41:19.023] if (inherits(cond, "message")) { [18:41:19.023] muffled <- grepl(pattern, "muffleMessage") [18:41:19.023] if (muffled) [18:41:19.023] invokeRestart("muffleMessage") [18:41:19.023] } [18:41:19.023] else if (inherits(cond, "warning")) { [18:41:19.023] muffled <- grepl(pattern, "muffleWarning") [18:41:19.023] if (muffled) [18:41:19.023] invokeRestart("muffleWarning") [18:41:19.023] } [18:41:19.023] else if (inherits(cond, "condition")) { [18:41:19.023] if (!is.null(pattern)) { [18:41:19.023] computeRestarts <- base::computeRestarts [18:41:19.023] grepl <- base::grepl [18:41:19.023] restarts <- computeRestarts(cond) [18:41:19.023] for (restart in restarts) { [18:41:19.023] name <- restart$name [18:41:19.023] if (is.null(name)) [18:41:19.023] next [18:41:19.023] if (!grepl(pattern, name)) [18:41:19.023] next [18:41:19.023] invokeRestart(restart) [18:41:19.023] muffled <- TRUE [18:41:19.023] break [18:41:19.023] } [18:41:19.023] } [18:41:19.023] } [18:41:19.023] invisible(muffled) [18:41:19.023] } [18:41:19.023] muffleCondition(cond, pattern = "^muffle") [18:41:19.023] } [18:41:19.023] } [18:41:19.023] } [18:41:19.023] })) [18:41:19.023] }, error = function(ex) { [18:41:19.023] base::structure(base::list(value = NULL, visible = NULL, [18:41:19.023] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:19.023] ...future.rng), started = ...future.startTime, [18:41:19.023] finished = Sys.time(), session_uuid = NA_character_, [18:41:19.023] version = "1.8"), class = "FutureResult") [18:41:19.023] }, finally = { [18:41:19.023] if (!identical(...future.workdir, getwd())) [18:41:19.023] setwd(...future.workdir) [18:41:19.023] { [18:41:19.023] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:19.023] ...future.oldOptions$nwarnings <- NULL [18:41:19.023] } [18:41:19.023] base::options(...future.oldOptions) [18:41:19.023] if (.Platform$OS.type == "windows") { [18:41:19.023] old_names <- names(...future.oldEnvVars) [18:41:19.023] envs <- base::Sys.getenv() [18:41:19.023] names <- names(envs) [18:41:19.023] common <- intersect(names, old_names) [18:41:19.023] added <- setdiff(names, old_names) [18:41:19.023] removed <- setdiff(old_names, names) [18:41:19.023] changed <- common[...future.oldEnvVars[common] != [18:41:19.023] envs[common]] [18:41:19.023] NAMES <- toupper(changed) [18:41:19.023] args <- list() [18:41:19.023] for (kk in seq_along(NAMES)) { [18:41:19.023] name <- changed[[kk]] [18:41:19.023] NAME <- NAMES[[kk]] [18:41:19.023] if (name != NAME && is.element(NAME, old_names)) [18:41:19.023] next [18:41:19.023] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:19.023] } [18:41:19.023] NAMES <- toupper(added) [18:41:19.023] for (kk in seq_along(NAMES)) { [18:41:19.023] name <- added[[kk]] [18:41:19.023] NAME <- NAMES[[kk]] [18:41:19.023] if (name != NAME && is.element(NAME, old_names)) [18:41:19.023] next [18:41:19.023] args[[name]] <- "" [18:41:19.023] } [18:41:19.023] NAMES <- toupper(removed) [18:41:19.023] for (kk in seq_along(NAMES)) { [18:41:19.023] name <- removed[[kk]] [18:41:19.023] NAME <- NAMES[[kk]] [18:41:19.023] if (name != NAME && is.element(NAME, old_names)) [18:41:19.023] next [18:41:19.023] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:19.023] } [18:41:19.023] if (length(args) > 0) [18:41:19.023] base::do.call(base::Sys.setenv, args = args) [18:41:19.023] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:19.023] } [18:41:19.023] else { [18:41:19.023] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:19.023] } [18:41:19.023] { [18:41:19.023] if (base::length(...future.futureOptionsAdded) > [18:41:19.023] 0L) { [18:41:19.023] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:19.023] base::names(opts) <- ...future.futureOptionsAdded [18:41:19.023] base::options(opts) [18:41:19.023] } [18:41:19.023] { [18:41:19.023] { [18:41:19.023] NULL [18:41:19.023] RNGkind("Mersenne-Twister") [18:41:19.023] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:19.023] inherits = FALSE) [18:41:19.023] } [18:41:19.023] options(future.plan = NULL) [18:41:19.023] if (is.na(NA_character_)) [18:41:19.023] Sys.unsetenv("R_FUTURE_PLAN") [18:41:19.023] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:19.023] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:19.023] .init = FALSE) [18:41:19.023] } [18:41:19.023] } [18:41:19.023] } [18:41:19.023] }) [18:41:19.023] if (TRUE) { [18:41:19.023] base::sink(type = "output", split = FALSE) [18:41:19.023] if (TRUE) { [18:41:19.023] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:19.023] } [18:41:19.023] else { [18:41:19.023] ...future.result["stdout"] <- base::list(NULL) [18:41:19.023] } [18:41:19.023] base::close(...future.stdout) [18:41:19.023] ...future.stdout <- NULL [18:41:19.023] } [18:41:19.023] ...future.result$conditions <- ...future.conditions [18:41:19.023] ...future.result$finished <- base::Sys.time() [18:41:19.023] ...future.result [18:41:19.023] } [18:41:19.027] assign_globals() ... [18:41:19.027] List of 5 [18:41:19.027] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:19.027] $ future.call.arguments :List of 1 [18:41:19.027] ..$ length: int 2 [18:41:19.027] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:19.027] $ ...future.elements_ii :List of 4 [18:41:19.027] ..$ c: chr "character" [18:41:19.027] ..$ a: chr "integer" [18:41:19.027] ..$ c: chr "list" [18:41:19.027] ..$ b: chr "numeric" [18:41:19.027] $ ...future.seeds_ii : NULL [18:41:19.027] $ ...future.globals.maxSize: NULL [18:41:19.027] - attr(*, "where")=List of 5 [18:41:19.027] ..$ ...future.FUN : [18:41:19.027] ..$ future.call.arguments : [18:41:19.027] ..$ ...future.elements_ii : [18:41:19.027] ..$ ...future.seeds_ii : [18:41:19.027] ..$ ...future.globals.maxSize: [18:41:19.027] - attr(*, "resolved")= logi FALSE [18:41:19.027] - attr(*, "total_size")= num 4456 [18:41:19.027] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:19.027] - attr(*, "already-done")= logi TRUE [18:41:19.034] - copied '...future.FUN' to environment [18:41:19.034] - copied 'future.call.arguments' to environment [18:41:19.034] - copied '...future.elements_ii' to environment [18:41:19.035] - copied '...future.seeds_ii' to environment [18:41:19.035] - copied '...future.globals.maxSize' to environment [18:41:19.035] assign_globals() ... done [18:41:19.035] plan(): Setting new future strategy stack: [18:41:19.035] List of future strategies: [18:41:19.035] 1. sequential: [18:41:19.035] - args: function (..., envir = parent.frame(), workers = "") [18:41:19.035] - tweaked: FALSE [18:41:19.035] - call: NULL [18:41:19.036] plan(): nbrOfWorkers() = 1 [18:41:19.037] plan(): Setting new future strategy stack: [18:41:19.037] List of future strategies: [18:41:19.037] 1. multisession: [18:41:19.037] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:41:19.037] - tweaked: FALSE [18:41:19.037] - call: plan(strategy) [18:41:19.040] plan(): nbrOfWorkers() = 1 [18:41:19.040] SequentialFuture started (and completed) [18:41:19.040] - Launch lazy future ... done [18:41:19.041] run() for 'SequentialFuture' ... done [18:41:19.041] Created future: [18:41:19.041] SequentialFuture: [18:41:19.041] Label: 'future_lapply-1' [18:41:19.041] Expression: [18:41:19.041] { [18:41:19.041] do.call(function(...) { [18:41:19.041] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:19.041] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:19.041] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:19.041] on.exit(options(oopts), add = TRUE) [18:41:19.041] } [18:41:19.041] { [18:41:19.041] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:19.041] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:19.041] ...future.FUN(...future.X_jj, ...) [18:41:19.041] }) [18:41:19.041] } [18:41:19.041] }, args = future.call.arguments) [18:41:19.041] } [18:41:19.041] Lazy evaluation: FALSE [18:41:19.041] Asynchronous evaluation: FALSE [18:41:19.041] Local evaluation: TRUE [18:41:19.041] Environment: R_GlobalEnv [18:41:19.041] Capture standard output: TRUE [18:41:19.041] Capture condition classes: 'condition' (excluding 'nothing') [18:41:19.041] Globals: 5 objects totaling 853 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 191 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:19.041] Packages: [18:41:19.041] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:19.041] Resolved: TRUE [18:41:19.041] Value: 111 bytes of class 'list' [18:41:19.041] Early signaling: FALSE [18:41:19.041] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:19.041] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:19.042] Chunk #1 of 1 ... DONE [18:41:19.042] Launching 1 futures (chunks) ... DONE [18:41:19.042] Resolving 1 futures (chunks) ... [18:41:19.043] resolve() on list ... [18:41:19.043] recursive: 0 [18:41:19.043] length: 1 [18:41:19.043] [18:41:19.043] resolved() for 'SequentialFuture' ... [18:41:19.043] - state: 'finished' [18:41:19.044] - run: TRUE [18:41:19.044] - result: 'FutureResult' [18:41:19.044] resolved() for 'SequentialFuture' ... done [18:41:19.044] Future #1 [18:41:19.044] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:19.044] - nx: 1 [18:41:19.045] - relay: TRUE [18:41:19.045] - stdout: TRUE [18:41:19.045] - signal: TRUE [18:41:19.045] - resignal: FALSE [18:41:19.045] - force: TRUE [18:41:19.045] - relayed: [n=1] FALSE [18:41:19.045] - queued futures: [n=1] FALSE [18:41:19.046] - until=1 [18:41:19.046] - relaying element #1 [18:41:19.046] - relayed: [n=1] TRUE [18:41:19.046] - queued futures: [n=1] TRUE [18:41:19.046] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:19.047] length: 0 (resolved future 1) [18:41:19.047] Relaying remaining futures [18:41:19.047] signalConditionsASAP(NULL, pos=0) ... [18:41:19.047] - nx: 1 [18:41:19.047] - relay: TRUE [18:41:19.047] - stdout: TRUE [18:41:19.047] - signal: TRUE [18:41:19.048] - resignal: FALSE [18:41:19.048] - force: TRUE [18:41:19.048] - relayed: [n=1] TRUE [18:41:19.048] - queued futures: [n=1] TRUE - flush all [18:41:19.048] - relayed: [n=1] TRUE [18:41:19.049] - queued futures: [n=1] TRUE [18:41:19.049] signalConditionsASAP(NULL, pos=0) ... done [18:41:19.049] resolve() on list ... DONE [18:41:19.049] - Number of value chunks collected: 1 [18:41:19.049] Resolving 1 futures (chunks) ... DONE [18:41:19.049] Reducing values from 1 chunks ... [18:41:19.050] - Number of values collected after concatenation: 4 [18:41:19.050] - Number of values expected: 4 [18:41:19.050] Reverse index remapping (attribute 'ordering'): [n = 4] 2, 4, 1, 3 [18:41:19.050] Reducing values from 1 chunks ... DONE [18:41:19.050] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL - future_lapply(x, FUN = future:::hpaste, ...) ... [18:41:19.053] future_lapply() ... [18:41:19.063] Number of chunks: 1 [18:41:19.063] getGlobalsAndPackagesXApply() ... [18:41:19.063] - future.globals: TRUE [18:41:19.064] getGlobalsAndPackages() ... [18:41:19.064] Searching for globals... [18:41:19.073] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [18:41:19.073] Searching for globals ... DONE [18:41:19.073] Resolving globals: FALSE [18:41:19.074] The total size of the 1 globals is 7.17 KiB (7342 bytes) [18:41:19.075] The total size of the 1 globals exported for future expression ('FUN(collapse = "; ", maxHead = 3L)') is 7.17 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (7.17 KiB of class 'function') [18:41:19.077] - globals: [1] 'FUN' [18:41:19.077] - packages: [1] 'future' [18:41:19.078] getGlobalsAndPackages() ... DONE [18:41:19.078] - globals found/used: [n=1] 'FUN' [18:41:19.078] - needed namespaces: [n=1] 'future' [18:41:19.078] Finding globals ... DONE [18:41:19.078] - use_args: TRUE [18:41:19.078] - Getting '...' globals ... [18:41:19.079] resolve() on list ... [18:41:19.079] recursive: 0 [18:41:19.079] length: 1 [18:41:19.079] elements: '...' [18:41:19.080] length: 0 (resolved future 1) [18:41:19.080] resolve() on list ... DONE [18:41:19.080] - '...' content: [n=2] 'collapse', 'maxHead' [18:41:19.080] List of 1 [18:41:19.080] $ ...:List of 2 [18:41:19.080] ..$ collapse: chr "; " [18:41:19.080] ..$ maxHead : int 3 [18:41:19.080] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:19.080] - attr(*, "where")=List of 1 [18:41:19.080] ..$ ...: [18:41:19.080] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:19.080] - attr(*, "resolved")= logi TRUE [18:41:19.080] - attr(*, "total_size")= num NA [18:41:19.084] - Getting '...' globals ... DONE [18:41:19.084] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:19.084] List of 2 [18:41:19.084] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [18:41:19.084] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [18:41:19.084] $ ... :List of 2 [18:41:19.084] ..$ collapse: chr "; " [18:41:19.084] ..$ maxHead : int 3 [18:41:19.084] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:19.084] - attr(*, "where")=List of 2 [18:41:19.084] ..$ ...future.FUN: [18:41:19.084] ..$ ... : [18:41:19.084] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:19.084] - attr(*, "resolved")= logi FALSE [18:41:19.084] - attr(*, "total_size")= int 20351 [18:41:19.088] Packages to be attached in all futures: [n=1] 'future' [18:41:19.088] getGlobalsAndPackagesXApply() ... DONE [18:41:19.089] Number of futures (= number of chunks): 1 [18:41:19.089] Launching 1 futures (chunks) ... [18:41:19.089] Chunk #1 of 1 ... [18:41:19.089] - Finding globals in 'X' for chunk #1 ... [18:41:19.089] getGlobalsAndPackages() ... [18:41:19.089] Searching for globals... [18:41:19.090] [18:41:19.090] Searching for globals ... DONE [18:41:19.090] - globals: [0] [18:41:19.090] getGlobalsAndPackages() ... DONE [18:41:19.090] + additional globals found: [n=0] [18:41:19.091] + additional namespaces needed: [n=0] [18:41:19.091] - Finding globals in 'X' for chunk #1 ... DONE [18:41:19.091] - seeds: [18:41:19.091] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.091] getGlobalsAndPackages() ... [18:41:19.091] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.092] Resolving globals: FALSE [18:41:19.092] Tweak future expression to call with '...' arguments ... [18:41:19.092] { [18:41:19.092] do.call(function(...) { [18:41:19.092] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:19.092] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:19.092] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:19.092] on.exit(options(oopts), add = TRUE) [18:41:19.092] } [18:41:19.092] { [18:41:19.092] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:19.092] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:19.092] ...future.FUN(...future.X_jj, ...) [18:41:19.092] }) [18:41:19.092] } [18:41:19.092] }, args = future.call.arguments) [18:41:19.092] } [18:41:19.092] Tweak future expression to call with '...' arguments ... DONE [18:41:19.093] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.093] - packages: [1] 'future' [18:41:19.093] getGlobalsAndPackages() ... DONE [18:41:19.094] run() for 'Future' ... [18:41:19.094] - state: 'created' [18:41:19.094] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:19.096] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:19.097] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:19.097] - Field: 'label' [18:41:19.097] - Field: 'local' [18:41:19.097] - Field: 'owner' [18:41:19.097] - Field: 'envir' [18:41:19.098] - Field: 'packages' [18:41:19.098] - Field: 'gc' [18:41:19.098] - Field: 'conditions' [18:41:19.098] - Field: 'expr' [18:41:19.098] - Field: 'uuid' [18:41:19.098] - Field: 'seed' [18:41:19.099] - Field: 'version' [18:41:19.099] - Field: 'result' [18:41:19.099] - Field: 'asynchronous' [18:41:19.099] - Field: 'calls' [18:41:19.099] - Field: 'globals' [18:41:19.099] - Field: 'stdout' [18:41:19.100] - Field: 'earlySignal' [18:41:19.100] - Field: 'lazy' [18:41:19.100] - Field: 'state' [18:41:19.100] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:19.100] - Launch lazy future ... [18:41:19.101] Packages needed by the future expression (n = 1): 'future' [18:41:19.101] Packages needed by future strategies (n = 0): [18:41:19.101] { [18:41:19.101] { [18:41:19.101] { [18:41:19.101] ...future.startTime <- base::Sys.time() [18:41:19.101] { [18:41:19.101] { [18:41:19.101] { [18:41:19.101] { [18:41:19.101] base::local({ [18:41:19.101] has_future <- base::requireNamespace("future", [18:41:19.101] quietly = TRUE) [18:41:19.101] if (has_future) { [18:41:19.101] ns <- base::getNamespace("future") [18:41:19.101] version <- ns[[".package"]][["version"]] [18:41:19.101] if (is.null(version)) [18:41:19.101] version <- utils::packageVersion("future") [18:41:19.101] } [18:41:19.101] else { [18:41:19.101] version <- NULL [18:41:19.101] } [18:41:19.101] if (!has_future || version < "1.8.0") { [18:41:19.101] info <- base::c(r_version = base::gsub("R version ", [18:41:19.101] "", base::R.version$version.string), [18:41:19.101] platform = base::sprintf("%s (%s-bit)", [18:41:19.101] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:19.101] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:19.101] "release", "version")], collapse = " "), [18:41:19.101] hostname = base::Sys.info()[["nodename"]]) [18:41:19.101] info <- base::sprintf("%s: %s", base::names(info), [18:41:19.101] info) [18:41:19.101] info <- base::paste(info, collapse = "; ") [18:41:19.101] if (!has_future) { [18:41:19.101] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:19.101] info) [18:41:19.101] } [18:41:19.101] else { [18:41:19.101] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:19.101] info, version) [18:41:19.101] } [18:41:19.101] base::stop(msg) [18:41:19.101] } [18:41:19.101] }) [18:41:19.101] } [18:41:19.101] base::local({ [18:41:19.101] for (pkg in "future") { [18:41:19.101] base::loadNamespace(pkg) [18:41:19.101] base::library(pkg, character.only = TRUE) [18:41:19.101] } [18:41:19.101] }) [18:41:19.101] } [18:41:19.101] ...future.strategy.old <- future::plan("list") [18:41:19.101] options(future.plan = NULL) [18:41:19.101] Sys.unsetenv("R_FUTURE_PLAN") [18:41:19.101] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:19.101] } [18:41:19.101] ...future.workdir <- getwd() [18:41:19.101] } [18:41:19.101] ...future.oldOptions <- base::as.list(base::.Options) [18:41:19.101] ...future.oldEnvVars <- base::Sys.getenv() [18:41:19.101] } [18:41:19.101] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:19.101] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:19.101] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:19.101] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:19.101] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:19.101] future.stdout.windows.reencode = NULL, width = 80L) [18:41:19.101] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:19.101] base::names(...future.oldOptions)) [18:41:19.101] } [18:41:19.101] if (FALSE) { [18:41:19.101] } [18:41:19.101] else { [18:41:19.101] if (TRUE) { [18:41:19.101] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:19.101] open = "w") [18:41:19.101] } [18:41:19.101] else { [18:41:19.101] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:19.101] windows = "NUL", "/dev/null"), open = "w") [18:41:19.101] } [18:41:19.101] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:19.101] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:19.101] base::sink(type = "output", split = FALSE) [18:41:19.101] base::close(...future.stdout) [18:41:19.101] }, add = TRUE) [18:41:19.101] } [18:41:19.101] ...future.frame <- base::sys.nframe() [18:41:19.101] ...future.conditions <- base::list() [18:41:19.101] ...future.rng <- base::globalenv()$.Random.seed [18:41:19.101] if (FALSE) { [18:41:19.101] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:19.101] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:19.101] } [18:41:19.101] ...future.result <- base::tryCatch({ [18:41:19.101] base::withCallingHandlers({ [18:41:19.101] ...future.value <- base::withVisible(base::local({ [18:41:19.101] do.call(function(...) { [18:41:19.101] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:19.101] if (!identical(...future.globals.maxSize.org, [18:41:19.101] ...future.globals.maxSize)) { [18:41:19.101] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:19.101] on.exit(options(oopts), add = TRUE) [18:41:19.101] } [18:41:19.101] { [18:41:19.101] lapply(seq_along(...future.elements_ii), [18:41:19.101] FUN = function(jj) { [18:41:19.101] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:19.101] ...future.FUN(...future.X_jj, ...) [18:41:19.101] }) [18:41:19.101] } [18:41:19.101] }, args = future.call.arguments) [18:41:19.101] })) [18:41:19.101] future::FutureResult(value = ...future.value$value, [18:41:19.101] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:19.101] ...future.rng), globalenv = if (FALSE) [18:41:19.101] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:19.101] ...future.globalenv.names)) [18:41:19.101] else NULL, started = ...future.startTime, version = "1.8") [18:41:19.101] }, condition = base::local({ [18:41:19.101] c <- base::c [18:41:19.101] inherits <- base::inherits [18:41:19.101] invokeRestart <- base::invokeRestart [18:41:19.101] length <- base::length [18:41:19.101] list <- base::list [18:41:19.101] seq.int <- base::seq.int [18:41:19.101] signalCondition <- base::signalCondition [18:41:19.101] sys.calls <- base::sys.calls [18:41:19.101] `[[` <- base::`[[` [18:41:19.101] `+` <- base::`+` [18:41:19.101] `<<-` <- base::`<<-` [18:41:19.101] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:19.101] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:19.101] 3L)] [18:41:19.101] } [18:41:19.101] function(cond) { [18:41:19.101] is_error <- inherits(cond, "error") [18:41:19.101] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:19.101] NULL) [18:41:19.101] if (is_error) { [18:41:19.101] sessionInformation <- function() { [18:41:19.101] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:19.101] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:19.101] search = base::search(), system = base::Sys.info()) [18:41:19.101] } [18:41:19.101] ...future.conditions[[length(...future.conditions) + [18:41:19.101] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:19.101] cond$call), session = sessionInformation(), [18:41:19.101] timestamp = base::Sys.time(), signaled = 0L) [18:41:19.101] signalCondition(cond) [18:41:19.101] } [18:41:19.101] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:19.101] "immediateCondition"))) { [18:41:19.101] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:19.101] ...future.conditions[[length(...future.conditions) + [18:41:19.101] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:19.101] if (TRUE && !signal) { [18:41:19.101] muffleCondition <- function (cond, pattern = "^muffle") [18:41:19.101] { [18:41:19.101] inherits <- base::inherits [18:41:19.101] invokeRestart <- base::invokeRestart [18:41:19.101] is.null <- base::is.null [18:41:19.101] muffled <- FALSE [18:41:19.101] if (inherits(cond, "message")) { [18:41:19.101] muffled <- grepl(pattern, "muffleMessage") [18:41:19.101] if (muffled) [18:41:19.101] invokeRestart("muffleMessage") [18:41:19.101] } [18:41:19.101] else if (inherits(cond, "warning")) { [18:41:19.101] muffled <- grepl(pattern, "muffleWarning") [18:41:19.101] if (muffled) [18:41:19.101] invokeRestart("muffleWarning") [18:41:19.101] } [18:41:19.101] else if (inherits(cond, "condition")) { [18:41:19.101] if (!is.null(pattern)) { [18:41:19.101] computeRestarts <- base::computeRestarts [18:41:19.101] grepl <- base::grepl [18:41:19.101] restarts <- computeRestarts(cond) [18:41:19.101] for (restart in restarts) { [18:41:19.101] name <- restart$name [18:41:19.101] if (is.null(name)) [18:41:19.101] next [18:41:19.101] if (!grepl(pattern, name)) [18:41:19.101] next [18:41:19.101] invokeRestart(restart) [18:41:19.101] muffled <- TRUE [18:41:19.101] break [18:41:19.101] } [18:41:19.101] } [18:41:19.101] } [18:41:19.101] invisible(muffled) [18:41:19.101] } [18:41:19.101] muffleCondition(cond, pattern = "^muffle") [18:41:19.101] } [18:41:19.101] } [18:41:19.101] else { [18:41:19.101] if (TRUE) { [18:41:19.101] muffleCondition <- function (cond, pattern = "^muffle") [18:41:19.101] { [18:41:19.101] inherits <- base::inherits [18:41:19.101] invokeRestart <- base::invokeRestart [18:41:19.101] is.null <- base::is.null [18:41:19.101] muffled <- FALSE [18:41:19.101] if (inherits(cond, "message")) { [18:41:19.101] muffled <- grepl(pattern, "muffleMessage") [18:41:19.101] if (muffled) [18:41:19.101] invokeRestart("muffleMessage") [18:41:19.101] } [18:41:19.101] else if (inherits(cond, "warning")) { [18:41:19.101] muffled <- grepl(pattern, "muffleWarning") [18:41:19.101] if (muffled) [18:41:19.101] invokeRestart("muffleWarning") [18:41:19.101] } [18:41:19.101] else if (inherits(cond, "condition")) { [18:41:19.101] if (!is.null(pattern)) { [18:41:19.101] computeRestarts <- base::computeRestarts [18:41:19.101] grepl <- base::grepl [18:41:19.101] restarts <- computeRestarts(cond) [18:41:19.101] for (restart in restarts) { [18:41:19.101] name <- restart$name [18:41:19.101] if (is.null(name)) [18:41:19.101] next [18:41:19.101] if (!grepl(pattern, name)) [18:41:19.101] next [18:41:19.101] invokeRestart(restart) [18:41:19.101] muffled <- TRUE [18:41:19.101] break [18:41:19.101] } [18:41:19.101] } [18:41:19.101] } [18:41:19.101] invisible(muffled) [18:41:19.101] } [18:41:19.101] muffleCondition(cond, pattern = "^muffle") [18:41:19.101] } [18:41:19.101] } [18:41:19.101] } [18:41:19.101] })) [18:41:19.101] }, error = function(ex) { [18:41:19.101] base::structure(base::list(value = NULL, visible = NULL, [18:41:19.101] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:19.101] ...future.rng), started = ...future.startTime, [18:41:19.101] finished = Sys.time(), session_uuid = NA_character_, [18:41:19.101] version = "1.8"), class = "FutureResult") [18:41:19.101] }, finally = { [18:41:19.101] if (!identical(...future.workdir, getwd())) [18:41:19.101] setwd(...future.workdir) [18:41:19.101] { [18:41:19.101] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:19.101] ...future.oldOptions$nwarnings <- NULL [18:41:19.101] } [18:41:19.101] base::options(...future.oldOptions) [18:41:19.101] if (.Platform$OS.type == "windows") { [18:41:19.101] old_names <- names(...future.oldEnvVars) [18:41:19.101] envs <- base::Sys.getenv() [18:41:19.101] names <- names(envs) [18:41:19.101] common <- intersect(names, old_names) [18:41:19.101] added <- setdiff(names, old_names) [18:41:19.101] removed <- setdiff(old_names, names) [18:41:19.101] changed <- common[...future.oldEnvVars[common] != [18:41:19.101] envs[common]] [18:41:19.101] NAMES <- toupper(changed) [18:41:19.101] args <- list() [18:41:19.101] for (kk in seq_along(NAMES)) { [18:41:19.101] name <- changed[[kk]] [18:41:19.101] NAME <- NAMES[[kk]] [18:41:19.101] if (name != NAME && is.element(NAME, old_names)) [18:41:19.101] next [18:41:19.101] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:19.101] } [18:41:19.101] NAMES <- toupper(added) [18:41:19.101] for (kk in seq_along(NAMES)) { [18:41:19.101] name <- added[[kk]] [18:41:19.101] NAME <- NAMES[[kk]] [18:41:19.101] if (name != NAME && is.element(NAME, old_names)) [18:41:19.101] next [18:41:19.101] args[[name]] <- "" [18:41:19.101] } [18:41:19.101] NAMES <- toupper(removed) [18:41:19.101] for (kk in seq_along(NAMES)) { [18:41:19.101] name <- removed[[kk]] [18:41:19.101] NAME <- NAMES[[kk]] [18:41:19.101] if (name != NAME && is.element(NAME, old_names)) [18:41:19.101] next [18:41:19.101] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:19.101] } [18:41:19.101] if (length(args) > 0) [18:41:19.101] base::do.call(base::Sys.setenv, args = args) [18:41:19.101] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:19.101] } [18:41:19.101] else { [18:41:19.101] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:19.101] } [18:41:19.101] { [18:41:19.101] if (base::length(...future.futureOptionsAdded) > [18:41:19.101] 0L) { [18:41:19.101] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:19.101] base::names(opts) <- ...future.futureOptionsAdded [18:41:19.101] base::options(opts) [18:41:19.101] } [18:41:19.101] { [18:41:19.101] { [18:41:19.101] NULL [18:41:19.101] RNGkind("Mersenne-Twister") [18:41:19.101] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:19.101] inherits = FALSE) [18:41:19.101] } [18:41:19.101] options(future.plan = NULL) [18:41:19.101] if (is.na(NA_character_)) [18:41:19.101] Sys.unsetenv("R_FUTURE_PLAN") [18:41:19.101] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:19.101] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:19.101] .init = FALSE) [18:41:19.101] } [18:41:19.101] } [18:41:19.101] } [18:41:19.101] }) [18:41:19.101] if (TRUE) { [18:41:19.101] base::sink(type = "output", split = FALSE) [18:41:19.101] if (TRUE) { [18:41:19.101] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:19.101] } [18:41:19.101] else { [18:41:19.101] ...future.result["stdout"] <- base::list(NULL) [18:41:19.101] } [18:41:19.101] base::close(...future.stdout) [18:41:19.101] ...future.stdout <- NULL [18:41:19.101] } [18:41:19.101] ...future.result$conditions <- ...future.conditions [18:41:19.101] ...future.result$finished <- base::Sys.time() [18:41:19.101] ...future.result [18:41:19.101] } [18:41:19.105] assign_globals() ... [18:41:19.106] List of 5 [18:41:19.106] $ ...future.FUN :function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [18:41:19.106] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [18:41:19.106] $ future.call.arguments :List of 2 [18:41:19.106] ..$ collapse: chr "; " [18:41:19.106] ..$ maxHead : int 3 [18:41:19.106] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:19.106] $ ...future.elements_ii :List of 1 [18:41:19.106] ..$ a: Named chr [1:101] "hello" "1" "2" "3" ... [18:41:19.106] .. ..- attr(*, "names")= chr [1:101] "" "b1" "b2" "b3" ... [18:41:19.106] $ ...future.seeds_ii : NULL [18:41:19.106] $ ...future.globals.maxSize: NULL [18:41:19.106] - attr(*, "where")=List of 5 [18:41:19.106] ..$ ...future.FUN : [18:41:19.106] ..$ future.call.arguments : [18:41:19.106] ..$ ...future.elements_ii : [18:41:19.106] ..$ ...future.seeds_ii : [18:41:19.106] ..$ ...future.globals.maxSize: [18:41:19.106] - attr(*, "resolved")= logi FALSE [18:41:19.106] - attr(*, "total_size")= num 20351 [18:41:19.106] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:19.106] - attr(*, "already-done")= logi TRUE [18:41:19.112] - copied '...future.FUN' to environment [18:41:19.113] - copied 'future.call.arguments' to environment [18:41:19.113] - copied '...future.elements_ii' to environment [18:41:19.113] - copied '...future.seeds_ii' to environment [18:41:19.113] - copied '...future.globals.maxSize' to environment [18:41:19.113] assign_globals() ... done [18:41:19.114] plan(): Setting new future strategy stack: [18:41:19.114] List of future strategies: [18:41:19.114] 1. sequential: [18:41:19.114] - args: function (..., envir = parent.frame(), workers = "") [18:41:19.114] - tweaked: FALSE [18:41:19.114] - call: NULL [18:41:19.115] plan(): nbrOfWorkers() = 1 [18:41:19.116] plan(): Setting new future strategy stack: [18:41:19.116] List of future strategies: [18:41:19.116] 1. multisession: [18:41:19.116] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:41:19.116] - tweaked: FALSE [18:41:19.116] - call: plan(strategy) [18:41:19.119] plan(): nbrOfWorkers() = 1 [18:41:19.119] SequentialFuture started (and completed) [18:41:19.119] - Launch lazy future ... done [18:41:19.119] run() for 'SequentialFuture' ... done [18:41:19.120] Created future: [18:41:19.120] SequentialFuture: [18:41:19.120] Label: 'future_lapply-1' [18:41:19.120] Expression: [18:41:19.120] { [18:41:19.120] do.call(function(...) { [18:41:19.120] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:19.120] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:19.120] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:19.120] on.exit(options(oopts), add = TRUE) [18:41:19.120] } [18:41:19.120] { [18:41:19.120] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:19.120] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:19.120] ...future.FUN(...future.X_jj, ...) [18:41:19.120] }) [18:41:19.120] } [18:41:19.120] }, args = future.call.arguments) [18:41:19.120] } [18:41:19.120] Lazy evaluation: FALSE [18:41:19.120] Asynchronous evaluation: FALSE [18:41:19.120] Local evaluation: TRUE [18:41:19.120] Environment: R_GlobalEnv [18:41:19.120] Capture standard output: TRUE [18:41:19.120] Capture condition classes: 'condition' (excluding 'nothing') [18:41:19.120] Globals: 5 objects totaling 9.56 KiB (function '...future.FUN' of 7.17 KiB, DotDotDotList 'future.call.arguments' of 187 bytes, list '...future.elements_ii' of 2.15 KiB, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:19.120] Packages: 1 packages ('future') [18:41:19.120] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:19.120] Resolved: TRUE [18:41:19.120] Value: 68 bytes of class 'list' [18:41:19.120] Early signaling: FALSE [18:41:19.120] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:19.120] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:19.121] Chunk #1 of 1 ... DONE [18:41:19.121] Launching 1 futures (chunks) ... DONE [18:41:19.121] Resolving 1 futures (chunks) ... [18:41:19.121] resolve() on list ... [18:41:19.122] recursive: 0 [18:41:19.122] length: 1 [18:41:19.122] [18:41:19.122] resolved() for 'SequentialFuture' ... [18:41:19.122] - state: 'finished' [18:41:19.122] - run: TRUE [18:41:19.123] - result: 'FutureResult' [18:41:19.123] resolved() for 'SequentialFuture' ... done [18:41:19.123] Future #1 [18:41:19.123] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:19.123] - nx: 1 [18:41:19.123] - relay: TRUE [18:41:19.124] - stdout: TRUE [18:41:19.124] - signal: TRUE [18:41:19.124] - resignal: FALSE [18:41:19.124] - force: TRUE [18:41:19.124] - relayed: [n=1] FALSE [18:41:19.124] - queued futures: [n=1] FALSE [18:41:19.125] - until=1 [18:41:19.125] - relaying element #1 [18:41:19.125] - relayed: [n=1] TRUE [18:41:19.125] - queued futures: [n=1] TRUE [18:41:19.125] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:19.125] length: 0 (resolved future 1) [18:41:19.126] Relaying remaining futures [18:41:19.126] signalConditionsASAP(NULL, pos=0) ... [18:41:19.126] - nx: 1 [18:41:19.126] - relay: TRUE [18:41:19.126] - stdout: TRUE [18:41:19.126] - signal: TRUE [18:41:19.127] - resignal: FALSE [18:41:19.127] - force: TRUE [18:41:19.127] - relayed: [n=1] TRUE [18:41:19.127] - queued futures: [n=1] TRUE - flush all [18:41:19.127] - relayed: [n=1] TRUE [18:41:19.127] - queued futures: [n=1] TRUE [18:41:19.128] signalConditionsASAP(NULL, pos=0) ... done [18:41:19.128] resolve() on list ... DONE [18:41:19.128] - Number of value chunks collected: 1 [18:41:19.128] Resolving 1 futures (chunks) ... DONE [18:41:19.128] Reducing values from 1 chunks ... [18:41:19.128] - Number of values collected after concatenation: 1 [18:41:19.129] - Number of values expected: 1 [18:41:19.129] Reducing values from 1 chunks ... DONE [18:41:19.129] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [18:41:19.130] future_lapply() ... [18:41:19.133] Number of chunks: 1 [18:41:19.133] Index remapping (attribute 'ordering'): [n = 2] 2, 1 [18:41:19.133] getGlobalsAndPackagesXApply() ... [18:41:19.133] - future.globals: TRUE [18:41:19.133] getGlobalsAndPackages() ... [18:41:19.133] Searching for globals... [18:41:19.135] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [18:41:19.135] Searching for globals ... DONE [18:41:19.135] Resolving globals: FALSE [18:41:19.136] The total size of the 1 globals is 911 bytes (911 bytes) [18:41:19.136] The total size of the 1 globals exported for future expression ('FUN()') is 911 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (911 bytes of class 'function') [18:41:19.136] - globals: [1] 'FUN' [18:41:19.137] - packages: [1] 'listenv' [18:41:19.137] getGlobalsAndPackages() ... DONE [18:41:19.137] - globals found/used: [n=1] 'FUN' [18:41:19.137] - needed namespaces: [n=1] 'listenv' [18:41:19.137] Finding globals ... DONE [18:41:19.138] - use_args: TRUE [18:41:19.138] - Getting '...' globals ... [18:41:19.138] resolve() on list ... [18:41:19.138] recursive: 0 [18:41:19.138] length: 1 [18:41:19.139] elements: '...' [18:41:19.139] length: 0 (resolved future 1) [18:41:19.139] resolve() on list ... DONE [18:41:19.139] - '...' content: [n=0] [18:41:19.139] List of 1 [18:41:19.139] $ ...: list() [18:41:19.139] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:19.139] - attr(*, "where")=List of 1 [18:41:19.139] ..$ ...: [18:41:19.139] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:19.139] - attr(*, "resolved")= logi TRUE [18:41:19.139] - attr(*, "total_size")= num NA [18:41:19.142] - Getting '...' globals ... DONE [18:41:19.142] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:19.143] List of 2 [18:41:19.143] $ ...future.FUN:function (x, ...) [18:41:19.143] $ ... : list() [18:41:19.143] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:19.143] - attr(*, "where")=List of 2 [18:41:19.143] ..$ ...future.FUN: [18:41:19.143] ..$ ... : [18:41:19.143] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:19.143] - attr(*, "resolved")= logi FALSE [18:41:19.143] - attr(*, "total_size")= int 8195 [18:41:19.146] Packages to be attached in all futures: [n=1] 'listenv' [18:41:19.146] getGlobalsAndPackagesXApply() ... DONE [18:41:19.146] Number of futures (= number of chunks): 1 [18:41:19.146] Launching 1 futures (chunks) ... [18:41:19.147] Chunk #1 of 1 ... [18:41:19.147] - Finding globals in 'X' for chunk #1 ... [18:41:19.147] getGlobalsAndPackages() ... [18:41:19.147] Searching for globals... [18:41:19.148] [18:41:19.148] Searching for globals ... DONE [18:41:19.148] - globals: [0] [18:41:19.148] getGlobalsAndPackages() ... DONE [18:41:19.148] + additional globals found: [n=0] [18:41:19.149] + additional namespaces needed: [n=0] [18:41:19.149] - Finding globals in 'X' for chunk #1 ... DONE [18:41:19.149] - seeds: [18:41:19.149] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.149] getGlobalsAndPackages() ... [18:41:19.149] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.150] Resolving globals: FALSE [18:41:19.150] Tweak future expression to call with '...' arguments ... [18:41:19.150] { [18:41:19.150] do.call(function(...) { [18:41:19.150] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:19.150] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:19.150] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:19.150] on.exit(options(oopts), add = TRUE) [18:41:19.150] } [18:41:19.150] { [18:41:19.150] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:19.150] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:19.150] ...future.FUN(...future.X_jj, ...) [18:41:19.150] }) [18:41:19.150] } [18:41:19.150] }, args = future.call.arguments) [18:41:19.150] } [18:41:19.150] Tweak future expression to call with '...' arguments ... DONE [18:41:19.151] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.151] - packages: [1] 'listenv' [18:41:19.151] getGlobalsAndPackages() ... DONE [18:41:19.152] run() for 'Future' ... [18:41:19.152] - state: 'created' [18:41:19.152] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:19.154] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:19.155] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:19.155] - Field: 'label' [18:41:19.155] - Field: 'local' [18:41:19.155] - Field: 'owner' [18:41:19.155] - Field: 'envir' [18:41:19.155] - Field: 'packages' [18:41:19.156] - Field: 'gc' [18:41:19.156] - Field: 'conditions' [18:41:19.156] - Field: 'expr' [18:41:19.156] - Field: 'uuid' [18:41:19.156] - Field: 'seed' [18:41:19.156] - Field: 'version' [18:41:19.157] - Field: 'result' [18:41:19.157] - Field: 'asynchronous' [18:41:19.157] - Field: 'calls' [18:41:19.157] - Field: 'globals' [18:41:19.157] - Field: 'stdout' [18:41:19.158] - Field: 'earlySignal' [18:41:19.158] - Field: 'lazy' [18:41:19.158] - Field: 'state' [18:41:19.158] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:19.158] - Launch lazy future ... [18:41:19.158] Packages needed by the future expression (n = 1): 'listenv' [18:41:19.159] Packages needed by future strategies (n = 0): [18:41:19.159] { [18:41:19.159] { [18:41:19.159] { [18:41:19.159] ...future.startTime <- base::Sys.time() [18:41:19.159] { [18:41:19.159] { [18:41:19.159] { [18:41:19.159] { [18:41:19.159] base::local({ [18:41:19.159] has_future <- base::requireNamespace("future", [18:41:19.159] quietly = TRUE) [18:41:19.159] if (has_future) { [18:41:19.159] ns <- base::getNamespace("future") [18:41:19.159] version <- ns[[".package"]][["version"]] [18:41:19.159] if (is.null(version)) [18:41:19.159] version <- utils::packageVersion("future") [18:41:19.159] } [18:41:19.159] else { [18:41:19.159] version <- NULL [18:41:19.159] } [18:41:19.159] if (!has_future || version < "1.8.0") { [18:41:19.159] info <- base::c(r_version = base::gsub("R version ", [18:41:19.159] "", base::R.version$version.string), [18:41:19.159] platform = base::sprintf("%s (%s-bit)", [18:41:19.159] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:19.159] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:19.159] "release", "version")], collapse = " "), [18:41:19.159] hostname = base::Sys.info()[["nodename"]]) [18:41:19.159] info <- base::sprintf("%s: %s", base::names(info), [18:41:19.159] info) [18:41:19.159] info <- base::paste(info, collapse = "; ") [18:41:19.159] if (!has_future) { [18:41:19.159] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:19.159] info) [18:41:19.159] } [18:41:19.159] else { [18:41:19.159] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:19.159] info, version) [18:41:19.159] } [18:41:19.159] base::stop(msg) [18:41:19.159] } [18:41:19.159] }) [18:41:19.159] } [18:41:19.159] base::local({ [18:41:19.159] for (pkg in "listenv") { [18:41:19.159] base::loadNamespace(pkg) [18:41:19.159] base::library(pkg, character.only = TRUE) [18:41:19.159] } [18:41:19.159] }) [18:41:19.159] } [18:41:19.159] ...future.strategy.old <- future::plan("list") [18:41:19.159] options(future.plan = NULL) [18:41:19.159] Sys.unsetenv("R_FUTURE_PLAN") [18:41:19.159] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:19.159] } [18:41:19.159] ...future.workdir <- getwd() [18:41:19.159] } [18:41:19.159] ...future.oldOptions <- base::as.list(base::.Options) [18:41:19.159] ...future.oldEnvVars <- base::Sys.getenv() [18:41:19.159] } [18:41:19.159] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:19.159] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:19.159] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:19.159] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:19.159] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:19.159] future.stdout.windows.reencode = NULL, width = 80L) [18:41:19.159] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:19.159] base::names(...future.oldOptions)) [18:41:19.159] } [18:41:19.159] if (FALSE) { [18:41:19.159] } [18:41:19.159] else { [18:41:19.159] if (TRUE) { [18:41:19.159] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:19.159] open = "w") [18:41:19.159] } [18:41:19.159] else { [18:41:19.159] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:19.159] windows = "NUL", "/dev/null"), open = "w") [18:41:19.159] } [18:41:19.159] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:19.159] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:19.159] base::sink(type = "output", split = FALSE) [18:41:19.159] base::close(...future.stdout) [18:41:19.159] }, add = TRUE) [18:41:19.159] } [18:41:19.159] ...future.frame <- base::sys.nframe() [18:41:19.159] ...future.conditions <- base::list() [18:41:19.159] ...future.rng <- base::globalenv()$.Random.seed [18:41:19.159] if (FALSE) { [18:41:19.159] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:19.159] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:19.159] } [18:41:19.159] ...future.result <- base::tryCatch({ [18:41:19.159] base::withCallingHandlers({ [18:41:19.159] ...future.value <- base::withVisible(base::local({ [18:41:19.159] do.call(function(...) { [18:41:19.159] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:19.159] if (!identical(...future.globals.maxSize.org, [18:41:19.159] ...future.globals.maxSize)) { [18:41:19.159] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:19.159] on.exit(options(oopts), add = TRUE) [18:41:19.159] } [18:41:19.159] { [18:41:19.159] lapply(seq_along(...future.elements_ii), [18:41:19.159] FUN = function(jj) { [18:41:19.159] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:19.159] ...future.FUN(...future.X_jj, ...) [18:41:19.159] }) [18:41:19.159] } [18:41:19.159] }, args = future.call.arguments) [18:41:19.159] })) [18:41:19.159] future::FutureResult(value = ...future.value$value, [18:41:19.159] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:19.159] ...future.rng), globalenv = if (FALSE) [18:41:19.159] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:19.159] ...future.globalenv.names)) [18:41:19.159] else NULL, started = ...future.startTime, version = "1.8") [18:41:19.159] }, condition = base::local({ [18:41:19.159] c <- base::c [18:41:19.159] inherits <- base::inherits [18:41:19.159] invokeRestart <- base::invokeRestart [18:41:19.159] length <- base::length [18:41:19.159] list <- base::list [18:41:19.159] seq.int <- base::seq.int [18:41:19.159] signalCondition <- base::signalCondition [18:41:19.159] sys.calls <- base::sys.calls [18:41:19.159] `[[` <- base::`[[` [18:41:19.159] `+` <- base::`+` [18:41:19.159] `<<-` <- base::`<<-` [18:41:19.159] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:19.159] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:19.159] 3L)] [18:41:19.159] } [18:41:19.159] function(cond) { [18:41:19.159] is_error <- inherits(cond, "error") [18:41:19.159] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:19.159] NULL) [18:41:19.159] if (is_error) { [18:41:19.159] sessionInformation <- function() { [18:41:19.159] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:19.159] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:19.159] search = base::search(), system = base::Sys.info()) [18:41:19.159] } [18:41:19.159] ...future.conditions[[length(...future.conditions) + [18:41:19.159] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:19.159] cond$call), session = sessionInformation(), [18:41:19.159] timestamp = base::Sys.time(), signaled = 0L) [18:41:19.159] signalCondition(cond) [18:41:19.159] } [18:41:19.159] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:19.159] "immediateCondition"))) { [18:41:19.159] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:19.159] ...future.conditions[[length(...future.conditions) + [18:41:19.159] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:19.159] if (TRUE && !signal) { [18:41:19.159] muffleCondition <- function (cond, pattern = "^muffle") [18:41:19.159] { [18:41:19.159] inherits <- base::inherits [18:41:19.159] invokeRestart <- base::invokeRestart [18:41:19.159] is.null <- base::is.null [18:41:19.159] muffled <- FALSE [18:41:19.159] if (inherits(cond, "message")) { [18:41:19.159] muffled <- grepl(pattern, "muffleMessage") [18:41:19.159] if (muffled) [18:41:19.159] invokeRestart("muffleMessage") [18:41:19.159] } [18:41:19.159] else if (inherits(cond, "warning")) { [18:41:19.159] muffled <- grepl(pattern, "muffleWarning") [18:41:19.159] if (muffled) [18:41:19.159] invokeRestart("muffleWarning") [18:41:19.159] } [18:41:19.159] else if (inherits(cond, "condition")) { [18:41:19.159] if (!is.null(pattern)) { [18:41:19.159] computeRestarts <- base::computeRestarts [18:41:19.159] grepl <- base::grepl [18:41:19.159] restarts <- computeRestarts(cond) [18:41:19.159] for (restart in restarts) { [18:41:19.159] name <- restart$name [18:41:19.159] if (is.null(name)) [18:41:19.159] next [18:41:19.159] if (!grepl(pattern, name)) [18:41:19.159] next [18:41:19.159] invokeRestart(restart) [18:41:19.159] muffled <- TRUE [18:41:19.159] break [18:41:19.159] } [18:41:19.159] } [18:41:19.159] } [18:41:19.159] invisible(muffled) [18:41:19.159] } [18:41:19.159] muffleCondition(cond, pattern = "^muffle") [18:41:19.159] } [18:41:19.159] } [18:41:19.159] else { [18:41:19.159] if (TRUE) { [18:41:19.159] muffleCondition <- function (cond, pattern = "^muffle") [18:41:19.159] { [18:41:19.159] inherits <- base::inherits [18:41:19.159] invokeRestart <- base::invokeRestart [18:41:19.159] is.null <- base::is.null [18:41:19.159] muffled <- FALSE [18:41:19.159] if (inherits(cond, "message")) { [18:41:19.159] muffled <- grepl(pattern, "muffleMessage") [18:41:19.159] if (muffled) [18:41:19.159] invokeRestart("muffleMessage") [18:41:19.159] } [18:41:19.159] else if (inherits(cond, "warning")) { [18:41:19.159] muffled <- grepl(pattern, "muffleWarning") [18:41:19.159] if (muffled) [18:41:19.159] invokeRestart("muffleWarning") [18:41:19.159] } [18:41:19.159] else if (inherits(cond, "condition")) { [18:41:19.159] if (!is.null(pattern)) { [18:41:19.159] computeRestarts <- base::computeRestarts [18:41:19.159] grepl <- base::grepl [18:41:19.159] restarts <- computeRestarts(cond) [18:41:19.159] for (restart in restarts) { [18:41:19.159] name <- restart$name [18:41:19.159] if (is.null(name)) [18:41:19.159] next [18:41:19.159] if (!grepl(pattern, name)) [18:41:19.159] next [18:41:19.159] invokeRestart(restart) [18:41:19.159] muffled <- TRUE [18:41:19.159] break [18:41:19.159] } [18:41:19.159] } [18:41:19.159] } [18:41:19.159] invisible(muffled) [18:41:19.159] } [18:41:19.159] muffleCondition(cond, pattern = "^muffle") [18:41:19.159] } [18:41:19.159] } [18:41:19.159] } [18:41:19.159] })) [18:41:19.159] }, error = function(ex) { [18:41:19.159] base::structure(base::list(value = NULL, visible = NULL, [18:41:19.159] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:19.159] ...future.rng), started = ...future.startTime, [18:41:19.159] finished = Sys.time(), session_uuid = NA_character_, [18:41:19.159] version = "1.8"), class = "FutureResult") [18:41:19.159] }, finally = { [18:41:19.159] if (!identical(...future.workdir, getwd())) [18:41:19.159] setwd(...future.workdir) [18:41:19.159] { [18:41:19.159] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:19.159] ...future.oldOptions$nwarnings <- NULL [18:41:19.159] } [18:41:19.159] base::options(...future.oldOptions) [18:41:19.159] if (.Platform$OS.type == "windows") { [18:41:19.159] old_names <- names(...future.oldEnvVars) [18:41:19.159] envs <- base::Sys.getenv() [18:41:19.159] names <- names(envs) [18:41:19.159] common <- intersect(names, old_names) [18:41:19.159] added <- setdiff(names, old_names) [18:41:19.159] removed <- setdiff(old_names, names) [18:41:19.159] changed <- common[...future.oldEnvVars[common] != [18:41:19.159] envs[common]] [18:41:19.159] NAMES <- toupper(changed) [18:41:19.159] args <- list() [18:41:19.159] for (kk in seq_along(NAMES)) { [18:41:19.159] name <- changed[[kk]] [18:41:19.159] NAME <- NAMES[[kk]] [18:41:19.159] if (name != NAME && is.element(NAME, old_names)) [18:41:19.159] next [18:41:19.159] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:19.159] } [18:41:19.159] NAMES <- toupper(added) [18:41:19.159] for (kk in seq_along(NAMES)) { [18:41:19.159] name <- added[[kk]] [18:41:19.159] NAME <- NAMES[[kk]] [18:41:19.159] if (name != NAME && is.element(NAME, old_names)) [18:41:19.159] next [18:41:19.159] args[[name]] <- "" [18:41:19.159] } [18:41:19.159] NAMES <- toupper(removed) [18:41:19.159] for (kk in seq_along(NAMES)) { [18:41:19.159] name <- removed[[kk]] [18:41:19.159] NAME <- NAMES[[kk]] [18:41:19.159] if (name != NAME && is.element(NAME, old_names)) [18:41:19.159] next [18:41:19.159] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:19.159] } [18:41:19.159] if (length(args) > 0) [18:41:19.159] base::do.call(base::Sys.setenv, args = args) [18:41:19.159] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:19.159] } [18:41:19.159] else { [18:41:19.159] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:19.159] } [18:41:19.159] { [18:41:19.159] if (base::length(...future.futureOptionsAdded) > [18:41:19.159] 0L) { [18:41:19.159] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:19.159] base::names(opts) <- ...future.futureOptionsAdded [18:41:19.159] base::options(opts) [18:41:19.159] } [18:41:19.159] { [18:41:19.159] { [18:41:19.159] NULL [18:41:19.159] RNGkind("Mersenne-Twister") [18:41:19.159] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:19.159] inherits = FALSE) [18:41:19.159] } [18:41:19.159] options(future.plan = NULL) [18:41:19.159] if (is.na(NA_character_)) [18:41:19.159] Sys.unsetenv("R_FUTURE_PLAN") [18:41:19.159] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:19.159] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:19.159] .init = FALSE) [18:41:19.159] } [18:41:19.159] } [18:41:19.159] } [18:41:19.159] }) [18:41:19.159] if (TRUE) { [18:41:19.159] base::sink(type = "output", split = FALSE) [18:41:19.159] if (TRUE) { [18:41:19.159] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:19.159] } [18:41:19.159] else { [18:41:19.159] ...future.result["stdout"] <- base::list(NULL) [18:41:19.159] } [18:41:19.159] base::close(...future.stdout) [18:41:19.159] ...future.stdout <- NULL [18:41:19.159] } [18:41:19.159] ...future.result$conditions <- ...future.conditions [18:41:19.159] ...future.result$finished <- base::Sys.time() [18:41:19.159] ...future.result [18:41:19.159] } [18:41:19.163] assign_globals() ... [18:41:19.163] List of 5 [18:41:19.163] $ ...future.FUN :function (x, ...) [18:41:19.163] $ future.call.arguments : list() [18:41:19.163] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:19.163] $ ...future.elements_ii :List of 2 [18:41:19.163] ..$ b:Classes 'listenv', 'environment' [18:41:19.163] ..$ a:Classes 'listenv', 'environment' [18:41:19.163] $ ...future.seeds_ii : NULL [18:41:19.163] $ ...future.globals.maxSize: NULL [18:41:19.163] - attr(*, "where")=List of 5 [18:41:19.163] ..$ ...future.FUN : [18:41:19.163] ..$ future.call.arguments : [18:41:19.163] ..$ ...future.elements_ii : [18:41:19.163] ..$ ...future.seeds_ii : [18:41:19.163] ..$ ...future.globals.maxSize: [18:41:19.163] - attr(*, "resolved")= logi FALSE [18:41:19.163] - attr(*, "total_size")= num 8195 [18:41:19.163] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:19.163] - attr(*, "already-done")= logi TRUE [18:41:19.169] - copied '...future.FUN' to environment [18:41:19.169] - copied 'future.call.arguments' to environment [18:41:19.170] - copied '...future.elements_ii' to environment [18:41:19.170] - copied '...future.seeds_ii' to environment [18:41:19.170] - copied '...future.globals.maxSize' to environment [18:41:19.170] assign_globals() ... done [18:41:19.171] plan(): Setting new future strategy stack: [18:41:19.171] List of future strategies: [18:41:19.171] 1. sequential: [18:41:19.171] - args: function (..., envir = parent.frame(), workers = "") [18:41:19.171] - tweaked: FALSE [18:41:19.171] - call: NULL [18:41:19.172] plan(): nbrOfWorkers() = 1 [18:41:19.173] plan(): Setting new future strategy stack: [18:41:19.173] List of future strategies: [18:41:19.173] 1. multisession: [18:41:19.173] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:41:19.173] - tweaked: FALSE [18:41:19.173] - call: plan(strategy) [18:41:19.175] plan(): nbrOfWorkers() = 1 [18:41:19.176] SequentialFuture started (and completed) [18:41:19.176] - Launch lazy future ... done [18:41:19.176] run() for 'SequentialFuture' ... done [18:41:19.176] Created future: [18:41:19.176] SequentialFuture: [18:41:19.176] Label: 'future_lapply-1' [18:41:19.176] Expression: [18:41:19.176] { [18:41:19.176] do.call(function(...) { [18:41:19.176] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:19.176] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:19.176] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:19.176] on.exit(options(oopts), add = TRUE) [18:41:19.176] } [18:41:19.176] { [18:41:19.176] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:19.176] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:19.176] ...future.FUN(...future.X_jj, ...) [18:41:19.176] }) [18:41:19.176] } [18:41:19.176] }, args = future.call.arguments) [18:41:19.176] } [18:41:19.176] Lazy evaluation: FALSE [18:41:19.176] Asynchronous evaluation: FALSE [18:41:19.176] Local evaluation: TRUE [18:41:19.176] Environment: R_GlobalEnv [18:41:19.176] Capture standard output: TRUE [18:41:19.176] Capture condition classes: 'condition' (excluding 'nothing') [18:41:19.176] Globals: 5 objects totaling 4.14 KiB (function '...future.FUN' of 911 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 3.10 KiB, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:19.176] Packages: 1 packages ('listenv') [18:41:19.176] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:19.176] Resolved: TRUE [18:41:19.176] Value: 154 bytes of class 'list' [18:41:19.176] Early signaling: FALSE [18:41:19.176] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:19.176] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:19.178] Chunk #1 of 1 ... DONE [18:41:19.178] Launching 1 futures (chunks) ... DONE [18:41:19.178] Resolving 1 futures (chunks) ... [18:41:19.178] resolve() on list ... [18:41:19.178] recursive: 0 [18:41:19.178] length: 1 [18:41:19.179] [18:41:19.179] resolved() for 'SequentialFuture' ... [18:41:19.179] - state: 'finished' [18:41:19.179] - run: TRUE [18:41:19.179] - result: 'FutureResult' [18:41:19.179] resolved() for 'SequentialFuture' ... done [18:41:19.180] Future #1 [18:41:19.180] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:19.180] - nx: 1 [18:41:19.180] - relay: TRUE [18:41:19.180] - stdout: TRUE [18:41:19.180] - signal: TRUE [18:41:19.181] - resignal: FALSE [18:41:19.181] - force: TRUE [18:41:19.181] - relayed: [n=1] FALSE [18:41:19.181] - queued futures: [n=1] FALSE [18:41:19.181] - until=1 [18:41:19.181] - relaying element #1 [18:41:19.182] - relayed: [n=1] TRUE [18:41:19.182] - queued futures: [n=1] TRUE [18:41:19.182] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:19.182] length: 0 (resolved future 1) [18:41:19.182] Relaying remaining futures [18:41:19.182] signalConditionsASAP(NULL, pos=0) ... [18:41:19.183] - nx: 1 [18:41:19.183] - relay: TRUE [18:41:19.183] - stdout: TRUE [18:41:19.183] - signal: TRUE [18:41:19.183] - resignal: FALSE [18:41:19.183] - force: TRUE [18:41:19.183] - relayed: [n=1] TRUE [18:41:19.184] - queued futures: [n=1] TRUE - flush all [18:41:19.184] - relayed: [n=1] TRUE [18:41:19.184] - queued futures: [n=1] TRUE [18:41:19.184] signalConditionsASAP(NULL, pos=0) ... done [18:41:19.184] resolve() on list ... DONE [18:41:19.185] - Number of value chunks collected: 1 [18:41:19.185] Resolving 1 futures (chunks) ... DONE [18:41:19.185] Reducing values from 1 chunks ... [18:41:19.185] - Number of values collected after concatenation: 2 [18:41:19.185] - Number of values expected: 2 [18:41:19.185] Reverse index remapping (attribute 'ordering'): [n = 2] 2, 1 [18:41:19.186] Reducing values from 1 chunks ... DONE [18:41:19.186] future_lapply() ... DONE List of 1 $ y:List of 2 ..$ a: Named chr "A" .. ..- attr(*, "names")= chr "A" ..$ b: Named chr [1:2] "A" "B" .. ..- attr(*, "names")= chr [1:2] "A" "B" - future_lapply(x, FUN = vector, ...) ... [18:41:19.190] future_lapply() ... [18:41:19.193] Number of chunks: 1 [18:41:19.193] Index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [18:41:19.193] getGlobalsAndPackagesXApply() ... [18:41:19.193] - future.globals: TRUE [18:41:19.193] getGlobalsAndPackages() ... [18:41:19.194] Searching for globals... [18:41:19.195] - globals found: [2] 'FUN', '.Internal' [18:41:19.195] Searching for globals ... DONE [18:41:19.195] Resolving globals: FALSE [18:41:19.196] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:19.196] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:19.196] - globals: [1] 'FUN' [18:41:19.197] [18:41:19.197] getGlobalsAndPackages() ... DONE [18:41:19.197] - globals found/used: [n=1] 'FUN' [18:41:19.197] - needed namespaces: [n=0] [18:41:19.197] Finding globals ... DONE [18:41:19.197] - use_args: TRUE [18:41:19.198] - Getting '...' globals ... [18:41:19.198] resolve() on list ... [18:41:19.198] recursive: 0 [18:41:19.198] length: 1 [18:41:19.198] elements: '...' [18:41:19.199] length: 0 (resolved future 1) [18:41:19.199] resolve() on list ... DONE [18:41:19.199] - '...' content: [n=1] 'length' [18:41:19.199] List of 1 [18:41:19.199] $ ...:List of 1 [18:41:19.199] ..$ length: int 2 [18:41:19.199] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:19.199] - attr(*, "where")=List of 1 [18:41:19.199] ..$ ...: [18:41:19.199] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:19.199] - attr(*, "resolved")= logi TRUE [18:41:19.199] - attr(*, "total_size")= num NA [18:41:19.202] - Getting '...' globals ... DONE [18:41:19.203] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:19.203] List of 2 [18:41:19.203] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:19.203] $ ... :List of 1 [18:41:19.203] ..$ length: int 2 [18:41:19.203] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:19.203] - attr(*, "where")=List of 2 [18:41:19.203] ..$ ...future.FUN: [18:41:19.203] ..$ ... : [18:41:19.203] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:19.203] - attr(*, "resolved")= logi FALSE [18:41:19.203] - attr(*, "total_size")= int 4763 [18:41:19.206] Packages to be attached in all futures: [n=0] [18:41:19.207] getGlobalsAndPackagesXApply() ... DONE [18:41:19.207] Number of futures (= number of chunks): 1 [18:41:19.207] Launching 1 futures (chunks) ... [18:41:19.207] Chunk #1 of 1 ... [18:41:19.207] - Finding globals in 'X' for chunk #1 ... [18:41:19.208] getGlobalsAndPackages() ... [18:41:19.208] Searching for globals... [18:41:19.208] [18:41:19.208] Searching for globals ... DONE [18:41:19.208] - globals: [0] [18:41:19.209] getGlobalsAndPackages() ... DONE [18:41:19.209] + additional globals found: [n=0] [18:41:19.209] + additional namespaces needed: [n=0] [18:41:19.209] - Finding globals in 'X' for chunk #1 ... DONE [18:41:19.209] - seeds: [18:41:19.209] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.210] getGlobalsAndPackages() ... [18:41:19.210] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.210] Resolving globals: FALSE [18:41:19.210] Tweak future expression to call with '...' arguments ... [18:41:19.210] { [18:41:19.210] do.call(function(...) { [18:41:19.210] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:19.210] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:19.210] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:19.210] on.exit(options(oopts), add = TRUE) [18:41:19.210] } [18:41:19.210] { [18:41:19.210] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:19.210] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:19.210] ...future.FUN(...future.X_jj, ...) [18:41:19.210] }) [18:41:19.210] } [18:41:19.210] }, args = future.call.arguments) [18:41:19.210] } [18:41:19.211] Tweak future expression to call with '...' arguments ... DONE [18:41:19.211] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.211] [18:41:19.211] getGlobalsAndPackages() ... DONE [18:41:19.212] run() for 'Future' ... [18:41:19.212] - state: 'created' [18:41:19.212] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:19.215] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:19.215] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:19.215] - Field: 'label' [18:41:19.215] - Field: 'local' [18:41:19.215] - Field: 'owner' [18:41:19.215] - Field: 'envir' [18:41:19.216] - Field: 'packages' [18:41:19.216] - Field: 'gc' [18:41:19.216] - Field: 'conditions' [18:41:19.216] - Field: 'expr' [18:41:19.216] - Field: 'uuid' [18:41:19.216] - Field: 'seed' [18:41:19.217] - Field: 'version' [18:41:19.217] - Field: 'result' [18:41:19.217] - Field: 'asynchronous' [18:41:19.217] - Field: 'calls' [18:41:19.217] - Field: 'globals' [18:41:19.217] - Field: 'stdout' [18:41:19.218] - Field: 'earlySignal' [18:41:19.218] - Field: 'lazy' [18:41:19.218] - Field: 'state' [18:41:19.218] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:19.218] - Launch lazy future ... [18:41:19.219] Packages needed by the future expression (n = 0): [18:41:19.219] Packages needed by future strategies (n = 0): [18:41:19.219] { [18:41:19.219] { [18:41:19.219] { [18:41:19.219] ...future.startTime <- base::Sys.time() [18:41:19.219] { [18:41:19.219] { [18:41:19.219] { [18:41:19.219] base::local({ [18:41:19.219] has_future <- base::requireNamespace("future", [18:41:19.219] quietly = TRUE) [18:41:19.219] if (has_future) { [18:41:19.219] ns <- base::getNamespace("future") [18:41:19.219] version <- ns[[".package"]][["version"]] [18:41:19.219] if (is.null(version)) [18:41:19.219] version <- utils::packageVersion("future") [18:41:19.219] } [18:41:19.219] else { [18:41:19.219] version <- NULL [18:41:19.219] } [18:41:19.219] if (!has_future || version < "1.8.0") { [18:41:19.219] info <- base::c(r_version = base::gsub("R version ", [18:41:19.219] "", base::R.version$version.string), [18:41:19.219] platform = base::sprintf("%s (%s-bit)", [18:41:19.219] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:19.219] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:19.219] "release", "version")], collapse = " "), [18:41:19.219] hostname = base::Sys.info()[["nodename"]]) [18:41:19.219] info <- base::sprintf("%s: %s", base::names(info), [18:41:19.219] info) [18:41:19.219] info <- base::paste(info, collapse = "; ") [18:41:19.219] if (!has_future) { [18:41:19.219] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:19.219] info) [18:41:19.219] } [18:41:19.219] else { [18:41:19.219] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:19.219] info, version) [18:41:19.219] } [18:41:19.219] base::stop(msg) [18:41:19.219] } [18:41:19.219] }) [18:41:19.219] } [18:41:19.219] ...future.strategy.old <- future::plan("list") [18:41:19.219] options(future.plan = NULL) [18:41:19.219] Sys.unsetenv("R_FUTURE_PLAN") [18:41:19.219] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:19.219] } [18:41:19.219] ...future.workdir <- getwd() [18:41:19.219] } [18:41:19.219] ...future.oldOptions <- base::as.list(base::.Options) [18:41:19.219] ...future.oldEnvVars <- base::Sys.getenv() [18:41:19.219] } [18:41:19.219] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:19.219] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:19.219] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:19.219] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:19.219] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:19.219] future.stdout.windows.reencode = NULL, width = 80L) [18:41:19.219] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:19.219] base::names(...future.oldOptions)) [18:41:19.219] } [18:41:19.219] if (FALSE) { [18:41:19.219] } [18:41:19.219] else { [18:41:19.219] if (TRUE) { [18:41:19.219] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:19.219] open = "w") [18:41:19.219] } [18:41:19.219] else { [18:41:19.219] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:19.219] windows = "NUL", "/dev/null"), open = "w") [18:41:19.219] } [18:41:19.219] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:19.219] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:19.219] base::sink(type = "output", split = FALSE) [18:41:19.219] base::close(...future.stdout) [18:41:19.219] }, add = TRUE) [18:41:19.219] } [18:41:19.219] ...future.frame <- base::sys.nframe() [18:41:19.219] ...future.conditions <- base::list() [18:41:19.219] ...future.rng <- base::globalenv()$.Random.seed [18:41:19.219] if (FALSE) { [18:41:19.219] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:19.219] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:19.219] } [18:41:19.219] ...future.result <- base::tryCatch({ [18:41:19.219] base::withCallingHandlers({ [18:41:19.219] ...future.value <- base::withVisible(base::local({ [18:41:19.219] do.call(function(...) { [18:41:19.219] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:19.219] if (!identical(...future.globals.maxSize.org, [18:41:19.219] ...future.globals.maxSize)) { [18:41:19.219] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:19.219] on.exit(options(oopts), add = TRUE) [18:41:19.219] } [18:41:19.219] { [18:41:19.219] lapply(seq_along(...future.elements_ii), [18:41:19.219] FUN = function(jj) { [18:41:19.219] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:19.219] ...future.FUN(...future.X_jj, ...) [18:41:19.219] }) [18:41:19.219] } [18:41:19.219] }, args = future.call.arguments) [18:41:19.219] })) [18:41:19.219] future::FutureResult(value = ...future.value$value, [18:41:19.219] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:19.219] ...future.rng), globalenv = if (FALSE) [18:41:19.219] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:19.219] ...future.globalenv.names)) [18:41:19.219] else NULL, started = ...future.startTime, version = "1.8") [18:41:19.219] }, condition = base::local({ [18:41:19.219] c <- base::c [18:41:19.219] inherits <- base::inherits [18:41:19.219] invokeRestart <- base::invokeRestart [18:41:19.219] length <- base::length [18:41:19.219] list <- base::list [18:41:19.219] seq.int <- base::seq.int [18:41:19.219] signalCondition <- base::signalCondition [18:41:19.219] sys.calls <- base::sys.calls [18:41:19.219] `[[` <- base::`[[` [18:41:19.219] `+` <- base::`+` [18:41:19.219] `<<-` <- base::`<<-` [18:41:19.219] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:19.219] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:19.219] 3L)] [18:41:19.219] } [18:41:19.219] function(cond) { [18:41:19.219] is_error <- inherits(cond, "error") [18:41:19.219] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:19.219] NULL) [18:41:19.219] if (is_error) { [18:41:19.219] sessionInformation <- function() { [18:41:19.219] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:19.219] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:19.219] search = base::search(), system = base::Sys.info()) [18:41:19.219] } [18:41:19.219] ...future.conditions[[length(...future.conditions) + [18:41:19.219] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:19.219] cond$call), session = sessionInformation(), [18:41:19.219] timestamp = base::Sys.time(), signaled = 0L) [18:41:19.219] signalCondition(cond) [18:41:19.219] } [18:41:19.219] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:19.219] "immediateCondition"))) { [18:41:19.219] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:19.219] ...future.conditions[[length(...future.conditions) + [18:41:19.219] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:19.219] if (TRUE && !signal) { [18:41:19.219] muffleCondition <- function (cond, pattern = "^muffle") [18:41:19.219] { [18:41:19.219] inherits <- base::inherits [18:41:19.219] invokeRestart <- base::invokeRestart [18:41:19.219] is.null <- base::is.null [18:41:19.219] muffled <- FALSE [18:41:19.219] if (inherits(cond, "message")) { [18:41:19.219] muffled <- grepl(pattern, "muffleMessage") [18:41:19.219] if (muffled) [18:41:19.219] invokeRestart("muffleMessage") [18:41:19.219] } [18:41:19.219] else if (inherits(cond, "warning")) { [18:41:19.219] muffled <- grepl(pattern, "muffleWarning") [18:41:19.219] if (muffled) [18:41:19.219] invokeRestart("muffleWarning") [18:41:19.219] } [18:41:19.219] else if (inherits(cond, "condition")) { [18:41:19.219] if (!is.null(pattern)) { [18:41:19.219] computeRestarts <- base::computeRestarts [18:41:19.219] grepl <- base::grepl [18:41:19.219] restarts <- computeRestarts(cond) [18:41:19.219] for (restart in restarts) { [18:41:19.219] name <- restart$name [18:41:19.219] if (is.null(name)) [18:41:19.219] next [18:41:19.219] if (!grepl(pattern, name)) [18:41:19.219] next [18:41:19.219] invokeRestart(restart) [18:41:19.219] muffled <- TRUE [18:41:19.219] break [18:41:19.219] } [18:41:19.219] } [18:41:19.219] } [18:41:19.219] invisible(muffled) [18:41:19.219] } [18:41:19.219] muffleCondition(cond, pattern = "^muffle") [18:41:19.219] } [18:41:19.219] } [18:41:19.219] else { [18:41:19.219] if (TRUE) { [18:41:19.219] muffleCondition <- function (cond, pattern = "^muffle") [18:41:19.219] { [18:41:19.219] inherits <- base::inherits [18:41:19.219] invokeRestart <- base::invokeRestart [18:41:19.219] is.null <- base::is.null [18:41:19.219] muffled <- FALSE [18:41:19.219] if (inherits(cond, "message")) { [18:41:19.219] muffled <- grepl(pattern, "muffleMessage") [18:41:19.219] if (muffled) [18:41:19.219] invokeRestart("muffleMessage") [18:41:19.219] } [18:41:19.219] else if (inherits(cond, "warning")) { [18:41:19.219] muffled <- grepl(pattern, "muffleWarning") [18:41:19.219] if (muffled) [18:41:19.219] invokeRestart("muffleWarning") [18:41:19.219] } [18:41:19.219] else if (inherits(cond, "condition")) { [18:41:19.219] if (!is.null(pattern)) { [18:41:19.219] computeRestarts <- base::computeRestarts [18:41:19.219] grepl <- base::grepl [18:41:19.219] restarts <- computeRestarts(cond) [18:41:19.219] for (restart in restarts) { [18:41:19.219] name <- restart$name [18:41:19.219] if (is.null(name)) [18:41:19.219] next [18:41:19.219] if (!grepl(pattern, name)) [18:41:19.219] next [18:41:19.219] invokeRestart(restart) [18:41:19.219] muffled <- TRUE [18:41:19.219] break [18:41:19.219] } [18:41:19.219] } [18:41:19.219] } [18:41:19.219] invisible(muffled) [18:41:19.219] } [18:41:19.219] muffleCondition(cond, pattern = "^muffle") [18:41:19.219] } [18:41:19.219] } [18:41:19.219] } [18:41:19.219] })) [18:41:19.219] }, error = function(ex) { [18:41:19.219] base::structure(base::list(value = NULL, visible = NULL, [18:41:19.219] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:19.219] ...future.rng), started = ...future.startTime, [18:41:19.219] finished = Sys.time(), session_uuid = NA_character_, [18:41:19.219] version = "1.8"), class = "FutureResult") [18:41:19.219] }, finally = { [18:41:19.219] if (!identical(...future.workdir, getwd())) [18:41:19.219] setwd(...future.workdir) [18:41:19.219] { [18:41:19.219] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:19.219] ...future.oldOptions$nwarnings <- NULL [18:41:19.219] } [18:41:19.219] base::options(...future.oldOptions) [18:41:19.219] if (.Platform$OS.type == "windows") { [18:41:19.219] old_names <- names(...future.oldEnvVars) [18:41:19.219] envs <- base::Sys.getenv() [18:41:19.219] names <- names(envs) [18:41:19.219] common <- intersect(names, old_names) [18:41:19.219] added <- setdiff(names, old_names) [18:41:19.219] removed <- setdiff(old_names, names) [18:41:19.219] changed <- common[...future.oldEnvVars[common] != [18:41:19.219] envs[common]] [18:41:19.219] NAMES <- toupper(changed) [18:41:19.219] args <- list() [18:41:19.219] for (kk in seq_along(NAMES)) { [18:41:19.219] name <- changed[[kk]] [18:41:19.219] NAME <- NAMES[[kk]] [18:41:19.219] if (name != NAME && is.element(NAME, old_names)) [18:41:19.219] next [18:41:19.219] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:19.219] } [18:41:19.219] NAMES <- toupper(added) [18:41:19.219] for (kk in seq_along(NAMES)) { [18:41:19.219] name <- added[[kk]] [18:41:19.219] NAME <- NAMES[[kk]] [18:41:19.219] if (name != NAME && is.element(NAME, old_names)) [18:41:19.219] next [18:41:19.219] args[[name]] <- "" [18:41:19.219] } [18:41:19.219] NAMES <- toupper(removed) [18:41:19.219] for (kk in seq_along(NAMES)) { [18:41:19.219] name <- removed[[kk]] [18:41:19.219] NAME <- NAMES[[kk]] [18:41:19.219] if (name != NAME && is.element(NAME, old_names)) [18:41:19.219] next [18:41:19.219] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:19.219] } [18:41:19.219] if (length(args) > 0) [18:41:19.219] base::do.call(base::Sys.setenv, args = args) [18:41:19.219] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:19.219] } [18:41:19.219] else { [18:41:19.219] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:19.219] } [18:41:19.219] { [18:41:19.219] if (base::length(...future.futureOptionsAdded) > [18:41:19.219] 0L) { [18:41:19.219] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:19.219] base::names(opts) <- ...future.futureOptionsAdded [18:41:19.219] base::options(opts) [18:41:19.219] } [18:41:19.219] { [18:41:19.219] { [18:41:19.219] NULL [18:41:19.219] RNGkind("Mersenne-Twister") [18:41:19.219] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:19.219] inherits = FALSE) [18:41:19.219] } [18:41:19.219] options(future.plan = NULL) [18:41:19.219] if (is.na(NA_character_)) [18:41:19.219] Sys.unsetenv("R_FUTURE_PLAN") [18:41:19.219] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:19.219] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:19.219] .init = FALSE) [18:41:19.219] } [18:41:19.219] } [18:41:19.219] } [18:41:19.219] }) [18:41:19.219] if (TRUE) { [18:41:19.219] base::sink(type = "output", split = FALSE) [18:41:19.219] if (TRUE) { [18:41:19.219] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:19.219] } [18:41:19.219] else { [18:41:19.219] ...future.result["stdout"] <- base::list(NULL) [18:41:19.219] } [18:41:19.219] base::close(...future.stdout) [18:41:19.219] ...future.stdout <- NULL [18:41:19.219] } [18:41:19.219] ...future.result$conditions <- ...future.conditions [18:41:19.219] ...future.result$finished <- base::Sys.time() [18:41:19.219] ...future.result [18:41:19.219] } [18:41:19.223] assign_globals() ... [18:41:19.223] List of 5 [18:41:19.223] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:19.223] $ future.call.arguments :List of 1 [18:41:19.223] ..$ length: int 2 [18:41:19.223] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:19.223] $ ...future.elements_ii :List of 4 [18:41:19.223] ..$ c: chr "list" [18:41:19.223] ..$ c: chr "character" [18:41:19.223] ..$ b: chr "numeric" [18:41:19.223] ..$ a: chr "integer" [18:41:19.223] $ ...future.seeds_ii : NULL [18:41:19.223] $ ...future.globals.maxSize: NULL [18:41:19.223] - attr(*, "where")=List of 5 [18:41:19.223] ..$ ...future.FUN : [18:41:19.223] ..$ future.call.arguments : [18:41:19.223] ..$ ...future.elements_ii : [18:41:19.223] ..$ ...future.seeds_ii : [18:41:19.223] ..$ ...future.globals.maxSize: [18:41:19.223] - attr(*, "resolved")= logi FALSE [18:41:19.223] - attr(*, "total_size")= num 4763 [18:41:19.223] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:19.223] - attr(*, "already-done")= logi TRUE [18:41:19.230] - copied '...future.FUN' to environment [18:41:19.230] - copied 'future.call.arguments' to environment [18:41:19.231] - copied '...future.elements_ii' to environment [18:41:19.231] - copied '...future.seeds_ii' to environment [18:41:19.231] - copied '...future.globals.maxSize' to environment [18:41:19.231] assign_globals() ... done [18:41:19.231] plan(): Setting new future strategy stack: [18:41:19.232] List of future strategies: [18:41:19.232] 1. sequential: [18:41:19.232] - args: function (..., envir = parent.frame(), workers = "") [18:41:19.232] - tweaked: FALSE [18:41:19.232] - call: NULL [18:41:19.232] plan(): nbrOfWorkers() = 1 [18:41:19.233] plan(): Setting new future strategy stack: [18:41:19.234] List of future strategies: [18:41:19.234] 1. multisession: [18:41:19.234] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:41:19.234] - tweaked: FALSE [18:41:19.234] - call: plan(strategy) [18:41:19.236] plan(): nbrOfWorkers() = 1 [18:41:19.236] SequentialFuture started (and completed) [18:41:19.237] - Launch lazy future ... done [18:41:19.237] run() for 'SequentialFuture' ... done [18:41:19.237] Created future: [18:41:19.237] SequentialFuture: [18:41:19.237] Label: 'future_lapply-1' [18:41:19.237] Expression: [18:41:19.237] { [18:41:19.237] do.call(function(...) { [18:41:19.237] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:19.237] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:19.237] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:19.237] on.exit(options(oopts), add = TRUE) [18:41:19.237] } [18:41:19.237] { [18:41:19.237] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:19.237] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:19.237] ...future.FUN(...future.X_jj, ...) [18:41:19.237] }) [18:41:19.237] } [18:41:19.237] }, args = future.call.arguments) [18:41:19.237] } [18:41:19.237] Lazy evaluation: FALSE [18:41:19.237] Asynchronous evaluation: FALSE [18:41:19.237] Local evaluation: TRUE [18:41:19.237] Environment: R_GlobalEnv [18:41:19.237] Capture standard output: TRUE [18:41:19.237] Capture condition classes: 'condition' (excluding 'nothing') [18:41:19.237] Globals: 5 objects totaling 853 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 191 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:19.237] Packages: [18:41:19.237] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:19.237] Resolved: TRUE [18:41:19.237] Value: 111 bytes of class 'list' [18:41:19.237] Early signaling: FALSE [18:41:19.237] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:19.237] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:19.238] Chunk #1 of 1 ... DONE [18:41:19.238] Launching 1 futures (chunks) ... DONE [18:41:19.239] Resolving 1 futures (chunks) ... [18:41:19.239] resolve() on list ... [18:41:19.239] recursive: 0 [18:41:19.239] length: 1 [18:41:19.239] [18:41:19.239] resolved() for 'SequentialFuture' ... [18:41:19.240] - state: 'finished' [18:41:19.240] - run: TRUE [18:41:19.240] - result: 'FutureResult' [18:41:19.240] resolved() for 'SequentialFuture' ... done [18:41:19.240] Future #1 [18:41:19.241] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:19.241] - nx: 1 [18:41:19.241] - relay: TRUE [18:41:19.241] - stdout: TRUE [18:41:19.241] - signal: TRUE [18:41:19.241] - resignal: FALSE [18:41:19.241] - force: TRUE [18:41:19.242] - relayed: [n=1] FALSE [18:41:19.242] - queued futures: [n=1] FALSE [18:41:19.242] - until=1 [18:41:19.242] - relaying element #1 [18:41:19.242] - relayed: [n=1] TRUE [18:41:19.242] - queued futures: [n=1] TRUE [18:41:19.243] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:19.243] length: 0 (resolved future 1) [18:41:19.243] Relaying remaining futures [18:41:19.243] signalConditionsASAP(NULL, pos=0) ... [18:41:19.243] - nx: 1 [18:41:19.243] - relay: TRUE [18:41:19.244] - stdout: TRUE [18:41:19.244] - signal: TRUE [18:41:19.244] - resignal: FALSE [18:41:19.244] - force: TRUE [18:41:19.244] - relayed: [n=1] TRUE [18:41:19.244] - queued futures: [n=1] TRUE - flush all [18:41:19.245] - relayed: [n=1] TRUE [18:41:19.245] - queued futures: [n=1] TRUE [18:41:19.245] signalConditionsASAP(NULL, pos=0) ... done [18:41:19.245] resolve() on list ... DONE [18:41:19.245] - Number of value chunks collected: 1 [18:41:19.245] Resolving 1 futures (chunks) ... DONE [18:41:19.246] Reducing values from 1 chunks ... [18:41:19.246] - Number of values collected after concatenation: 4 [18:41:19.246] - Number of values expected: 4 [18:41:19.246] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [18:41:19.246] Reducing values from 1 chunks ... DONE [18:41:19.246] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL [18:41:19.249] future_lapply() ... [18:41:19.252] Number of chunks: 1 [18:41:19.252] Index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [18:41:19.252] getGlobalsAndPackagesXApply() ... [18:41:19.252] - future.globals: TRUE [18:41:19.252] getGlobalsAndPackages() ... [18:41:19.252] Searching for globals... [18:41:19.254] - globals found: [2] 'FUN', '.Internal' [18:41:19.254] Searching for globals ... DONE [18:41:19.254] Resolving globals: FALSE [18:41:19.255] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:19.255] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:19.255] - globals: [1] 'FUN' [18:41:19.255] [18:41:19.255] getGlobalsAndPackages() ... DONE [18:41:19.256] - globals found/used: [n=1] 'FUN' [18:41:19.256] - needed namespaces: [n=0] [18:41:19.256] Finding globals ... DONE [18:41:19.256] - use_args: TRUE [18:41:19.256] - Getting '...' globals ... [18:41:19.257] resolve() on list ... [18:41:19.257] recursive: 0 [18:41:19.257] length: 1 [18:41:19.257] elements: '...' [18:41:19.257] length: 0 (resolved future 1) [18:41:19.258] resolve() on list ... DONE [18:41:19.258] - '...' content: [n=1] 'length' [18:41:19.258] List of 1 [18:41:19.258] $ ...:List of 1 [18:41:19.258] ..$ length: int 2 [18:41:19.258] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:19.258] - attr(*, "where")=List of 1 [18:41:19.258] ..$ ...: [18:41:19.258] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:19.258] - attr(*, "resolved")= logi TRUE [18:41:19.258] - attr(*, "total_size")= num NA [18:41:19.261] - Getting '...' globals ... DONE [18:41:19.261] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:19.262] List of 2 [18:41:19.262] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:19.262] $ ... :List of 1 [18:41:19.262] ..$ length: int 2 [18:41:19.262] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:19.262] - attr(*, "where")=List of 2 [18:41:19.262] ..$ ...future.FUN: [18:41:19.262] ..$ ... : [18:41:19.262] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:19.262] - attr(*, "resolved")= logi FALSE [18:41:19.262] - attr(*, "total_size")= int 4799 [18:41:19.265] Packages to be attached in all futures: [n=0] [18:41:19.265] getGlobalsAndPackagesXApply() ... DONE [18:41:19.266] Number of futures (= number of chunks): 1 [18:41:19.266] Launching 1 futures (chunks) ... [18:41:19.266] Chunk #1 of 1 ... [18:41:19.266] - Finding globals in 'X' for chunk #1 ... [18:41:19.266] getGlobalsAndPackages() ... [18:41:19.267] Searching for globals... [18:41:19.267] [18:41:19.267] Searching for globals ... DONE [18:41:19.267] - globals: [0] [18:41:19.267] getGlobalsAndPackages() ... DONE [18:41:19.267] + additional globals found: [n=0] [18:41:19.268] + additional namespaces needed: [n=0] [18:41:19.268] - Finding globals in 'X' for chunk #1 ... DONE [18:41:19.268] - seeds: [18:41:19.268] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.268] getGlobalsAndPackages() ... [18:41:19.268] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.269] Resolving globals: FALSE [18:41:19.269] Tweak future expression to call with '...' arguments ... [18:41:19.269] { [18:41:19.269] do.call(function(...) { [18:41:19.269] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:19.269] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:19.269] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:19.269] on.exit(options(oopts), add = TRUE) [18:41:19.269] } [18:41:19.269] { [18:41:19.269] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:19.269] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:19.269] ...future.FUN(...future.X_jj, ...) [18:41:19.269] }) [18:41:19.269] } [18:41:19.269] }, args = future.call.arguments) [18:41:19.269] } [18:41:19.269] Tweak future expression to call with '...' arguments ... DONE [18:41:19.270] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.270] [18:41:19.270] getGlobalsAndPackages() ... DONE [18:41:19.271] run() for 'Future' ... [18:41:19.271] - state: 'created' [18:41:19.271] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:19.273] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:19.273] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:19.274] - Field: 'label' [18:41:19.274] - Field: 'local' [18:41:19.274] - Field: 'owner' [18:41:19.274] - Field: 'envir' [18:41:19.274] - Field: 'packages' [18:41:19.275] - Field: 'gc' [18:41:19.275] - Field: 'conditions' [18:41:19.275] - Field: 'expr' [18:41:19.275] - Field: 'uuid' [18:41:19.275] - Field: 'seed' [18:41:19.275] - Field: 'version' [18:41:19.276] - Field: 'result' [18:41:19.276] - Field: 'asynchronous' [18:41:19.276] - Field: 'calls' [18:41:19.276] - Field: 'globals' [18:41:19.276] - Field: 'stdout' [18:41:19.276] - Field: 'earlySignal' [18:41:19.277] - Field: 'lazy' [18:41:19.277] - Field: 'state' [18:41:19.277] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:19.277] - Launch lazy future ... [18:41:19.277] Packages needed by the future expression (n = 0): [18:41:19.277] Packages needed by future strategies (n = 0): [18:41:19.278] { [18:41:19.278] { [18:41:19.278] { [18:41:19.278] ...future.startTime <- base::Sys.time() [18:41:19.278] { [18:41:19.278] { [18:41:19.278] { [18:41:19.278] base::local({ [18:41:19.278] has_future <- base::requireNamespace("future", [18:41:19.278] quietly = TRUE) [18:41:19.278] if (has_future) { [18:41:19.278] ns <- base::getNamespace("future") [18:41:19.278] version <- ns[[".package"]][["version"]] [18:41:19.278] if (is.null(version)) [18:41:19.278] version <- utils::packageVersion("future") [18:41:19.278] } [18:41:19.278] else { [18:41:19.278] version <- NULL [18:41:19.278] } [18:41:19.278] if (!has_future || version < "1.8.0") { [18:41:19.278] info <- base::c(r_version = base::gsub("R version ", [18:41:19.278] "", base::R.version$version.string), [18:41:19.278] platform = base::sprintf("%s (%s-bit)", [18:41:19.278] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:19.278] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:19.278] "release", "version")], collapse = " "), [18:41:19.278] hostname = base::Sys.info()[["nodename"]]) [18:41:19.278] info <- base::sprintf("%s: %s", base::names(info), [18:41:19.278] info) [18:41:19.278] info <- base::paste(info, collapse = "; ") [18:41:19.278] if (!has_future) { [18:41:19.278] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:19.278] info) [18:41:19.278] } [18:41:19.278] else { [18:41:19.278] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:19.278] info, version) [18:41:19.278] } [18:41:19.278] base::stop(msg) [18:41:19.278] } [18:41:19.278] }) [18:41:19.278] } [18:41:19.278] ...future.strategy.old <- future::plan("list") [18:41:19.278] options(future.plan = NULL) [18:41:19.278] Sys.unsetenv("R_FUTURE_PLAN") [18:41:19.278] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:19.278] } [18:41:19.278] ...future.workdir <- getwd() [18:41:19.278] } [18:41:19.278] ...future.oldOptions <- base::as.list(base::.Options) [18:41:19.278] ...future.oldEnvVars <- base::Sys.getenv() [18:41:19.278] } [18:41:19.278] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:19.278] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:19.278] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:19.278] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:19.278] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:19.278] future.stdout.windows.reencode = NULL, width = 80L) [18:41:19.278] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:19.278] base::names(...future.oldOptions)) [18:41:19.278] } [18:41:19.278] if (FALSE) { [18:41:19.278] } [18:41:19.278] else { [18:41:19.278] if (TRUE) { [18:41:19.278] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:19.278] open = "w") [18:41:19.278] } [18:41:19.278] else { [18:41:19.278] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:19.278] windows = "NUL", "/dev/null"), open = "w") [18:41:19.278] } [18:41:19.278] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:19.278] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:19.278] base::sink(type = "output", split = FALSE) [18:41:19.278] base::close(...future.stdout) [18:41:19.278] }, add = TRUE) [18:41:19.278] } [18:41:19.278] ...future.frame <- base::sys.nframe() [18:41:19.278] ...future.conditions <- base::list() [18:41:19.278] ...future.rng <- base::globalenv()$.Random.seed [18:41:19.278] if (FALSE) { [18:41:19.278] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:19.278] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:19.278] } [18:41:19.278] ...future.result <- base::tryCatch({ [18:41:19.278] base::withCallingHandlers({ [18:41:19.278] ...future.value <- base::withVisible(base::local({ [18:41:19.278] do.call(function(...) { [18:41:19.278] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:19.278] if (!identical(...future.globals.maxSize.org, [18:41:19.278] ...future.globals.maxSize)) { [18:41:19.278] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:19.278] on.exit(options(oopts), add = TRUE) [18:41:19.278] } [18:41:19.278] { [18:41:19.278] lapply(seq_along(...future.elements_ii), [18:41:19.278] FUN = function(jj) { [18:41:19.278] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:19.278] ...future.FUN(...future.X_jj, ...) [18:41:19.278] }) [18:41:19.278] } [18:41:19.278] }, args = future.call.arguments) [18:41:19.278] })) [18:41:19.278] future::FutureResult(value = ...future.value$value, [18:41:19.278] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:19.278] ...future.rng), globalenv = if (FALSE) [18:41:19.278] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:19.278] ...future.globalenv.names)) [18:41:19.278] else NULL, started = ...future.startTime, version = "1.8") [18:41:19.278] }, condition = base::local({ [18:41:19.278] c <- base::c [18:41:19.278] inherits <- base::inherits [18:41:19.278] invokeRestart <- base::invokeRestart [18:41:19.278] length <- base::length [18:41:19.278] list <- base::list [18:41:19.278] seq.int <- base::seq.int [18:41:19.278] signalCondition <- base::signalCondition [18:41:19.278] sys.calls <- base::sys.calls [18:41:19.278] `[[` <- base::`[[` [18:41:19.278] `+` <- base::`+` [18:41:19.278] `<<-` <- base::`<<-` [18:41:19.278] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:19.278] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:19.278] 3L)] [18:41:19.278] } [18:41:19.278] function(cond) { [18:41:19.278] is_error <- inherits(cond, "error") [18:41:19.278] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:19.278] NULL) [18:41:19.278] if (is_error) { [18:41:19.278] sessionInformation <- function() { [18:41:19.278] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:19.278] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:19.278] search = base::search(), system = base::Sys.info()) [18:41:19.278] } [18:41:19.278] ...future.conditions[[length(...future.conditions) + [18:41:19.278] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:19.278] cond$call), session = sessionInformation(), [18:41:19.278] timestamp = base::Sys.time(), signaled = 0L) [18:41:19.278] signalCondition(cond) [18:41:19.278] } [18:41:19.278] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:19.278] "immediateCondition"))) { [18:41:19.278] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:19.278] ...future.conditions[[length(...future.conditions) + [18:41:19.278] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:19.278] if (TRUE && !signal) { [18:41:19.278] muffleCondition <- function (cond, pattern = "^muffle") [18:41:19.278] { [18:41:19.278] inherits <- base::inherits [18:41:19.278] invokeRestart <- base::invokeRestart [18:41:19.278] is.null <- base::is.null [18:41:19.278] muffled <- FALSE [18:41:19.278] if (inherits(cond, "message")) { [18:41:19.278] muffled <- grepl(pattern, "muffleMessage") [18:41:19.278] if (muffled) [18:41:19.278] invokeRestart("muffleMessage") [18:41:19.278] } [18:41:19.278] else if (inherits(cond, "warning")) { [18:41:19.278] muffled <- grepl(pattern, "muffleWarning") [18:41:19.278] if (muffled) [18:41:19.278] invokeRestart("muffleWarning") [18:41:19.278] } [18:41:19.278] else if (inherits(cond, "condition")) { [18:41:19.278] if (!is.null(pattern)) { [18:41:19.278] computeRestarts <- base::computeRestarts [18:41:19.278] grepl <- base::grepl [18:41:19.278] restarts <- computeRestarts(cond) [18:41:19.278] for (restart in restarts) { [18:41:19.278] name <- restart$name [18:41:19.278] if (is.null(name)) [18:41:19.278] next [18:41:19.278] if (!grepl(pattern, name)) [18:41:19.278] next [18:41:19.278] invokeRestart(restart) [18:41:19.278] muffled <- TRUE [18:41:19.278] break [18:41:19.278] } [18:41:19.278] } [18:41:19.278] } [18:41:19.278] invisible(muffled) [18:41:19.278] } [18:41:19.278] muffleCondition(cond, pattern = "^muffle") [18:41:19.278] } [18:41:19.278] } [18:41:19.278] else { [18:41:19.278] if (TRUE) { [18:41:19.278] muffleCondition <- function (cond, pattern = "^muffle") [18:41:19.278] { [18:41:19.278] inherits <- base::inherits [18:41:19.278] invokeRestart <- base::invokeRestart [18:41:19.278] is.null <- base::is.null [18:41:19.278] muffled <- FALSE [18:41:19.278] if (inherits(cond, "message")) { [18:41:19.278] muffled <- grepl(pattern, "muffleMessage") [18:41:19.278] if (muffled) [18:41:19.278] invokeRestart("muffleMessage") [18:41:19.278] } [18:41:19.278] else if (inherits(cond, "warning")) { [18:41:19.278] muffled <- grepl(pattern, "muffleWarning") [18:41:19.278] if (muffled) [18:41:19.278] invokeRestart("muffleWarning") [18:41:19.278] } [18:41:19.278] else if (inherits(cond, "condition")) { [18:41:19.278] if (!is.null(pattern)) { [18:41:19.278] computeRestarts <- base::computeRestarts [18:41:19.278] grepl <- base::grepl [18:41:19.278] restarts <- computeRestarts(cond) [18:41:19.278] for (restart in restarts) { [18:41:19.278] name <- restart$name [18:41:19.278] if (is.null(name)) [18:41:19.278] next [18:41:19.278] if (!grepl(pattern, name)) [18:41:19.278] next [18:41:19.278] invokeRestart(restart) [18:41:19.278] muffled <- TRUE [18:41:19.278] break [18:41:19.278] } [18:41:19.278] } [18:41:19.278] } [18:41:19.278] invisible(muffled) [18:41:19.278] } [18:41:19.278] muffleCondition(cond, pattern = "^muffle") [18:41:19.278] } [18:41:19.278] } [18:41:19.278] } [18:41:19.278] })) [18:41:19.278] }, error = function(ex) { [18:41:19.278] base::structure(base::list(value = NULL, visible = NULL, [18:41:19.278] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:19.278] ...future.rng), started = ...future.startTime, [18:41:19.278] finished = Sys.time(), session_uuid = NA_character_, [18:41:19.278] version = "1.8"), class = "FutureResult") [18:41:19.278] }, finally = { [18:41:19.278] if (!identical(...future.workdir, getwd())) [18:41:19.278] setwd(...future.workdir) [18:41:19.278] { [18:41:19.278] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:19.278] ...future.oldOptions$nwarnings <- NULL [18:41:19.278] } [18:41:19.278] base::options(...future.oldOptions) [18:41:19.278] if (.Platform$OS.type == "windows") { [18:41:19.278] old_names <- names(...future.oldEnvVars) [18:41:19.278] envs <- base::Sys.getenv() [18:41:19.278] names <- names(envs) [18:41:19.278] common <- intersect(names, old_names) [18:41:19.278] added <- setdiff(names, old_names) [18:41:19.278] removed <- setdiff(old_names, names) [18:41:19.278] changed <- common[...future.oldEnvVars[common] != [18:41:19.278] envs[common]] [18:41:19.278] NAMES <- toupper(changed) [18:41:19.278] args <- list() [18:41:19.278] for (kk in seq_along(NAMES)) { [18:41:19.278] name <- changed[[kk]] [18:41:19.278] NAME <- NAMES[[kk]] [18:41:19.278] if (name != NAME && is.element(NAME, old_names)) [18:41:19.278] next [18:41:19.278] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:19.278] } [18:41:19.278] NAMES <- toupper(added) [18:41:19.278] for (kk in seq_along(NAMES)) { [18:41:19.278] name <- added[[kk]] [18:41:19.278] NAME <- NAMES[[kk]] [18:41:19.278] if (name != NAME && is.element(NAME, old_names)) [18:41:19.278] next [18:41:19.278] args[[name]] <- "" [18:41:19.278] } [18:41:19.278] NAMES <- toupper(removed) [18:41:19.278] for (kk in seq_along(NAMES)) { [18:41:19.278] name <- removed[[kk]] [18:41:19.278] NAME <- NAMES[[kk]] [18:41:19.278] if (name != NAME && is.element(NAME, old_names)) [18:41:19.278] next [18:41:19.278] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:19.278] } [18:41:19.278] if (length(args) > 0) [18:41:19.278] base::do.call(base::Sys.setenv, args = args) [18:41:19.278] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:19.278] } [18:41:19.278] else { [18:41:19.278] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:19.278] } [18:41:19.278] { [18:41:19.278] if (base::length(...future.futureOptionsAdded) > [18:41:19.278] 0L) { [18:41:19.278] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:19.278] base::names(opts) <- ...future.futureOptionsAdded [18:41:19.278] base::options(opts) [18:41:19.278] } [18:41:19.278] { [18:41:19.278] { [18:41:19.278] NULL [18:41:19.278] RNGkind("Mersenne-Twister") [18:41:19.278] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:19.278] inherits = FALSE) [18:41:19.278] } [18:41:19.278] options(future.plan = NULL) [18:41:19.278] if (is.na(NA_character_)) [18:41:19.278] Sys.unsetenv("R_FUTURE_PLAN") [18:41:19.278] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:19.278] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:19.278] .init = FALSE) [18:41:19.278] } [18:41:19.278] } [18:41:19.278] } [18:41:19.278] }) [18:41:19.278] if (TRUE) { [18:41:19.278] base::sink(type = "output", split = FALSE) [18:41:19.278] if (TRUE) { [18:41:19.278] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:19.278] } [18:41:19.278] else { [18:41:19.278] ...future.result["stdout"] <- base::list(NULL) [18:41:19.278] } [18:41:19.278] base::close(...future.stdout) [18:41:19.278] ...future.stdout <- NULL [18:41:19.278] } [18:41:19.278] ...future.result$conditions <- ...future.conditions [18:41:19.278] ...future.result$finished <- base::Sys.time() [18:41:19.278] ...future.result [18:41:19.278] } [18:41:19.282] assign_globals() ... [18:41:19.282] List of 5 [18:41:19.282] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:19.282] $ future.call.arguments :List of 1 [18:41:19.282] ..$ length: int 2 [18:41:19.282] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:19.282] $ ...future.elements_ii :List of 4 [18:41:19.282] ..$ c: chr "list" [18:41:19.282] ..$ c: chr "character" [18:41:19.282] ..$ b: chr "numeric" [18:41:19.282] ..$ a: chr "integer" [18:41:19.282] $ ...future.seeds_ii : NULL [18:41:19.282] $ ...future.globals.maxSize: NULL [18:41:19.282] - attr(*, "where")=List of 5 [18:41:19.282] ..$ ...future.FUN : [18:41:19.282] ..$ future.call.arguments : [18:41:19.282] ..$ ...future.elements_ii : [18:41:19.282] ..$ ...future.seeds_ii : [18:41:19.282] ..$ ...future.globals.maxSize: [18:41:19.282] - attr(*, "resolved")= logi FALSE [18:41:19.282] - attr(*, "total_size")= num 4799 [18:41:19.282] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:19.282] - attr(*, "already-done")= logi TRUE [18:41:19.289] - copied '...future.FUN' to environment [18:41:19.289] - copied 'future.call.arguments' to environment [18:41:19.289] - copied '...future.elements_ii' to environment [18:41:19.289] - copied '...future.seeds_ii' to environment [18:41:19.290] - copied '...future.globals.maxSize' to environment [18:41:19.290] assign_globals() ... done [18:41:19.290] plan(): Setting new future strategy stack: [18:41:19.290] List of future strategies: [18:41:19.290] 1. sequential: [18:41:19.290] - args: function (..., envir = parent.frame(), workers = "") [18:41:19.290] - tweaked: FALSE [18:41:19.290] - call: NULL [18:41:19.291] plan(): nbrOfWorkers() = 1 [18:41:19.292] plan(): Setting new future strategy stack: [18:41:19.292] List of future strategies: [18:41:19.292] 1. multisession: [18:41:19.292] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:41:19.292] - tweaked: FALSE [18:41:19.292] - call: plan(strategy) [18:41:19.295] plan(): nbrOfWorkers() = 1 [18:41:19.295] SequentialFuture started (and completed) [18:41:19.295] - Launch lazy future ... done [18:41:19.295] run() for 'SequentialFuture' ... done [18:41:19.296] Created future: [18:41:19.296] SequentialFuture: [18:41:19.296] Label: 'future_lapply-1' [18:41:19.296] Expression: [18:41:19.296] { [18:41:19.296] do.call(function(...) { [18:41:19.296] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:19.296] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:19.296] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:19.296] on.exit(options(oopts), add = TRUE) [18:41:19.296] } [18:41:19.296] { [18:41:19.296] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:19.296] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:19.296] ...future.FUN(...future.X_jj, ...) [18:41:19.296] }) [18:41:19.296] } [18:41:19.296] }, args = future.call.arguments) [18:41:19.296] } [18:41:19.296] Lazy evaluation: FALSE [18:41:19.296] Asynchronous evaluation: FALSE [18:41:19.296] Local evaluation: TRUE [18:41:19.296] Environment: R_GlobalEnv [18:41:19.296] Capture standard output: TRUE [18:41:19.296] Capture condition classes: 'condition' (excluding 'nothing') [18:41:19.296] Globals: 5 objects totaling 853 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 191 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:19.296] Packages: [18:41:19.296] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:19.296] Resolved: TRUE [18:41:19.296] Value: 111 bytes of class 'list' [18:41:19.296] Early signaling: FALSE [18:41:19.296] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:19.296] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:19.297] Chunk #1 of 1 ... DONE [18:41:19.297] Launching 1 futures (chunks) ... DONE [18:41:19.297] Resolving 1 futures (chunks) ... [18:41:19.297] resolve() on list ... [18:41:19.298] recursive: 0 [18:41:19.298] length: 1 [18:41:19.300] [18:41:19.300] resolved() for 'SequentialFuture' ... [18:41:19.301] - state: 'finished' [18:41:19.301] - run: TRUE [18:41:19.301] - result: 'FutureResult' [18:41:19.301] resolved() for 'SequentialFuture' ... done [18:41:19.301] Future #1 [18:41:19.302] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:19.302] - nx: 1 [18:41:19.302] - relay: TRUE [18:41:19.302] - stdout: TRUE [18:41:19.302] - signal: TRUE [18:41:19.302] - resignal: FALSE [18:41:19.303] - force: TRUE [18:41:19.303] - relayed: [n=1] FALSE [18:41:19.303] - queued futures: [n=1] FALSE [18:41:19.303] - until=1 [18:41:19.303] - relaying element #1 [18:41:19.303] - relayed: [n=1] TRUE [18:41:19.304] - queued futures: [n=1] TRUE [18:41:19.304] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:19.304] length: 0 (resolved future 1) [18:41:19.304] Relaying remaining futures [18:41:19.304] signalConditionsASAP(NULL, pos=0) ... [18:41:19.304] - nx: 1 [18:41:19.305] - relay: TRUE [18:41:19.305] - stdout: TRUE [18:41:19.305] - signal: TRUE [18:41:19.305] - resignal: FALSE [18:41:19.305] - force: TRUE [18:41:19.305] - relayed: [n=1] TRUE [18:41:19.305] - queued futures: [n=1] TRUE - flush all [18:41:19.306] - relayed: [n=1] TRUE [18:41:19.306] - queued futures: [n=1] TRUE [18:41:19.306] signalConditionsASAP(NULL, pos=0) ... done [18:41:19.306] resolve() on list ... DONE [18:41:19.306] - Number of value chunks collected: 1 [18:41:19.307] Resolving 1 futures (chunks) ... DONE [18:41:19.307] Reducing values from 1 chunks ... [18:41:19.307] - Number of values collected after concatenation: 4 [18:41:19.307] - Number of values expected: 4 [18:41:19.307] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [18:41:19.307] Reducing values from 1 chunks ... DONE [18:41:19.308] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL - future_lapply(x, FUN = base::vector, ...) ... [18:41:19.310] future_lapply() ... [18:41:19.313] Number of chunks: 1 [18:41:19.313] Index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [18:41:19.313] getGlobalsAndPackagesXApply() ... [18:41:19.313] - future.globals: TRUE [18:41:19.314] getGlobalsAndPackages() ... [18:41:19.314] Searching for globals... [18:41:19.315] - globals found: [2] 'FUN', '.Internal' [18:41:19.315] Searching for globals ... DONE [18:41:19.316] Resolving globals: FALSE [18:41:19.316] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:19.316] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:19.317] - globals: [1] 'FUN' [18:41:19.317] [18:41:19.317] getGlobalsAndPackages() ... DONE [18:41:19.317] - globals found/used: [n=1] 'FUN' [18:41:19.317] - needed namespaces: [n=0] [18:41:19.317] Finding globals ... DONE [18:41:19.318] - use_args: TRUE [18:41:19.318] - Getting '...' globals ... [18:41:19.318] resolve() on list ... [18:41:19.318] recursive: 0 [18:41:19.319] length: 1 [18:41:19.319] elements: '...' [18:41:19.319] length: 0 (resolved future 1) [18:41:19.319] resolve() on list ... DONE [18:41:19.319] - '...' content: [n=1] 'length' [18:41:19.319] List of 1 [18:41:19.319] $ ...:List of 1 [18:41:19.319] ..$ length: int 2 [18:41:19.319] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:19.319] - attr(*, "where")=List of 1 [18:41:19.319] ..$ ...: [18:41:19.319] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:19.319] - attr(*, "resolved")= logi TRUE [18:41:19.319] - attr(*, "total_size")= num NA [18:41:19.323] - Getting '...' globals ... DONE [18:41:19.323] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:19.323] List of 2 [18:41:19.323] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:19.323] $ ... :List of 1 [18:41:19.323] ..$ length: int 2 [18:41:19.323] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:19.323] - attr(*, "where")=List of 2 [18:41:19.323] ..$ ...future.FUN: [18:41:19.323] ..$ ... : [18:41:19.323] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:19.323] - attr(*, "resolved")= logi FALSE [18:41:19.323] - attr(*, "total_size")= int 4881 [18:41:19.327] Packages to be attached in all futures: [n=0] [18:41:19.327] getGlobalsAndPackagesXApply() ... DONE [18:41:19.327] Number of futures (= number of chunks): 1 [18:41:19.327] Launching 1 futures (chunks) ... [18:41:19.328] Chunk #1 of 1 ... [18:41:19.328] - Finding globals in 'X' for chunk #1 ... [18:41:19.328] getGlobalsAndPackages() ... [18:41:19.328] Searching for globals... [18:41:19.328] [18:41:19.329] Searching for globals ... DONE [18:41:19.329] - globals: [0] [18:41:19.329] getGlobalsAndPackages() ... DONE [18:41:19.329] + additional globals found: [n=0] [18:41:19.329] + additional namespaces needed: [n=0] [18:41:19.329] - Finding globals in 'X' for chunk #1 ... DONE [18:41:19.330] - seeds: [18:41:19.330] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.330] getGlobalsAndPackages() ... [18:41:19.330] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.330] Resolving globals: FALSE [18:41:19.330] Tweak future expression to call with '...' arguments ... [18:41:19.331] { [18:41:19.331] do.call(function(...) { [18:41:19.331] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:19.331] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:19.331] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:19.331] on.exit(options(oopts), add = TRUE) [18:41:19.331] } [18:41:19.331] { [18:41:19.331] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:19.331] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:19.331] ...future.FUN(...future.X_jj, ...) [18:41:19.331] }) [18:41:19.331] } [18:41:19.331] }, args = future.call.arguments) [18:41:19.331] } [18:41:19.331] Tweak future expression to call with '...' arguments ... DONE [18:41:19.332] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.332] [18:41:19.332] getGlobalsAndPackages() ... DONE [18:41:19.332] run() for 'Future' ... [18:41:19.332] - state: 'created' [18:41:19.333] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:19.335] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:19.335] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:19.335] - Field: 'label' [18:41:19.336] - Field: 'local' [18:41:19.336] - Field: 'owner' [18:41:19.336] - Field: 'envir' [18:41:19.336] - Field: 'packages' [18:41:19.336] - Field: 'gc' [18:41:19.336] - Field: 'conditions' [18:41:19.337] - Field: 'expr' [18:41:19.337] - Field: 'uuid' [18:41:19.337] - Field: 'seed' [18:41:19.337] - Field: 'version' [18:41:19.337] - Field: 'result' [18:41:19.337] - Field: 'asynchronous' [18:41:19.338] - Field: 'calls' [18:41:19.338] - Field: 'globals' [18:41:19.338] - Field: 'stdout' [18:41:19.338] - Field: 'earlySignal' [18:41:19.338] - Field: 'lazy' [18:41:19.339] - Field: 'state' [18:41:19.339] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:19.339] - Launch lazy future ... [18:41:19.339] Packages needed by the future expression (n = 0): [18:41:19.339] Packages needed by future strategies (n = 0): [18:41:19.340] { [18:41:19.340] { [18:41:19.340] { [18:41:19.340] ...future.startTime <- base::Sys.time() [18:41:19.340] { [18:41:19.340] { [18:41:19.340] { [18:41:19.340] base::local({ [18:41:19.340] has_future <- base::requireNamespace("future", [18:41:19.340] quietly = TRUE) [18:41:19.340] if (has_future) { [18:41:19.340] ns <- base::getNamespace("future") [18:41:19.340] version <- ns[[".package"]][["version"]] [18:41:19.340] if (is.null(version)) [18:41:19.340] version <- utils::packageVersion("future") [18:41:19.340] } [18:41:19.340] else { [18:41:19.340] version <- NULL [18:41:19.340] } [18:41:19.340] if (!has_future || version < "1.8.0") { [18:41:19.340] info <- base::c(r_version = base::gsub("R version ", [18:41:19.340] "", base::R.version$version.string), [18:41:19.340] platform = base::sprintf("%s (%s-bit)", [18:41:19.340] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:19.340] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:19.340] "release", "version")], collapse = " "), [18:41:19.340] hostname = base::Sys.info()[["nodename"]]) [18:41:19.340] info <- base::sprintf("%s: %s", base::names(info), [18:41:19.340] info) [18:41:19.340] info <- base::paste(info, collapse = "; ") [18:41:19.340] if (!has_future) { [18:41:19.340] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:19.340] info) [18:41:19.340] } [18:41:19.340] else { [18:41:19.340] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:19.340] info, version) [18:41:19.340] } [18:41:19.340] base::stop(msg) [18:41:19.340] } [18:41:19.340] }) [18:41:19.340] } [18:41:19.340] ...future.strategy.old <- future::plan("list") [18:41:19.340] options(future.plan = NULL) [18:41:19.340] Sys.unsetenv("R_FUTURE_PLAN") [18:41:19.340] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:19.340] } [18:41:19.340] ...future.workdir <- getwd() [18:41:19.340] } [18:41:19.340] ...future.oldOptions <- base::as.list(base::.Options) [18:41:19.340] ...future.oldEnvVars <- base::Sys.getenv() [18:41:19.340] } [18:41:19.340] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:19.340] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:19.340] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:19.340] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:19.340] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:19.340] future.stdout.windows.reencode = NULL, width = 80L) [18:41:19.340] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:19.340] base::names(...future.oldOptions)) [18:41:19.340] } [18:41:19.340] if (FALSE) { [18:41:19.340] } [18:41:19.340] else { [18:41:19.340] if (TRUE) { [18:41:19.340] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:19.340] open = "w") [18:41:19.340] } [18:41:19.340] else { [18:41:19.340] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:19.340] windows = "NUL", "/dev/null"), open = "w") [18:41:19.340] } [18:41:19.340] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:19.340] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:19.340] base::sink(type = "output", split = FALSE) [18:41:19.340] base::close(...future.stdout) [18:41:19.340] }, add = TRUE) [18:41:19.340] } [18:41:19.340] ...future.frame <- base::sys.nframe() [18:41:19.340] ...future.conditions <- base::list() [18:41:19.340] ...future.rng <- base::globalenv()$.Random.seed [18:41:19.340] if (FALSE) { [18:41:19.340] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:19.340] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:19.340] } [18:41:19.340] ...future.result <- base::tryCatch({ [18:41:19.340] base::withCallingHandlers({ [18:41:19.340] ...future.value <- base::withVisible(base::local({ [18:41:19.340] do.call(function(...) { [18:41:19.340] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:19.340] if (!identical(...future.globals.maxSize.org, [18:41:19.340] ...future.globals.maxSize)) { [18:41:19.340] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:19.340] on.exit(options(oopts), add = TRUE) [18:41:19.340] } [18:41:19.340] { [18:41:19.340] lapply(seq_along(...future.elements_ii), [18:41:19.340] FUN = function(jj) { [18:41:19.340] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:19.340] ...future.FUN(...future.X_jj, ...) [18:41:19.340] }) [18:41:19.340] } [18:41:19.340] }, args = future.call.arguments) [18:41:19.340] })) [18:41:19.340] future::FutureResult(value = ...future.value$value, [18:41:19.340] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:19.340] ...future.rng), globalenv = if (FALSE) [18:41:19.340] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:19.340] ...future.globalenv.names)) [18:41:19.340] else NULL, started = ...future.startTime, version = "1.8") [18:41:19.340] }, condition = base::local({ [18:41:19.340] c <- base::c [18:41:19.340] inherits <- base::inherits [18:41:19.340] invokeRestart <- base::invokeRestart [18:41:19.340] length <- base::length [18:41:19.340] list <- base::list [18:41:19.340] seq.int <- base::seq.int [18:41:19.340] signalCondition <- base::signalCondition [18:41:19.340] sys.calls <- base::sys.calls [18:41:19.340] `[[` <- base::`[[` [18:41:19.340] `+` <- base::`+` [18:41:19.340] `<<-` <- base::`<<-` [18:41:19.340] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:19.340] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:19.340] 3L)] [18:41:19.340] } [18:41:19.340] function(cond) { [18:41:19.340] is_error <- inherits(cond, "error") [18:41:19.340] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:19.340] NULL) [18:41:19.340] if (is_error) { [18:41:19.340] sessionInformation <- function() { [18:41:19.340] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:19.340] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:19.340] search = base::search(), system = base::Sys.info()) [18:41:19.340] } [18:41:19.340] ...future.conditions[[length(...future.conditions) + [18:41:19.340] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:19.340] cond$call), session = sessionInformation(), [18:41:19.340] timestamp = base::Sys.time(), signaled = 0L) [18:41:19.340] signalCondition(cond) [18:41:19.340] } [18:41:19.340] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:19.340] "immediateCondition"))) { [18:41:19.340] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:19.340] ...future.conditions[[length(...future.conditions) + [18:41:19.340] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:19.340] if (TRUE && !signal) { [18:41:19.340] muffleCondition <- function (cond, pattern = "^muffle") [18:41:19.340] { [18:41:19.340] inherits <- base::inherits [18:41:19.340] invokeRestart <- base::invokeRestart [18:41:19.340] is.null <- base::is.null [18:41:19.340] muffled <- FALSE [18:41:19.340] if (inherits(cond, "message")) { [18:41:19.340] muffled <- grepl(pattern, "muffleMessage") [18:41:19.340] if (muffled) [18:41:19.340] invokeRestart("muffleMessage") [18:41:19.340] } [18:41:19.340] else if (inherits(cond, "warning")) { [18:41:19.340] muffled <- grepl(pattern, "muffleWarning") [18:41:19.340] if (muffled) [18:41:19.340] invokeRestart("muffleWarning") [18:41:19.340] } [18:41:19.340] else if (inherits(cond, "condition")) { [18:41:19.340] if (!is.null(pattern)) { [18:41:19.340] computeRestarts <- base::computeRestarts [18:41:19.340] grepl <- base::grepl [18:41:19.340] restarts <- computeRestarts(cond) [18:41:19.340] for (restart in restarts) { [18:41:19.340] name <- restart$name [18:41:19.340] if (is.null(name)) [18:41:19.340] next [18:41:19.340] if (!grepl(pattern, name)) [18:41:19.340] next [18:41:19.340] invokeRestart(restart) [18:41:19.340] muffled <- TRUE [18:41:19.340] break [18:41:19.340] } [18:41:19.340] } [18:41:19.340] } [18:41:19.340] invisible(muffled) [18:41:19.340] } [18:41:19.340] muffleCondition(cond, pattern = "^muffle") [18:41:19.340] } [18:41:19.340] } [18:41:19.340] else { [18:41:19.340] if (TRUE) { [18:41:19.340] muffleCondition <- function (cond, pattern = "^muffle") [18:41:19.340] { [18:41:19.340] inherits <- base::inherits [18:41:19.340] invokeRestart <- base::invokeRestart [18:41:19.340] is.null <- base::is.null [18:41:19.340] muffled <- FALSE [18:41:19.340] if (inherits(cond, "message")) { [18:41:19.340] muffled <- grepl(pattern, "muffleMessage") [18:41:19.340] if (muffled) [18:41:19.340] invokeRestart("muffleMessage") [18:41:19.340] } [18:41:19.340] else if (inherits(cond, "warning")) { [18:41:19.340] muffled <- grepl(pattern, "muffleWarning") [18:41:19.340] if (muffled) [18:41:19.340] invokeRestart("muffleWarning") [18:41:19.340] } [18:41:19.340] else if (inherits(cond, "condition")) { [18:41:19.340] if (!is.null(pattern)) { [18:41:19.340] computeRestarts <- base::computeRestarts [18:41:19.340] grepl <- base::grepl [18:41:19.340] restarts <- computeRestarts(cond) [18:41:19.340] for (restart in restarts) { [18:41:19.340] name <- restart$name [18:41:19.340] if (is.null(name)) [18:41:19.340] next [18:41:19.340] if (!grepl(pattern, name)) [18:41:19.340] next [18:41:19.340] invokeRestart(restart) [18:41:19.340] muffled <- TRUE [18:41:19.340] break [18:41:19.340] } [18:41:19.340] } [18:41:19.340] } [18:41:19.340] invisible(muffled) [18:41:19.340] } [18:41:19.340] muffleCondition(cond, pattern = "^muffle") [18:41:19.340] } [18:41:19.340] } [18:41:19.340] } [18:41:19.340] })) [18:41:19.340] }, error = function(ex) { [18:41:19.340] base::structure(base::list(value = NULL, visible = NULL, [18:41:19.340] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:19.340] ...future.rng), started = ...future.startTime, [18:41:19.340] finished = Sys.time(), session_uuid = NA_character_, [18:41:19.340] version = "1.8"), class = "FutureResult") [18:41:19.340] }, finally = { [18:41:19.340] if (!identical(...future.workdir, getwd())) [18:41:19.340] setwd(...future.workdir) [18:41:19.340] { [18:41:19.340] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:19.340] ...future.oldOptions$nwarnings <- NULL [18:41:19.340] } [18:41:19.340] base::options(...future.oldOptions) [18:41:19.340] if (.Platform$OS.type == "windows") { [18:41:19.340] old_names <- names(...future.oldEnvVars) [18:41:19.340] envs <- base::Sys.getenv() [18:41:19.340] names <- names(envs) [18:41:19.340] common <- intersect(names, old_names) [18:41:19.340] added <- setdiff(names, old_names) [18:41:19.340] removed <- setdiff(old_names, names) [18:41:19.340] changed <- common[...future.oldEnvVars[common] != [18:41:19.340] envs[common]] [18:41:19.340] NAMES <- toupper(changed) [18:41:19.340] args <- list() [18:41:19.340] for (kk in seq_along(NAMES)) { [18:41:19.340] name <- changed[[kk]] [18:41:19.340] NAME <- NAMES[[kk]] [18:41:19.340] if (name != NAME && is.element(NAME, old_names)) [18:41:19.340] next [18:41:19.340] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:19.340] } [18:41:19.340] NAMES <- toupper(added) [18:41:19.340] for (kk in seq_along(NAMES)) { [18:41:19.340] name <- added[[kk]] [18:41:19.340] NAME <- NAMES[[kk]] [18:41:19.340] if (name != NAME && is.element(NAME, old_names)) [18:41:19.340] next [18:41:19.340] args[[name]] <- "" [18:41:19.340] } [18:41:19.340] NAMES <- toupper(removed) [18:41:19.340] for (kk in seq_along(NAMES)) { [18:41:19.340] name <- removed[[kk]] [18:41:19.340] NAME <- NAMES[[kk]] [18:41:19.340] if (name != NAME && is.element(NAME, old_names)) [18:41:19.340] next [18:41:19.340] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:19.340] } [18:41:19.340] if (length(args) > 0) [18:41:19.340] base::do.call(base::Sys.setenv, args = args) [18:41:19.340] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:19.340] } [18:41:19.340] else { [18:41:19.340] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:19.340] } [18:41:19.340] { [18:41:19.340] if (base::length(...future.futureOptionsAdded) > [18:41:19.340] 0L) { [18:41:19.340] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:19.340] base::names(opts) <- ...future.futureOptionsAdded [18:41:19.340] base::options(opts) [18:41:19.340] } [18:41:19.340] { [18:41:19.340] { [18:41:19.340] NULL [18:41:19.340] RNGkind("Mersenne-Twister") [18:41:19.340] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:19.340] inherits = FALSE) [18:41:19.340] } [18:41:19.340] options(future.plan = NULL) [18:41:19.340] if (is.na(NA_character_)) [18:41:19.340] Sys.unsetenv("R_FUTURE_PLAN") [18:41:19.340] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:19.340] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:19.340] .init = FALSE) [18:41:19.340] } [18:41:19.340] } [18:41:19.340] } [18:41:19.340] }) [18:41:19.340] if (TRUE) { [18:41:19.340] base::sink(type = "output", split = FALSE) [18:41:19.340] if (TRUE) { [18:41:19.340] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:19.340] } [18:41:19.340] else { [18:41:19.340] ...future.result["stdout"] <- base::list(NULL) [18:41:19.340] } [18:41:19.340] base::close(...future.stdout) [18:41:19.340] ...future.stdout <- NULL [18:41:19.340] } [18:41:19.340] ...future.result$conditions <- ...future.conditions [18:41:19.340] ...future.result$finished <- base::Sys.time() [18:41:19.340] ...future.result [18:41:19.340] } [18:41:19.344] assign_globals() ... [18:41:19.344] List of 5 [18:41:19.344] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:19.344] $ future.call.arguments :List of 1 [18:41:19.344] ..$ length: int 2 [18:41:19.344] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:19.344] $ ...future.elements_ii :List of 4 [18:41:19.344] ..$ c: chr "list" [18:41:19.344] ..$ c: chr "character" [18:41:19.344] ..$ b: chr "numeric" [18:41:19.344] ..$ a: chr "integer" [18:41:19.344] $ ...future.seeds_ii : NULL [18:41:19.344] $ ...future.globals.maxSize: NULL [18:41:19.344] - attr(*, "where")=List of 5 [18:41:19.344] ..$ ...future.FUN : [18:41:19.344] ..$ future.call.arguments : [18:41:19.344] ..$ ...future.elements_ii : [18:41:19.344] ..$ ...future.seeds_ii : [18:41:19.344] ..$ ...future.globals.maxSize: [18:41:19.344] - attr(*, "resolved")= logi FALSE [18:41:19.344] - attr(*, "total_size")= num 4881 [18:41:19.344] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:19.344] - attr(*, "already-done")= logi TRUE [18:41:19.351] - copied '...future.FUN' to environment [18:41:19.351] - copied 'future.call.arguments' to environment [18:41:19.351] - copied '...future.elements_ii' to environment [18:41:19.352] - copied '...future.seeds_ii' to environment [18:41:19.352] - copied '...future.globals.maxSize' to environment [18:41:19.352] assign_globals() ... done [18:41:19.352] plan(): Setting new future strategy stack: [18:41:19.352] List of future strategies: [18:41:19.352] 1. sequential: [18:41:19.352] - args: function (..., envir = parent.frame(), workers = "") [18:41:19.352] - tweaked: FALSE [18:41:19.352] - call: NULL [18:41:19.353] plan(): nbrOfWorkers() = 1 [18:41:19.354] plan(): Setting new future strategy stack: [18:41:19.354] List of future strategies: [18:41:19.354] 1. multisession: [18:41:19.354] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:41:19.354] - tweaked: FALSE [18:41:19.354] - call: plan(strategy) [18:41:19.357] plan(): nbrOfWorkers() = 1 [18:41:19.357] SequentialFuture started (and completed) [18:41:19.357] - Launch lazy future ... done [18:41:19.357] run() for 'SequentialFuture' ... done [18:41:19.358] Created future: [18:41:19.358] SequentialFuture: [18:41:19.358] Label: 'future_lapply-1' [18:41:19.358] Expression: [18:41:19.358] { [18:41:19.358] do.call(function(...) { [18:41:19.358] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:19.358] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:19.358] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:19.358] on.exit(options(oopts), add = TRUE) [18:41:19.358] } [18:41:19.358] { [18:41:19.358] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:19.358] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:19.358] ...future.FUN(...future.X_jj, ...) [18:41:19.358] }) [18:41:19.358] } [18:41:19.358] }, args = future.call.arguments) [18:41:19.358] } [18:41:19.358] Lazy evaluation: FALSE [18:41:19.358] Asynchronous evaluation: FALSE [18:41:19.358] Local evaluation: TRUE [18:41:19.358] Environment: R_GlobalEnv [18:41:19.358] Capture standard output: TRUE [18:41:19.358] Capture condition classes: 'condition' (excluding 'nothing') [18:41:19.358] Globals: 5 objects totaling 853 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 191 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:19.358] Packages: [18:41:19.358] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:19.358] Resolved: TRUE [18:41:19.358] Value: 111 bytes of class 'list' [18:41:19.358] Early signaling: FALSE [18:41:19.358] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:19.358] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:19.359] Chunk #1 of 1 ... DONE [18:41:19.359] Launching 1 futures (chunks) ... DONE [18:41:19.359] Resolving 1 futures (chunks) ... [18:41:19.359] resolve() on list ... [18:41:19.360] recursive: 0 [18:41:19.360] length: 1 [18:41:19.360] [18:41:19.360] resolved() for 'SequentialFuture' ... [18:41:19.360] - state: 'finished' [18:41:19.360] - run: TRUE [18:41:19.361] - result: 'FutureResult' [18:41:19.361] resolved() for 'SequentialFuture' ... done [18:41:19.361] Future #1 [18:41:19.361] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:19.361] - nx: 1 [18:41:19.361] - relay: TRUE [18:41:19.362] - stdout: TRUE [18:41:19.362] - signal: TRUE [18:41:19.362] - resignal: FALSE [18:41:19.362] - force: TRUE [18:41:19.362] - relayed: [n=1] FALSE [18:41:19.362] - queued futures: [n=1] FALSE [18:41:19.363] - until=1 [18:41:19.363] - relaying element #1 [18:41:19.363] - relayed: [n=1] TRUE [18:41:19.363] - queued futures: [n=1] TRUE [18:41:19.363] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:19.363] length: 0 (resolved future 1) [18:41:19.364] Relaying remaining futures [18:41:19.364] signalConditionsASAP(NULL, pos=0) ... [18:41:19.364] - nx: 1 [18:41:19.364] - relay: TRUE [18:41:19.364] - stdout: TRUE [18:41:19.364] - signal: TRUE [18:41:19.364] - resignal: FALSE [18:41:19.365] - force: TRUE [18:41:19.365] - relayed: [n=1] TRUE [18:41:19.365] - queued futures: [n=1] TRUE - flush all [18:41:19.365] - relayed: [n=1] TRUE [18:41:19.365] - queued futures: [n=1] TRUE [18:41:19.365] signalConditionsASAP(NULL, pos=0) ... done [18:41:19.366] resolve() on list ... DONE [18:41:19.366] - Number of value chunks collected: 1 [18:41:19.366] Resolving 1 futures (chunks) ... DONE [18:41:19.366] Reducing values from 1 chunks ... [18:41:19.366] - Number of values collected after concatenation: 4 [18:41:19.366] - Number of values expected: 4 [18:41:19.367] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [18:41:19.367] Reducing values from 1 chunks ... DONE [18:41:19.367] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL - future_lapply(x, FUN = future:::hpaste, ...) ... [18:41:19.370] future_lapply() ... [18:41:19.380] Number of chunks: 1 [18:41:19.380] getGlobalsAndPackagesXApply() ... [18:41:19.380] - future.globals: TRUE [18:41:19.380] getGlobalsAndPackages() ... [18:41:19.380] Searching for globals... [18:41:19.390] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [18:41:19.390] Searching for globals ... DONE [18:41:19.390] Resolving globals: FALSE [18:41:19.391] The total size of the 1 globals is 7.17 KiB (7342 bytes) [18:41:19.392] The total size of the 1 globals exported for future expression ('FUN(collapse = "; ", maxHead = 3L)') is 7.17 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (7.17 KiB of class 'function') [18:41:19.392] - globals: [1] 'FUN' [18:41:19.392] - packages: [1] 'future' [18:41:19.392] getGlobalsAndPackages() ... DONE [18:41:19.392] - globals found/used: [n=1] 'FUN' [18:41:19.393] - needed namespaces: [n=1] 'future' [18:41:19.393] Finding globals ... DONE [18:41:19.393] - use_args: TRUE [18:41:19.393] - Getting '...' globals ... [18:41:19.394] resolve() on list ... [18:41:19.394] recursive: 0 [18:41:19.394] length: 1 [18:41:19.394] elements: '...' [18:41:19.394] length: 0 (resolved future 1) [18:41:19.394] resolve() on list ... DONE [18:41:19.395] - '...' content: [n=2] 'collapse', 'maxHead' [18:41:19.395] List of 1 [18:41:19.395] $ ...:List of 2 [18:41:19.395] ..$ collapse: chr "; " [18:41:19.395] ..$ maxHead : int 3 [18:41:19.395] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:19.395] - attr(*, "where")=List of 1 [18:41:19.395] ..$ ...: [18:41:19.395] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:19.395] - attr(*, "resolved")= logi TRUE [18:41:19.395] - attr(*, "total_size")= num NA [18:41:19.398] - Getting '...' globals ... DONE [18:41:19.399] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:19.399] List of 2 [18:41:19.399] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [18:41:19.399] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [18:41:19.399] $ ... :List of 2 [18:41:19.399] ..$ collapse: chr "; " [18:41:19.399] ..$ maxHead : int 3 [18:41:19.399] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:19.399] - attr(*, "where")=List of 2 [18:41:19.399] ..$ ...future.FUN: [18:41:19.399] ..$ ... : [18:41:19.399] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:19.399] - attr(*, "resolved")= logi FALSE [18:41:19.399] - attr(*, "total_size")= int 20741 [18:41:19.405] Packages to be attached in all futures: [n=1] 'future' [18:41:19.405] getGlobalsAndPackagesXApply() ... DONE [18:41:19.406] Number of futures (= number of chunks): 1 [18:41:19.406] Launching 1 futures (chunks) ... [18:41:19.406] Chunk #1 of 1 ... [18:41:19.406] - Finding globals in 'X' for chunk #1 ... [18:41:19.406] getGlobalsAndPackages() ... [18:41:19.406] Searching for globals... [18:41:19.407] [18:41:19.407] Searching for globals ... DONE [18:41:19.407] - globals: [0] [18:41:19.407] getGlobalsAndPackages() ... DONE [18:41:19.407] + additional globals found: [n=0] [18:41:19.407] + additional namespaces needed: [n=0] [18:41:19.408] - Finding globals in 'X' for chunk #1 ... DONE [18:41:19.408] - seeds: [18:41:19.408] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.408] getGlobalsAndPackages() ... [18:41:19.408] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.408] Resolving globals: FALSE [18:41:19.409] Tweak future expression to call with '...' arguments ... [18:41:19.409] { [18:41:19.409] do.call(function(...) { [18:41:19.409] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:19.409] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:19.409] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:19.409] on.exit(options(oopts), add = TRUE) [18:41:19.409] } [18:41:19.409] { [18:41:19.409] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:19.409] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:19.409] ...future.FUN(...future.X_jj, ...) [18:41:19.409] }) [18:41:19.409] } [18:41:19.409] }, args = future.call.arguments) [18:41:19.409] } [18:41:19.409] Tweak future expression to call with '...' arguments ... DONE [18:41:19.410] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.410] - packages: [1] 'future' [18:41:19.410] getGlobalsAndPackages() ... DONE [18:41:19.410] run() for 'Future' ... [18:41:19.411] - state: 'created' [18:41:19.411] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:19.413] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:19.413] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:19.414] - Field: 'label' [18:41:19.414] - Field: 'local' [18:41:19.414] - Field: 'owner' [18:41:19.414] - Field: 'envir' [18:41:19.414] - Field: 'packages' [18:41:19.414] - Field: 'gc' [18:41:19.415] - Field: 'conditions' [18:41:19.415] - Field: 'expr' [18:41:19.415] - Field: 'uuid' [18:41:19.415] - Field: 'seed' [18:41:19.415] - Field: 'version' [18:41:19.415] - Field: 'result' [18:41:19.416] - Field: 'asynchronous' [18:41:19.416] - Field: 'calls' [18:41:19.416] - Field: 'globals' [18:41:19.416] - Field: 'stdout' [18:41:19.416] - Field: 'earlySignal' [18:41:19.416] - Field: 'lazy' [18:41:19.417] - Field: 'state' [18:41:19.417] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:19.417] - Launch lazy future ... [18:41:19.417] Packages needed by the future expression (n = 1): 'future' [18:41:19.417] Packages needed by future strategies (n = 0): [18:41:19.418] { [18:41:19.418] { [18:41:19.418] { [18:41:19.418] ...future.startTime <- base::Sys.time() [18:41:19.418] { [18:41:19.418] { [18:41:19.418] { [18:41:19.418] { [18:41:19.418] base::local({ [18:41:19.418] has_future <- base::requireNamespace("future", [18:41:19.418] quietly = TRUE) [18:41:19.418] if (has_future) { [18:41:19.418] ns <- base::getNamespace("future") [18:41:19.418] version <- ns[[".package"]][["version"]] [18:41:19.418] if (is.null(version)) [18:41:19.418] version <- utils::packageVersion("future") [18:41:19.418] } [18:41:19.418] else { [18:41:19.418] version <- NULL [18:41:19.418] } [18:41:19.418] if (!has_future || version < "1.8.0") { [18:41:19.418] info <- base::c(r_version = base::gsub("R version ", [18:41:19.418] "", base::R.version$version.string), [18:41:19.418] platform = base::sprintf("%s (%s-bit)", [18:41:19.418] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:19.418] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:19.418] "release", "version")], collapse = " "), [18:41:19.418] hostname = base::Sys.info()[["nodename"]]) [18:41:19.418] info <- base::sprintf("%s: %s", base::names(info), [18:41:19.418] info) [18:41:19.418] info <- base::paste(info, collapse = "; ") [18:41:19.418] if (!has_future) { [18:41:19.418] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:19.418] info) [18:41:19.418] } [18:41:19.418] else { [18:41:19.418] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:19.418] info, version) [18:41:19.418] } [18:41:19.418] base::stop(msg) [18:41:19.418] } [18:41:19.418] }) [18:41:19.418] } [18:41:19.418] base::local({ [18:41:19.418] for (pkg in "future") { [18:41:19.418] base::loadNamespace(pkg) [18:41:19.418] base::library(pkg, character.only = TRUE) [18:41:19.418] } [18:41:19.418] }) [18:41:19.418] } [18:41:19.418] ...future.strategy.old <- future::plan("list") [18:41:19.418] options(future.plan = NULL) [18:41:19.418] Sys.unsetenv("R_FUTURE_PLAN") [18:41:19.418] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:19.418] } [18:41:19.418] ...future.workdir <- getwd() [18:41:19.418] } [18:41:19.418] ...future.oldOptions <- base::as.list(base::.Options) [18:41:19.418] ...future.oldEnvVars <- base::Sys.getenv() [18:41:19.418] } [18:41:19.418] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:19.418] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:19.418] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:19.418] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:19.418] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:19.418] future.stdout.windows.reencode = NULL, width = 80L) [18:41:19.418] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:19.418] base::names(...future.oldOptions)) [18:41:19.418] } [18:41:19.418] if (FALSE) { [18:41:19.418] } [18:41:19.418] else { [18:41:19.418] if (TRUE) { [18:41:19.418] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:19.418] open = "w") [18:41:19.418] } [18:41:19.418] else { [18:41:19.418] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:19.418] windows = "NUL", "/dev/null"), open = "w") [18:41:19.418] } [18:41:19.418] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:19.418] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:19.418] base::sink(type = "output", split = FALSE) [18:41:19.418] base::close(...future.stdout) [18:41:19.418] }, add = TRUE) [18:41:19.418] } [18:41:19.418] ...future.frame <- base::sys.nframe() [18:41:19.418] ...future.conditions <- base::list() [18:41:19.418] ...future.rng <- base::globalenv()$.Random.seed [18:41:19.418] if (FALSE) { [18:41:19.418] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:19.418] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:19.418] } [18:41:19.418] ...future.result <- base::tryCatch({ [18:41:19.418] base::withCallingHandlers({ [18:41:19.418] ...future.value <- base::withVisible(base::local({ [18:41:19.418] do.call(function(...) { [18:41:19.418] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:19.418] if (!identical(...future.globals.maxSize.org, [18:41:19.418] ...future.globals.maxSize)) { [18:41:19.418] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:19.418] on.exit(options(oopts), add = TRUE) [18:41:19.418] } [18:41:19.418] { [18:41:19.418] lapply(seq_along(...future.elements_ii), [18:41:19.418] FUN = function(jj) { [18:41:19.418] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:19.418] ...future.FUN(...future.X_jj, ...) [18:41:19.418] }) [18:41:19.418] } [18:41:19.418] }, args = future.call.arguments) [18:41:19.418] })) [18:41:19.418] future::FutureResult(value = ...future.value$value, [18:41:19.418] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:19.418] ...future.rng), globalenv = if (FALSE) [18:41:19.418] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:19.418] ...future.globalenv.names)) [18:41:19.418] else NULL, started = ...future.startTime, version = "1.8") [18:41:19.418] }, condition = base::local({ [18:41:19.418] c <- base::c [18:41:19.418] inherits <- base::inherits [18:41:19.418] invokeRestart <- base::invokeRestart [18:41:19.418] length <- base::length [18:41:19.418] list <- base::list [18:41:19.418] seq.int <- base::seq.int [18:41:19.418] signalCondition <- base::signalCondition [18:41:19.418] sys.calls <- base::sys.calls [18:41:19.418] `[[` <- base::`[[` [18:41:19.418] `+` <- base::`+` [18:41:19.418] `<<-` <- base::`<<-` [18:41:19.418] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:19.418] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:19.418] 3L)] [18:41:19.418] } [18:41:19.418] function(cond) { [18:41:19.418] is_error <- inherits(cond, "error") [18:41:19.418] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:19.418] NULL) [18:41:19.418] if (is_error) { [18:41:19.418] sessionInformation <- function() { [18:41:19.418] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:19.418] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:19.418] search = base::search(), system = base::Sys.info()) [18:41:19.418] } [18:41:19.418] ...future.conditions[[length(...future.conditions) + [18:41:19.418] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:19.418] cond$call), session = sessionInformation(), [18:41:19.418] timestamp = base::Sys.time(), signaled = 0L) [18:41:19.418] signalCondition(cond) [18:41:19.418] } [18:41:19.418] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:19.418] "immediateCondition"))) { [18:41:19.418] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:19.418] ...future.conditions[[length(...future.conditions) + [18:41:19.418] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:19.418] if (TRUE && !signal) { [18:41:19.418] muffleCondition <- function (cond, pattern = "^muffle") [18:41:19.418] { [18:41:19.418] inherits <- base::inherits [18:41:19.418] invokeRestart <- base::invokeRestart [18:41:19.418] is.null <- base::is.null [18:41:19.418] muffled <- FALSE [18:41:19.418] if (inherits(cond, "message")) { [18:41:19.418] muffled <- grepl(pattern, "muffleMessage") [18:41:19.418] if (muffled) [18:41:19.418] invokeRestart("muffleMessage") [18:41:19.418] } [18:41:19.418] else if (inherits(cond, "warning")) { [18:41:19.418] muffled <- grepl(pattern, "muffleWarning") [18:41:19.418] if (muffled) [18:41:19.418] invokeRestart("muffleWarning") [18:41:19.418] } [18:41:19.418] else if (inherits(cond, "condition")) { [18:41:19.418] if (!is.null(pattern)) { [18:41:19.418] computeRestarts <- base::computeRestarts [18:41:19.418] grepl <- base::grepl [18:41:19.418] restarts <- computeRestarts(cond) [18:41:19.418] for (restart in restarts) { [18:41:19.418] name <- restart$name [18:41:19.418] if (is.null(name)) [18:41:19.418] next [18:41:19.418] if (!grepl(pattern, name)) [18:41:19.418] next [18:41:19.418] invokeRestart(restart) [18:41:19.418] muffled <- TRUE [18:41:19.418] break [18:41:19.418] } [18:41:19.418] } [18:41:19.418] } [18:41:19.418] invisible(muffled) [18:41:19.418] } [18:41:19.418] muffleCondition(cond, pattern = "^muffle") [18:41:19.418] } [18:41:19.418] } [18:41:19.418] else { [18:41:19.418] if (TRUE) { [18:41:19.418] muffleCondition <- function (cond, pattern = "^muffle") [18:41:19.418] { [18:41:19.418] inherits <- base::inherits [18:41:19.418] invokeRestart <- base::invokeRestart [18:41:19.418] is.null <- base::is.null [18:41:19.418] muffled <- FALSE [18:41:19.418] if (inherits(cond, "message")) { [18:41:19.418] muffled <- grepl(pattern, "muffleMessage") [18:41:19.418] if (muffled) [18:41:19.418] invokeRestart("muffleMessage") [18:41:19.418] } [18:41:19.418] else if (inherits(cond, "warning")) { [18:41:19.418] muffled <- grepl(pattern, "muffleWarning") [18:41:19.418] if (muffled) [18:41:19.418] invokeRestart("muffleWarning") [18:41:19.418] } [18:41:19.418] else if (inherits(cond, "condition")) { [18:41:19.418] if (!is.null(pattern)) { [18:41:19.418] computeRestarts <- base::computeRestarts [18:41:19.418] grepl <- base::grepl [18:41:19.418] restarts <- computeRestarts(cond) [18:41:19.418] for (restart in restarts) { [18:41:19.418] name <- restart$name [18:41:19.418] if (is.null(name)) [18:41:19.418] next [18:41:19.418] if (!grepl(pattern, name)) [18:41:19.418] next [18:41:19.418] invokeRestart(restart) [18:41:19.418] muffled <- TRUE [18:41:19.418] break [18:41:19.418] } [18:41:19.418] } [18:41:19.418] } [18:41:19.418] invisible(muffled) [18:41:19.418] } [18:41:19.418] muffleCondition(cond, pattern = "^muffle") [18:41:19.418] } [18:41:19.418] } [18:41:19.418] } [18:41:19.418] })) [18:41:19.418] }, error = function(ex) { [18:41:19.418] base::structure(base::list(value = NULL, visible = NULL, [18:41:19.418] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:19.418] ...future.rng), started = ...future.startTime, [18:41:19.418] finished = Sys.time(), session_uuid = NA_character_, [18:41:19.418] version = "1.8"), class = "FutureResult") [18:41:19.418] }, finally = { [18:41:19.418] if (!identical(...future.workdir, getwd())) [18:41:19.418] setwd(...future.workdir) [18:41:19.418] { [18:41:19.418] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:19.418] ...future.oldOptions$nwarnings <- NULL [18:41:19.418] } [18:41:19.418] base::options(...future.oldOptions) [18:41:19.418] if (.Platform$OS.type == "windows") { [18:41:19.418] old_names <- names(...future.oldEnvVars) [18:41:19.418] envs <- base::Sys.getenv() [18:41:19.418] names <- names(envs) [18:41:19.418] common <- intersect(names, old_names) [18:41:19.418] added <- setdiff(names, old_names) [18:41:19.418] removed <- setdiff(old_names, names) [18:41:19.418] changed <- common[...future.oldEnvVars[common] != [18:41:19.418] envs[common]] [18:41:19.418] NAMES <- toupper(changed) [18:41:19.418] args <- list() [18:41:19.418] for (kk in seq_along(NAMES)) { [18:41:19.418] name <- changed[[kk]] [18:41:19.418] NAME <- NAMES[[kk]] [18:41:19.418] if (name != NAME && is.element(NAME, old_names)) [18:41:19.418] next [18:41:19.418] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:19.418] } [18:41:19.418] NAMES <- toupper(added) [18:41:19.418] for (kk in seq_along(NAMES)) { [18:41:19.418] name <- added[[kk]] [18:41:19.418] NAME <- NAMES[[kk]] [18:41:19.418] if (name != NAME && is.element(NAME, old_names)) [18:41:19.418] next [18:41:19.418] args[[name]] <- "" [18:41:19.418] } [18:41:19.418] NAMES <- toupper(removed) [18:41:19.418] for (kk in seq_along(NAMES)) { [18:41:19.418] name <- removed[[kk]] [18:41:19.418] NAME <- NAMES[[kk]] [18:41:19.418] if (name != NAME && is.element(NAME, old_names)) [18:41:19.418] next [18:41:19.418] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:19.418] } [18:41:19.418] if (length(args) > 0) [18:41:19.418] base::do.call(base::Sys.setenv, args = args) [18:41:19.418] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:19.418] } [18:41:19.418] else { [18:41:19.418] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:19.418] } [18:41:19.418] { [18:41:19.418] if (base::length(...future.futureOptionsAdded) > [18:41:19.418] 0L) { [18:41:19.418] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:19.418] base::names(opts) <- ...future.futureOptionsAdded [18:41:19.418] base::options(opts) [18:41:19.418] } [18:41:19.418] { [18:41:19.418] { [18:41:19.418] NULL [18:41:19.418] RNGkind("Mersenne-Twister") [18:41:19.418] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:19.418] inherits = FALSE) [18:41:19.418] } [18:41:19.418] options(future.plan = NULL) [18:41:19.418] if (is.na(NA_character_)) [18:41:19.418] Sys.unsetenv("R_FUTURE_PLAN") [18:41:19.418] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:19.418] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:19.418] .init = FALSE) [18:41:19.418] } [18:41:19.418] } [18:41:19.418] } [18:41:19.418] }) [18:41:19.418] if (TRUE) { [18:41:19.418] base::sink(type = "output", split = FALSE) [18:41:19.418] if (TRUE) { [18:41:19.418] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:19.418] } [18:41:19.418] else { [18:41:19.418] ...future.result["stdout"] <- base::list(NULL) [18:41:19.418] } [18:41:19.418] base::close(...future.stdout) [18:41:19.418] ...future.stdout <- NULL [18:41:19.418] } [18:41:19.418] ...future.result$conditions <- ...future.conditions [18:41:19.418] ...future.result$finished <- base::Sys.time() [18:41:19.418] ...future.result [18:41:19.418] } [18:41:19.422] assign_globals() ... [18:41:19.422] List of 5 [18:41:19.422] $ ...future.FUN :function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [18:41:19.422] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [18:41:19.422] $ future.call.arguments :List of 2 [18:41:19.422] ..$ collapse: chr "; " [18:41:19.422] ..$ maxHead : int 3 [18:41:19.422] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:19.422] $ ...future.elements_ii :List of 1 [18:41:19.422] ..$ a: Named chr [1:101] "hello" "1" "2" "3" ... [18:41:19.422] .. ..- attr(*, "names")= chr [1:101] "" "b1" "b2" "b3" ... [18:41:19.422] $ ...future.seeds_ii : NULL [18:41:19.422] $ ...future.globals.maxSize: NULL [18:41:19.422] - attr(*, "where")=List of 5 [18:41:19.422] ..$ ...future.FUN : [18:41:19.422] ..$ future.call.arguments : [18:41:19.422] ..$ ...future.elements_ii : [18:41:19.422] ..$ ...future.seeds_ii : [18:41:19.422] ..$ ...future.globals.maxSize: [18:41:19.422] - attr(*, "resolved")= logi FALSE [18:41:19.422] - attr(*, "total_size")= num 20741 [18:41:19.422] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:19.422] - attr(*, "already-done")= logi TRUE [18:41:19.429] - copied '...future.FUN' to environment [18:41:19.429] - copied 'future.call.arguments' to environment [18:41:19.429] - copied '...future.elements_ii' to environment [18:41:19.429] - copied '...future.seeds_ii' to environment [18:41:19.430] - copied '...future.globals.maxSize' to environment [18:41:19.430] assign_globals() ... done [18:41:19.431] plan(): Setting new future strategy stack: [18:41:19.431] List of future strategies: [18:41:19.431] 1. sequential: [18:41:19.431] - args: function (..., envir = parent.frame(), workers = "") [18:41:19.431] - tweaked: FALSE [18:41:19.431] - call: NULL [18:41:19.431] plan(): nbrOfWorkers() = 1 [18:41:19.433] plan(): Setting new future strategy stack: [18:41:19.433] List of future strategies: [18:41:19.433] 1. multisession: [18:41:19.433] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:41:19.433] - tweaked: FALSE [18:41:19.433] - call: plan(strategy) [18:41:19.435] plan(): nbrOfWorkers() = 1 [18:41:19.435] SequentialFuture started (and completed) [18:41:19.436] - Launch lazy future ... done [18:41:19.436] run() for 'SequentialFuture' ... done [18:41:19.436] Created future: [18:41:19.436] SequentialFuture: [18:41:19.436] Label: 'future_lapply-1' [18:41:19.436] Expression: [18:41:19.436] { [18:41:19.436] do.call(function(...) { [18:41:19.436] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:19.436] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:19.436] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:19.436] on.exit(options(oopts), add = TRUE) [18:41:19.436] } [18:41:19.436] { [18:41:19.436] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:19.436] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:19.436] ...future.FUN(...future.X_jj, ...) [18:41:19.436] }) [18:41:19.436] } [18:41:19.436] }, args = future.call.arguments) [18:41:19.436] } [18:41:19.436] Lazy evaluation: FALSE [18:41:19.436] Asynchronous evaluation: FALSE [18:41:19.436] Local evaluation: TRUE [18:41:19.436] Environment: R_GlobalEnv [18:41:19.436] Capture standard output: TRUE [18:41:19.436] Capture condition classes: 'condition' (excluding 'nothing') [18:41:19.436] Globals: 5 objects totaling 9.56 KiB (function '...future.FUN' of 7.17 KiB, DotDotDotList 'future.call.arguments' of 187 bytes, list '...future.elements_ii' of 2.15 KiB, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:19.436] Packages: 1 packages ('future') [18:41:19.436] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:19.436] Resolved: TRUE [18:41:19.436] Value: 68 bytes of class 'list' [18:41:19.436] Early signaling: FALSE [18:41:19.436] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:19.436] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:19.437] Chunk #1 of 1 ... DONE [18:41:19.437] Launching 1 futures (chunks) ... DONE [18:41:19.438] Resolving 1 futures (chunks) ... [18:41:19.438] resolve() on list ... [18:41:19.438] recursive: 0 [18:41:19.438] length: 1 [18:41:19.438] [18:41:19.438] resolved() for 'SequentialFuture' ... [18:41:19.439] - state: 'finished' [18:41:19.439] - run: TRUE [18:41:19.439] - result: 'FutureResult' [18:41:19.439] resolved() for 'SequentialFuture' ... done [18:41:19.439] Future #1 [18:41:19.440] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:19.440] - nx: 1 [18:41:19.440] - relay: TRUE [18:41:19.440] - stdout: TRUE [18:41:19.440] - signal: TRUE [18:41:19.440] - resignal: FALSE [18:41:19.441] - force: TRUE [18:41:19.441] - relayed: [n=1] FALSE [18:41:19.441] - queued futures: [n=1] FALSE [18:41:19.441] - until=1 [18:41:19.441] - relaying element #1 [18:41:19.441] - relayed: [n=1] TRUE [18:41:19.442] - queued futures: [n=1] TRUE [18:41:19.442] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:19.442] length: 0 (resolved future 1) [18:41:19.442] Relaying remaining futures [18:41:19.442] signalConditionsASAP(NULL, pos=0) ... [18:41:19.442] - nx: 1 [18:41:19.443] - relay: TRUE [18:41:19.443] - stdout: TRUE [18:41:19.443] - signal: TRUE [18:41:19.443] - resignal: FALSE [18:41:19.443] - force: TRUE [18:41:19.443] - relayed: [n=1] TRUE [18:41:19.444] - queued futures: [n=1] TRUE - flush all [18:41:19.444] - relayed: [n=1] TRUE [18:41:19.444] - queued futures: [n=1] TRUE [18:41:19.444] signalConditionsASAP(NULL, pos=0) ... done [18:41:19.444] resolve() on list ... DONE [18:41:19.444] - Number of value chunks collected: 1 [18:41:19.445] Resolving 1 futures (chunks) ... DONE [18:41:19.445] Reducing values from 1 chunks ... [18:41:19.445] - Number of values collected after concatenation: 1 [18:41:19.445] - Number of values expected: 1 [18:41:19.445] Reducing values from 1 chunks ... DONE [18:41:19.445] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [18:41:19.446] future_lapply() ... [18:41:19.449] Number of chunks: 1 [18:41:19.449] Index remapping (attribute 'ordering'): [n = 2] 2, 1 [18:41:19.450] getGlobalsAndPackagesXApply() ... [18:41:19.450] - future.globals: TRUE [18:41:19.450] getGlobalsAndPackages() ... [18:41:19.450] Searching for globals... [18:41:19.451] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [18:41:19.452] Searching for globals ... DONE [18:41:19.452] Resolving globals: FALSE [18:41:19.452] The total size of the 1 globals is 911 bytes (911 bytes) [18:41:19.453] The total size of the 1 globals exported for future expression ('FUN()') is 911 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (911 bytes of class 'function') [18:41:19.453] - globals: [1] 'FUN' [18:41:19.453] - packages: [1] 'listenv' [18:41:19.453] getGlobalsAndPackages() ... DONE [18:41:19.453] - globals found/used: [n=1] 'FUN' [18:41:19.454] - needed namespaces: [n=1] 'listenv' [18:41:19.454] Finding globals ... DONE [18:41:19.454] - use_args: TRUE [18:41:19.454] - Getting '...' globals ... [18:41:19.455] resolve() on list ... [18:41:19.455] recursive: 0 [18:41:19.455] length: 1 [18:41:19.455] elements: '...' [18:41:19.455] length: 0 (resolved future 1) [18:41:19.455] resolve() on list ... DONE [18:41:19.456] - '...' content: [n=0] [18:41:19.456] List of 1 [18:41:19.456] $ ...: list() [18:41:19.456] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:19.456] - attr(*, "where")=List of 1 [18:41:19.456] ..$ ...: [18:41:19.456] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:19.456] - attr(*, "resolved")= logi TRUE [18:41:19.456] - attr(*, "total_size")= num NA [18:41:19.459] - Getting '...' globals ... DONE [18:41:19.459] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:19.459] List of 2 [18:41:19.459] $ ...future.FUN:function (x, ...) [18:41:19.459] $ ... : list() [18:41:19.459] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:19.459] - attr(*, "where")=List of 2 [18:41:19.459] ..$ ...future.FUN: [18:41:19.459] ..$ ... : [18:41:19.459] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:19.459] - attr(*, "resolved")= logi FALSE [18:41:19.459] - attr(*, "total_size")= int 8620 [18:41:19.462] Packages to be attached in all futures: [n=1] 'listenv' [18:41:19.462] getGlobalsAndPackagesXApply() ... DONE [18:41:19.463] Number of futures (= number of chunks): 1 [18:41:19.463] Launching 1 futures (chunks) ... [18:41:19.463] Chunk #1 of 1 ... [18:41:19.463] - Finding globals in 'X' for chunk #1 ... [18:41:19.463] getGlobalsAndPackages() ... [18:41:19.464] Searching for globals... [18:41:19.464] [18:41:19.464] Searching for globals ... DONE [18:41:19.464] - globals: [0] [18:41:19.465] getGlobalsAndPackages() ... DONE [18:41:19.465] + additional globals found: [n=0] [18:41:19.465] + additional namespaces needed: [n=0] [18:41:19.465] - Finding globals in 'X' for chunk #1 ... DONE [18:41:19.465] - seeds: [18:41:19.465] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.466] getGlobalsAndPackages() ... [18:41:19.466] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.466] Resolving globals: FALSE [18:41:19.466] Tweak future expression to call with '...' arguments ... [18:41:19.466] { [18:41:19.466] do.call(function(...) { [18:41:19.466] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:19.466] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:19.466] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:19.466] on.exit(options(oopts), add = TRUE) [18:41:19.466] } [18:41:19.466] { [18:41:19.466] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:19.466] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:19.466] ...future.FUN(...future.X_jj, ...) [18:41:19.466] }) [18:41:19.466] } [18:41:19.466] }, args = future.call.arguments) [18:41:19.466] } [18:41:19.467] Tweak future expression to call with '...' arguments ... DONE [18:41:19.467] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.467] - packages: [1] 'listenv' [18:41:19.468] getGlobalsAndPackages() ... DONE [18:41:19.468] run() for 'Future' ... [18:41:19.468] - state: 'created' [18:41:19.468] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:19.471] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:19.471] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:19.471] - Field: 'label' [18:41:19.471] - Field: 'local' [18:41:19.471] - Field: 'owner' [18:41:19.472] - Field: 'envir' [18:41:19.472] - Field: 'packages' [18:41:19.472] - Field: 'gc' [18:41:19.472] - Field: 'conditions' [18:41:19.472] - Field: 'expr' [18:41:19.472] - Field: 'uuid' [18:41:19.473] - Field: 'seed' [18:41:19.473] - Field: 'version' [18:41:19.473] - Field: 'result' [18:41:19.473] - Field: 'asynchronous' [18:41:19.473] - Field: 'calls' [18:41:19.473] - Field: 'globals' [18:41:19.474] - Field: 'stdout' [18:41:19.474] - Field: 'earlySignal' [18:41:19.474] - Field: 'lazy' [18:41:19.474] - Field: 'state' [18:41:19.474] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:19.474] - Launch lazy future ... [18:41:19.475] Packages needed by the future expression (n = 1): 'listenv' [18:41:19.475] Packages needed by future strategies (n = 0): [18:41:19.476] { [18:41:19.476] { [18:41:19.476] { [18:41:19.476] ...future.startTime <- base::Sys.time() [18:41:19.476] { [18:41:19.476] { [18:41:19.476] { [18:41:19.476] { [18:41:19.476] base::local({ [18:41:19.476] has_future <- base::requireNamespace("future", [18:41:19.476] quietly = TRUE) [18:41:19.476] if (has_future) { [18:41:19.476] ns <- base::getNamespace("future") [18:41:19.476] version <- ns[[".package"]][["version"]] [18:41:19.476] if (is.null(version)) [18:41:19.476] version <- utils::packageVersion("future") [18:41:19.476] } [18:41:19.476] else { [18:41:19.476] version <- NULL [18:41:19.476] } [18:41:19.476] if (!has_future || version < "1.8.0") { [18:41:19.476] info <- base::c(r_version = base::gsub("R version ", [18:41:19.476] "", base::R.version$version.string), [18:41:19.476] platform = base::sprintf("%s (%s-bit)", [18:41:19.476] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:19.476] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:19.476] "release", "version")], collapse = " "), [18:41:19.476] hostname = base::Sys.info()[["nodename"]]) [18:41:19.476] info <- base::sprintf("%s: %s", base::names(info), [18:41:19.476] info) [18:41:19.476] info <- base::paste(info, collapse = "; ") [18:41:19.476] if (!has_future) { [18:41:19.476] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:19.476] info) [18:41:19.476] } [18:41:19.476] else { [18:41:19.476] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:19.476] info, version) [18:41:19.476] } [18:41:19.476] base::stop(msg) [18:41:19.476] } [18:41:19.476] }) [18:41:19.476] } [18:41:19.476] base::local({ [18:41:19.476] for (pkg in "listenv") { [18:41:19.476] base::loadNamespace(pkg) [18:41:19.476] base::library(pkg, character.only = TRUE) [18:41:19.476] } [18:41:19.476] }) [18:41:19.476] } [18:41:19.476] ...future.strategy.old <- future::plan("list") [18:41:19.476] options(future.plan = NULL) [18:41:19.476] Sys.unsetenv("R_FUTURE_PLAN") [18:41:19.476] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:19.476] } [18:41:19.476] ...future.workdir <- getwd() [18:41:19.476] } [18:41:19.476] ...future.oldOptions <- base::as.list(base::.Options) [18:41:19.476] ...future.oldEnvVars <- base::Sys.getenv() [18:41:19.476] } [18:41:19.476] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:19.476] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:19.476] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:19.476] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:19.476] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:19.476] future.stdout.windows.reencode = NULL, width = 80L) [18:41:19.476] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:19.476] base::names(...future.oldOptions)) [18:41:19.476] } [18:41:19.476] if (FALSE) { [18:41:19.476] } [18:41:19.476] else { [18:41:19.476] if (TRUE) { [18:41:19.476] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:19.476] open = "w") [18:41:19.476] } [18:41:19.476] else { [18:41:19.476] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:19.476] windows = "NUL", "/dev/null"), open = "w") [18:41:19.476] } [18:41:19.476] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:19.476] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:19.476] base::sink(type = "output", split = FALSE) [18:41:19.476] base::close(...future.stdout) [18:41:19.476] }, add = TRUE) [18:41:19.476] } [18:41:19.476] ...future.frame <- base::sys.nframe() [18:41:19.476] ...future.conditions <- base::list() [18:41:19.476] ...future.rng <- base::globalenv()$.Random.seed [18:41:19.476] if (FALSE) { [18:41:19.476] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:19.476] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:19.476] } [18:41:19.476] ...future.result <- base::tryCatch({ [18:41:19.476] base::withCallingHandlers({ [18:41:19.476] ...future.value <- base::withVisible(base::local({ [18:41:19.476] do.call(function(...) { [18:41:19.476] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:19.476] if (!identical(...future.globals.maxSize.org, [18:41:19.476] ...future.globals.maxSize)) { [18:41:19.476] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:19.476] on.exit(options(oopts), add = TRUE) [18:41:19.476] } [18:41:19.476] { [18:41:19.476] lapply(seq_along(...future.elements_ii), [18:41:19.476] FUN = function(jj) { [18:41:19.476] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:19.476] ...future.FUN(...future.X_jj, ...) [18:41:19.476] }) [18:41:19.476] } [18:41:19.476] }, args = future.call.arguments) [18:41:19.476] })) [18:41:19.476] future::FutureResult(value = ...future.value$value, [18:41:19.476] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:19.476] ...future.rng), globalenv = if (FALSE) [18:41:19.476] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:19.476] ...future.globalenv.names)) [18:41:19.476] else NULL, started = ...future.startTime, version = "1.8") [18:41:19.476] }, condition = base::local({ [18:41:19.476] c <- base::c [18:41:19.476] inherits <- base::inherits [18:41:19.476] invokeRestart <- base::invokeRestart [18:41:19.476] length <- base::length [18:41:19.476] list <- base::list [18:41:19.476] seq.int <- base::seq.int [18:41:19.476] signalCondition <- base::signalCondition [18:41:19.476] sys.calls <- base::sys.calls [18:41:19.476] `[[` <- base::`[[` [18:41:19.476] `+` <- base::`+` [18:41:19.476] `<<-` <- base::`<<-` [18:41:19.476] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:19.476] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:19.476] 3L)] [18:41:19.476] } [18:41:19.476] function(cond) { [18:41:19.476] is_error <- inherits(cond, "error") [18:41:19.476] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:19.476] NULL) [18:41:19.476] if (is_error) { [18:41:19.476] sessionInformation <- function() { [18:41:19.476] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:19.476] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:19.476] search = base::search(), system = base::Sys.info()) [18:41:19.476] } [18:41:19.476] ...future.conditions[[length(...future.conditions) + [18:41:19.476] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:19.476] cond$call), session = sessionInformation(), [18:41:19.476] timestamp = base::Sys.time(), signaled = 0L) [18:41:19.476] signalCondition(cond) [18:41:19.476] } [18:41:19.476] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:19.476] "immediateCondition"))) { [18:41:19.476] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:19.476] ...future.conditions[[length(...future.conditions) + [18:41:19.476] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:19.476] if (TRUE && !signal) { [18:41:19.476] muffleCondition <- function (cond, pattern = "^muffle") [18:41:19.476] { [18:41:19.476] inherits <- base::inherits [18:41:19.476] invokeRestart <- base::invokeRestart [18:41:19.476] is.null <- base::is.null [18:41:19.476] muffled <- FALSE [18:41:19.476] if (inherits(cond, "message")) { [18:41:19.476] muffled <- grepl(pattern, "muffleMessage") [18:41:19.476] if (muffled) [18:41:19.476] invokeRestart("muffleMessage") [18:41:19.476] } [18:41:19.476] else if (inherits(cond, "warning")) { [18:41:19.476] muffled <- grepl(pattern, "muffleWarning") [18:41:19.476] if (muffled) [18:41:19.476] invokeRestart("muffleWarning") [18:41:19.476] } [18:41:19.476] else if (inherits(cond, "condition")) { [18:41:19.476] if (!is.null(pattern)) { [18:41:19.476] computeRestarts <- base::computeRestarts [18:41:19.476] grepl <- base::grepl [18:41:19.476] restarts <- computeRestarts(cond) [18:41:19.476] for (restart in restarts) { [18:41:19.476] name <- restart$name [18:41:19.476] if (is.null(name)) [18:41:19.476] next [18:41:19.476] if (!grepl(pattern, name)) [18:41:19.476] next [18:41:19.476] invokeRestart(restart) [18:41:19.476] muffled <- TRUE [18:41:19.476] break [18:41:19.476] } [18:41:19.476] } [18:41:19.476] } [18:41:19.476] invisible(muffled) [18:41:19.476] } [18:41:19.476] muffleCondition(cond, pattern = "^muffle") [18:41:19.476] } [18:41:19.476] } [18:41:19.476] else { [18:41:19.476] if (TRUE) { [18:41:19.476] muffleCondition <- function (cond, pattern = "^muffle") [18:41:19.476] { [18:41:19.476] inherits <- base::inherits [18:41:19.476] invokeRestart <- base::invokeRestart [18:41:19.476] is.null <- base::is.null [18:41:19.476] muffled <- FALSE [18:41:19.476] if (inherits(cond, "message")) { [18:41:19.476] muffled <- grepl(pattern, "muffleMessage") [18:41:19.476] if (muffled) [18:41:19.476] invokeRestart("muffleMessage") [18:41:19.476] } [18:41:19.476] else if (inherits(cond, "warning")) { [18:41:19.476] muffled <- grepl(pattern, "muffleWarning") [18:41:19.476] if (muffled) [18:41:19.476] invokeRestart("muffleWarning") [18:41:19.476] } [18:41:19.476] else if (inherits(cond, "condition")) { [18:41:19.476] if (!is.null(pattern)) { [18:41:19.476] computeRestarts <- base::computeRestarts [18:41:19.476] grepl <- base::grepl [18:41:19.476] restarts <- computeRestarts(cond) [18:41:19.476] for (restart in restarts) { [18:41:19.476] name <- restart$name [18:41:19.476] if (is.null(name)) [18:41:19.476] next [18:41:19.476] if (!grepl(pattern, name)) [18:41:19.476] next [18:41:19.476] invokeRestart(restart) [18:41:19.476] muffled <- TRUE [18:41:19.476] break [18:41:19.476] } [18:41:19.476] } [18:41:19.476] } [18:41:19.476] invisible(muffled) [18:41:19.476] } [18:41:19.476] muffleCondition(cond, pattern = "^muffle") [18:41:19.476] } [18:41:19.476] } [18:41:19.476] } [18:41:19.476] })) [18:41:19.476] }, error = function(ex) { [18:41:19.476] base::structure(base::list(value = NULL, visible = NULL, [18:41:19.476] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:19.476] ...future.rng), started = ...future.startTime, [18:41:19.476] finished = Sys.time(), session_uuid = NA_character_, [18:41:19.476] version = "1.8"), class = "FutureResult") [18:41:19.476] }, finally = { [18:41:19.476] if (!identical(...future.workdir, getwd())) [18:41:19.476] setwd(...future.workdir) [18:41:19.476] { [18:41:19.476] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:19.476] ...future.oldOptions$nwarnings <- NULL [18:41:19.476] } [18:41:19.476] base::options(...future.oldOptions) [18:41:19.476] if (.Platform$OS.type == "windows") { [18:41:19.476] old_names <- names(...future.oldEnvVars) [18:41:19.476] envs <- base::Sys.getenv() [18:41:19.476] names <- names(envs) [18:41:19.476] common <- intersect(names, old_names) [18:41:19.476] added <- setdiff(names, old_names) [18:41:19.476] removed <- setdiff(old_names, names) [18:41:19.476] changed <- common[...future.oldEnvVars[common] != [18:41:19.476] envs[common]] [18:41:19.476] NAMES <- toupper(changed) [18:41:19.476] args <- list() [18:41:19.476] for (kk in seq_along(NAMES)) { [18:41:19.476] name <- changed[[kk]] [18:41:19.476] NAME <- NAMES[[kk]] [18:41:19.476] if (name != NAME && is.element(NAME, old_names)) [18:41:19.476] next [18:41:19.476] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:19.476] } [18:41:19.476] NAMES <- toupper(added) [18:41:19.476] for (kk in seq_along(NAMES)) { [18:41:19.476] name <- added[[kk]] [18:41:19.476] NAME <- NAMES[[kk]] [18:41:19.476] if (name != NAME && is.element(NAME, old_names)) [18:41:19.476] next [18:41:19.476] args[[name]] <- "" [18:41:19.476] } [18:41:19.476] NAMES <- toupper(removed) [18:41:19.476] for (kk in seq_along(NAMES)) { [18:41:19.476] name <- removed[[kk]] [18:41:19.476] NAME <- NAMES[[kk]] [18:41:19.476] if (name != NAME && is.element(NAME, old_names)) [18:41:19.476] next [18:41:19.476] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:19.476] } [18:41:19.476] if (length(args) > 0) [18:41:19.476] base::do.call(base::Sys.setenv, args = args) [18:41:19.476] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:19.476] } [18:41:19.476] else { [18:41:19.476] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:19.476] } [18:41:19.476] { [18:41:19.476] if (base::length(...future.futureOptionsAdded) > [18:41:19.476] 0L) { [18:41:19.476] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:19.476] base::names(opts) <- ...future.futureOptionsAdded [18:41:19.476] base::options(opts) [18:41:19.476] } [18:41:19.476] { [18:41:19.476] { [18:41:19.476] NULL [18:41:19.476] RNGkind("Mersenne-Twister") [18:41:19.476] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:19.476] inherits = FALSE) [18:41:19.476] } [18:41:19.476] options(future.plan = NULL) [18:41:19.476] if (is.na(NA_character_)) [18:41:19.476] Sys.unsetenv("R_FUTURE_PLAN") [18:41:19.476] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:19.476] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:19.476] .init = FALSE) [18:41:19.476] } [18:41:19.476] } [18:41:19.476] } [18:41:19.476] }) [18:41:19.476] if (TRUE) { [18:41:19.476] base::sink(type = "output", split = FALSE) [18:41:19.476] if (TRUE) { [18:41:19.476] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:19.476] } [18:41:19.476] else { [18:41:19.476] ...future.result["stdout"] <- base::list(NULL) [18:41:19.476] } [18:41:19.476] base::close(...future.stdout) [18:41:19.476] ...future.stdout <- NULL [18:41:19.476] } [18:41:19.476] ...future.result$conditions <- ...future.conditions [18:41:19.476] ...future.result$finished <- base::Sys.time() [18:41:19.476] ...future.result [18:41:19.476] } [18:41:19.480] assign_globals() ... [18:41:19.480] List of 5 [18:41:19.480] $ ...future.FUN :function (x, ...) [18:41:19.480] $ future.call.arguments : list() [18:41:19.480] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:19.480] $ ...future.elements_ii :List of 2 [18:41:19.480] ..$ b:Classes 'listenv', 'environment' [18:41:19.480] ..$ a:Classes 'listenv', 'environment' [18:41:19.480] $ ...future.seeds_ii : NULL [18:41:19.480] $ ...future.globals.maxSize: NULL [18:41:19.480] - attr(*, "where")=List of 5 [18:41:19.480] ..$ ...future.FUN : [18:41:19.480] ..$ future.call.arguments : [18:41:19.480] ..$ ...future.elements_ii : [18:41:19.480] ..$ ...future.seeds_ii : [18:41:19.480] ..$ ...future.globals.maxSize: [18:41:19.480] - attr(*, "resolved")= logi FALSE [18:41:19.480] - attr(*, "total_size")= num 8620 [18:41:19.480] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:19.480] - attr(*, "already-done")= logi TRUE [18:41:19.486] - copied '...future.FUN' to environment [18:41:19.486] - copied 'future.call.arguments' to environment [18:41:19.486] - copied '...future.elements_ii' to environment [18:41:19.486] - copied '...future.seeds_ii' to environment [18:41:19.487] - copied '...future.globals.maxSize' to environment [18:41:19.487] assign_globals() ... done [18:41:19.487] plan(): Setting new future strategy stack: [18:41:19.488] List of future strategies: [18:41:19.488] 1. sequential: [18:41:19.488] - args: function (..., envir = parent.frame(), workers = "") [18:41:19.488] - tweaked: FALSE [18:41:19.488] - call: NULL [18:41:19.488] plan(): nbrOfWorkers() = 1 [18:41:19.489] plan(): Setting new future strategy stack: [18:41:19.490] List of future strategies: [18:41:19.490] 1. multisession: [18:41:19.490] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:41:19.490] - tweaked: FALSE [18:41:19.490] - call: plan(strategy) [18:41:19.492] plan(): nbrOfWorkers() = 1 [18:41:19.492] SequentialFuture started (and completed) [18:41:19.492] - Launch lazy future ... done [18:41:19.493] run() for 'SequentialFuture' ... done [18:41:19.493] Created future: [18:41:19.493] SequentialFuture: [18:41:19.493] Label: 'future_lapply-1' [18:41:19.493] Expression: [18:41:19.493] { [18:41:19.493] do.call(function(...) { [18:41:19.493] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:19.493] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:19.493] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:19.493] on.exit(options(oopts), add = TRUE) [18:41:19.493] } [18:41:19.493] { [18:41:19.493] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:19.493] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:19.493] ...future.FUN(...future.X_jj, ...) [18:41:19.493] }) [18:41:19.493] } [18:41:19.493] }, args = future.call.arguments) [18:41:19.493] } [18:41:19.493] Lazy evaluation: FALSE [18:41:19.493] Asynchronous evaluation: FALSE [18:41:19.493] Local evaluation: TRUE [18:41:19.493] Environment: R_GlobalEnv [18:41:19.493] Capture standard output: TRUE [18:41:19.493] Capture condition classes: 'condition' (excluding 'nothing') [18:41:19.493] Globals: 5 objects totaling 4.14 KiB (function '...future.FUN' of 911 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 3.10 KiB, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:19.493] Packages: 1 packages ('listenv') [18:41:19.493] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:19.493] Resolved: TRUE [18:41:19.493] Value: 154 bytes of class 'list' [18:41:19.493] Early signaling: FALSE [18:41:19.493] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:19.493] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:19.494] Chunk #1 of 1 ... DONE [18:41:19.494] Launching 1 futures (chunks) ... DONE [18:41:19.494] Resolving 1 futures (chunks) ... [18:41:19.495] resolve() on list ... [18:41:19.495] recursive: 0 [18:41:19.495] length: 1 [18:41:19.495] [18:41:19.495] resolved() for 'SequentialFuture' ... [18:41:19.495] - state: 'finished' [18:41:19.496] - run: TRUE [18:41:19.496] - result: 'FutureResult' [18:41:19.496] resolved() for 'SequentialFuture' ... done [18:41:19.496] Future #1 [18:41:19.496] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:19.497] - nx: 1 [18:41:19.497] - relay: TRUE [18:41:19.497] - stdout: TRUE [18:41:19.497] - signal: TRUE [18:41:19.497] - resignal: FALSE [18:41:19.497] - force: TRUE [18:41:19.497] - relayed: [n=1] FALSE [18:41:19.498] - queued futures: [n=1] FALSE [18:41:19.498] - until=1 [18:41:19.498] - relaying element #1 [18:41:19.498] - relayed: [n=1] TRUE [18:41:19.498] - queued futures: [n=1] TRUE [18:41:19.499] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:19.499] length: 0 (resolved future 1) [18:41:19.499] Relaying remaining futures [18:41:19.499] signalConditionsASAP(NULL, pos=0) ... [18:41:19.499] - nx: 1 [18:41:19.499] - relay: TRUE [18:41:19.499] - stdout: TRUE [18:41:19.500] - signal: TRUE [18:41:19.500] - resignal: FALSE [18:41:19.500] - force: TRUE [18:41:19.500] - relayed: [n=1] TRUE [18:41:19.500] - queued futures: [n=1] TRUE - flush all [18:41:19.500] - relayed: [n=1] TRUE [18:41:19.501] - queued futures: [n=1] TRUE [18:41:19.501] signalConditionsASAP(NULL, pos=0) ... done [18:41:19.501] resolve() on list ... DONE [18:41:19.501] - Number of value chunks collected: 1 [18:41:19.501] Resolving 1 futures (chunks) ... DONE [18:41:19.501] Reducing values from 1 chunks ... [18:41:19.502] - Number of values collected after concatenation: 2 [18:41:19.502] - Number of values expected: 2 [18:41:19.502] Reverse index remapping (attribute 'ordering'): [n = 2] 2, 1 [18:41:19.502] Reducing values from 1 chunks ... DONE [18:41:19.502] future_lapply() ... DONE List of 1 $ y:List of 2 ..$ a: Named chr "A" .. ..- attr(*, "names")= chr "A" ..$ b: Named chr [1:2] "A" "B" .. ..- attr(*, "names")= chr [1:2] "A" "B" - future_lapply(x, FUN, ...) for large length(x) ... [18:41:19.504] future_lapply() ... [18:41:19.507] Number of chunks: 1 [18:41:19.507] getGlobalsAndPackagesXApply() ... [18:41:19.507] - future.globals: TRUE [18:41:19.507] getGlobalsAndPackages() ... [18:41:19.508] Searching for globals... [18:41:19.509] - globals found: [4] 'FUN', 'sqrt', '+', 'a' [18:41:19.509] Searching for globals ... DONE [18:41:19.509] Resolving globals: FALSE [18:41:19.510] The total size of the 2 globals is 438 bytes (438 bytes) [18:41:19.510] The total size of the 2 globals exported for future expression ('FUN()') is 438 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There are two globals: 'FUN' (399 bytes of class 'function') and 'a' (39 bytes of class 'numeric') [18:41:19.511] - globals: [2] 'FUN', 'a' [18:41:19.511] [18:41:19.511] getGlobalsAndPackages() ... DONE [18:41:19.511] - globals found/used: [n=2] 'FUN', 'a' [18:41:19.511] - needed namespaces: [n=0] [18:41:19.512] Finding globals ... DONE [18:41:19.512] - use_args: TRUE [18:41:19.512] - Getting '...' globals ... [18:41:19.512] resolve() on list ... [18:41:19.512] recursive: 0 [18:41:19.515] length: 1 [18:41:19.515] elements: '...' [18:41:19.515] length: 0 (resolved future 1) [18:41:19.515] resolve() on list ... DONE [18:41:19.516] - '...' content: [n=0] [18:41:19.516] List of 1 [18:41:19.516] $ ...: list() [18:41:19.516] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:19.516] - attr(*, "where")=List of 1 [18:41:19.516] ..$ ...: [18:41:19.516] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:19.516] - attr(*, "resolved")= logi TRUE [18:41:19.516] - attr(*, "total_size")= num NA [18:41:19.519] - Getting '...' globals ... DONE [18:41:19.519] Globals to be used in all futures (chunks): [n=3] '...future.FUN', 'a', '...' [18:41:19.519] List of 3 [18:41:19.519] $ ...future.FUN:function (z) [18:41:19.519] $ a : num 3.14 [18:41:19.519] $ ... : list() [18:41:19.519] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:19.519] - attr(*, "where")=List of 3 [18:41:19.519] ..$ ...future.FUN: [18:41:19.519] ..$ a : [18:41:19.519] ..$ ... : [18:41:19.519] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:19.519] - attr(*, "resolved")= logi FALSE [18:41:19.519] - attr(*, "total_size")= int 4016 [18:41:19.523] Packages to be attached in all futures: [n=0] [18:41:19.523] getGlobalsAndPackagesXApply() ... DONE [18:41:19.523] Number of futures (= number of chunks): 1 [18:41:19.523] Launching 1 futures (chunks) ... [18:41:19.524] Chunk #1 of 1 ... [18:41:19.525] - Finding globals in 'X' for chunk #1 ... [18:41:19.526] getGlobalsAndPackages() ... [18:41:19.526] Searching for globals... [18:41:19.532] [18:41:19.532] Searching for globals ... DONE [18:41:19.532] - globals: [0] [18:41:19.533] getGlobalsAndPackages() ... DONE [18:41:19.533] + additional globals found: [n=0] [18:41:19.533] + additional namespaces needed: [n=0] [18:41:19.533] - Finding globals in 'X' for chunk #1 ... DONE [18:41:19.533] - seeds: [18:41:19.533] - All globals exported: [n=6] '...future.FUN', 'a', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.534] getGlobalsAndPackages() ... [18:41:19.534] - globals passed as-is: [6] '...future.FUN', 'a', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.534] Resolving globals: FALSE [18:41:19.534] Tweak future expression to call with '...' arguments ... [18:41:19.534] { [18:41:19.534] do.call(function(...) { [18:41:19.534] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:19.534] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:19.534] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:19.534] on.exit(options(oopts), add = TRUE) [18:41:19.534] } [18:41:19.534] { [18:41:19.534] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:19.534] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:19.534] ...future.FUN(...future.X_jj, ...) [18:41:19.534] }) [18:41:19.534] } [18:41:19.534] }, args = future.call.arguments) [18:41:19.534] } [18:41:19.535] Tweak future expression to call with '...' arguments ... DONE [18:41:19.535] - globals: [6] '...future.FUN', 'a', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.535] [18:41:19.536] getGlobalsAndPackages() ... DONE [18:41:19.536] run() for 'Future' ... [18:41:19.536] - state: 'created' [18:41:19.536] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:19.539] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:19.539] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:19.539] - Field: 'label' [18:41:19.539] - Field: 'local' [18:41:19.539] - Field: 'owner' [18:41:19.539] - Field: 'envir' [18:41:19.540] - Field: 'packages' [18:41:19.540] - Field: 'gc' [18:41:19.540] - Field: 'conditions' [18:41:19.540] - Field: 'expr' [18:41:19.540] - Field: 'uuid' [18:41:19.541] - Field: 'seed' [18:41:19.541] - Field: 'version' [18:41:19.541] - Field: 'result' [18:41:19.541] - Field: 'asynchronous' [18:41:19.541] - Field: 'calls' [18:41:19.541] - Field: 'globals' [18:41:19.542] - Field: 'stdout' [18:41:19.542] - Field: 'earlySignal' [18:41:19.542] - Field: 'lazy' [18:41:19.542] - Field: 'state' [18:41:19.542] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:19.542] - Launch lazy future ... [18:41:19.543] Packages needed by the future expression (n = 0): [18:41:19.543] Packages needed by future strategies (n = 0): [18:41:19.543] { [18:41:19.543] { [18:41:19.543] { [18:41:19.543] ...future.startTime <- base::Sys.time() [18:41:19.543] { [18:41:19.543] { [18:41:19.543] { [18:41:19.543] base::local({ [18:41:19.543] has_future <- base::requireNamespace("future", [18:41:19.543] quietly = TRUE) [18:41:19.543] if (has_future) { [18:41:19.543] ns <- base::getNamespace("future") [18:41:19.543] version <- ns[[".package"]][["version"]] [18:41:19.543] if (is.null(version)) [18:41:19.543] version <- utils::packageVersion("future") [18:41:19.543] } [18:41:19.543] else { [18:41:19.543] version <- NULL [18:41:19.543] } [18:41:19.543] if (!has_future || version < "1.8.0") { [18:41:19.543] info <- base::c(r_version = base::gsub("R version ", [18:41:19.543] "", base::R.version$version.string), [18:41:19.543] platform = base::sprintf("%s (%s-bit)", [18:41:19.543] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:19.543] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:19.543] "release", "version")], collapse = " "), [18:41:19.543] hostname = base::Sys.info()[["nodename"]]) [18:41:19.543] info <- base::sprintf("%s: %s", base::names(info), [18:41:19.543] info) [18:41:19.543] info <- base::paste(info, collapse = "; ") [18:41:19.543] if (!has_future) { [18:41:19.543] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:19.543] info) [18:41:19.543] } [18:41:19.543] else { [18:41:19.543] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:19.543] info, version) [18:41:19.543] } [18:41:19.543] base::stop(msg) [18:41:19.543] } [18:41:19.543] }) [18:41:19.543] } [18:41:19.543] ...future.strategy.old <- future::plan("list") [18:41:19.543] options(future.plan = NULL) [18:41:19.543] Sys.unsetenv("R_FUTURE_PLAN") [18:41:19.543] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:19.543] } [18:41:19.543] ...future.workdir <- getwd() [18:41:19.543] } [18:41:19.543] ...future.oldOptions <- base::as.list(base::.Options) [18:41:19.543] ...future.oldEnvVars <- base::Sys.getenv() [18:41:19.543] } [18:41:19.543] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:19.543] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:19.543] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:19.543] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:19.543] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:19.543] future.stdout.windows.reencode = NULL, width = 80L) [18:41:19.543] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:19.543] base::names(...future.oldOptions)) [18:41:19.543] } [18:41:19.543] if (FALSE) { [18:41:19.543] } [18:41:19.543] else { [18:41:19.543] if (TRUE) { [18:41:19.543] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:19.543] open = "w") [18:41:19.543] } [18:41:19.543] else { [18:41:19.543] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:19.543] windows = "NUL", "/dev/null"), open = "w") [18:41:19.543] } [18:41:19.543] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:19.543] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:19.543] base::sink(type = "output", split = FALSE) [18:41:19.543] base::close(...future.stdout) [18:41:19.543] }, add = TRUE) [18:41:19.543] } [18:41:19.543] ...future.frame <- base::sys.nframe() [18:41:19.543] ...future.conditions <- base::list() [18:41:19.543] ...future.rng <- base::globalenv()$.Random.seed [18:41:19.543] if (FALSE) { [18:41:19.543] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:19.543] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:19.543] } [18:41:19.543] ...future.result <- base::tryCatch({ [18:41:19.543] base::withCallingHandlers({ [18:41:19.543] ...future.value <- base::withVisible(base::local({ [18:41:19.543] do.call(function(...) { [18:41:19.543] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:19.543] if (!identical(...future.globals.maxSize.org, [18:41:19.543] ...future.globals.maxSize)) { [18:41:19.543] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:19.543] on.exit(options(oopts), add = TRUE) [18:41:19.543] } [18:41:19.543] { [18:41:19.543] lapply(seq_along(...future.elements_ii), [18:41:19.543] FUN = function(jj) { [18:41:19.543] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:19.543] ...future.FUN(...future.X_jj, ...) [18:41:19.543] }) [18:41:19.543] } [18:41:19.543] }, args = future.call.arguments) [18:41:19.543] })) [18:41:19.543] future::FutureResult(value = ...future.value$value, [18:41:19.543] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:19.543] ...future.rng), globalenv = if (FALSE) [18:41:19.543] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:19.543] ...future.globalenv.names)) [18:41:19.543] else NULL, started = ...future.startTime, version = "1.8") [18:41:19.543] }, condition = base::local({ [18:41:19.543] c <- base::c [18:41:19.543] inherits <- base::inherits [18:41:19.543] invokeRestart <- base::invokeRestart [18:41:19.543] length <- base::length [18:41:19.543] list <- base::list [18:41:19.543] seq.int <- base::seq.int [18:41:19.543] signalCondition <- base::signalCondition [18:41:19.543] sys.calls <- base::sys.calls [18:41:19.543] `[[` <- base::`[[` [18:41:19.543] `+` <- base::`+` [18:41:19.543] `<<-` <- base::`<<-` [18:41:19.543] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:19.543] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:19.543] 3L)] [18:41:19.543] } [18:41:19.543] function(cond) { [18:41:19.543] is_error <- inherits(cond, "error") [18:41:19.543] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:19.543] NULL) [18:41:19.543] if (is_error) { [18:41:19.543] sessionInformation <- function() { [18:41:19.543] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:19.543] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:19.543] search = base::search(), system = base::Sys.info()) [18:41:19.543] } [18:41:19.543] ...future.conditions[[length(...future.conditions) + [18:41:19.543] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:19.543] cond$call), session = sessionInformation(), [18:41:19.543] timestamp = base::Sys.time(), signaled = 0L) [18:41:19.543] signalCondition(cond) [18:41:19.543] } [18:41:19.543] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:19.543] "immediateCondition"))) { [18:41:19.543] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:19.543] ...future.conditions[[length(...future.conditions) + [18:41:19.543] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:19.543] if (TRUE && !signal) { [18:41:19.543] muffleCondition <- function (cond, pattern = "^muffle") [18:41:19.543] { [18:41:19.543] inherits <- base::inherits [18:41:19.543] invokeRestart <- base::invokeRestart [18:41:19.543] is.null <- base::is.null [18:41:19.543] muffled <- FALSE [18:41:19.543] if (inherits(cond, "message")) { [18:41:19.543] muffled <- grepl(pattern, "muffleMessage") [18:41:19.543] if (muffled) [18:41:19.543] invokeRestart("muffleMessage") [18:41:19.543] } [18:41:19.543] else if (inherits(cond, "warning")) { [18:41:19.543] muffled <- grepl(pattern, "muffleWarning") [18:41:19.543] if (muffled) [18:41:19.543] invokeRestart("muffleWarning") [18:41:19.543] } [18:41:19.543] else if (inherits(cond, "condition")) { [18:41:19.543] if (!is.null(pattern)) { [18:41:19.543] computeRestarts <- base::computeRestarts [18:41:19.543] grepl <- base::grepl [18:41:19.543] restarts <- computeRestarts(cond) [18:41:19.543] for (restart in restarts) { [18:41:19.543] name <- restart$name [18:41:19.543] if (is.null(name)) [18:41:19.543] next [18:41:19.543] if (!grepl(pattern, name)) [18:41:19.543] next [18:41:19.543] invokeRestart(restart) [18:41:19.543] muffled <- TRUE [18:41:19.543] break [18:41:19.543] } [18:41:19.543] } [18:41:19.543] } [18:41:19.543] invisible(muffled) [18:41:19.543] } [18:41:19.543] muffleCondition(cond, pattern = "^muffle") [18:41:19.543] } [18:41:19.543] } [18:41:19.543] else { [18:41:19.543] if (TRUE) { [18:41:19.543] muffleCondition <- function (cond, pattern = "^muffle") [18:41:19.543] { [18:41:19.543] inherits <- base::inherits [18:41:19.543] invokeRestart <- base::invokeRestart [18:41:19.543] is.null <- base::is.null [18:41:19.543] muffled <- FALSE [18:41:19.543] if (inherits(cond, "message")) { [18:41:19.543] muffled <- grepl(pattern, "muffleMessage") [18:41:19.543] if (muffled) [18:41:19.543] invokeRestart("muffleMessage") [18:41:19.543] } [18:41:19.543] else if (inherits(cond, "warning")) { [18:41:19.543] muffled <- grepl(pattern, "muffleWarning") [18:41:19.543] if (muffled) [18:41:19.543] invokeRestart("muffleWarning") [18:41:19.543] } [18:41:19.543] else if (inherits(cond, "condition")) { [18:41:19.543] if (!is.null(pattern)) { [18:41:19.543] computeRestarts <- base::computeRestarts [18:41:19.543] grepl <- base::grepl [18:41:19.543] restarts <- computeRestarts(cond) [18:41:19.543] for (restart in restarts) { [18:41:19.543] name <- restart$name [18:41:19.543] if (is.null(name)) [18:41:19.543] next [18:41:19.543] if (!grepl(pattern, name)) [18:41:19.543] next [18:41:19.543] invokeRestart(restart) [18:41:19.543] muffled <- TRUE [18:41:19.543] break [18:41:19.543] } [18:41:19.543] } [18:41:19.543] } [18:41:19.543] invisible(muffled) [18:41:19.543] } [18:41:19.543] muffleCondition(cond, pattern = "^muffle") [18:41:19.543] } [18:41:19.543] } [18:41:19.543] } [18:41:19.543] })) [18:41:19.543] }, error = function(ex) { [18:41:19.543] base::structure(base::list(value = NULL, visible = NULL, [18:41:19.543] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:19.543] ...future.rng), started = ...future.startTime, [18:41:19.543] finished = Sys.time(), session_uuid = NA_character_, [18:41:19.543] version = "1.8"), class = "FutureResult") [18:41:19.543] }, finally = { [18:41:19.543] if (!identical(...future.workdir, getwd())) [18:41:19.543] setwd(...future.workdir) [18:41:19.543] { [18:41:19.543] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:19.543] ...future.oldOptions$nwarnings <- NULL [18:41:19.543] } [18:41:19.543] base::options(...future.oldOptions) [18:41:19.543] if (.Platform$OS.type == "windows") { [18:41:19.543] old_names <- names(...future.oldEnvVars) [18:41:19.543] envs <- base::Sys.getenv() [18:41:19.543] names <- names(envs) [18:41:19.543] common <- intersect(names, old_names) [18:41:19.543] added <- setdiff(names, old_names) [18:41:19.543] removed <- setdiff(old_names, names) [18:41:19.543] changed <- common[...future.oldEnvVars[common] != [18:41:19.543] envs[common]] [18:41:19.543] NAMES <- toupper(changed) [18:41:19.543] args <- list() [18:41:19.543] for (kk in seq_along(NAMES)) { [18:41:19.543] name <- changed[[kk]] [18:41:19.543] NAME <- NAMES[[kk]] [18:41:19.543] if (name != NAME && is.element(NAME, old_names)) [18:41:19.543] next [18:41:19.543] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:19.543] } [18:41:19.543] NAMES <- toupper(added) [18:41:19.543] for (kk in seq_along(NAMES)) { [18:41:19.543] name <- added[[kk]] [18:41:19.543] NAME <- NAMES[[kk]] [18:41:19.543] if (name != NAME && is.element(NAME, old_names)) [18:41:19.543] next [18:41:19.543] args[[name]] <- "" [18:41:19.543] } [18:41:19.543] NAMES <- toupper(removed) [18:41:19.543] for (kk in seq_along(NAMES)) { [18:41:19.543] name <- removed[[kk]] [18:41:19.543] NAME <- NAMES[[kk]] [18:41:19.543] if (name != NAME && is.element(NAME, old_names)) [18:41:19.543] next [18:41:19.543] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:19.543] } [18:41:19.543] if (length(args) > 0) [18:41:19.543] base::do.call(base::Sys.setenv, args = args) [18:41:19.543] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:19.543] } [18:41:19.543] else { [18:41:19.543] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:19.543] } [18:41:19.543] { [18:41:19.543] if (base::length(...future.futureOptionsAdded) > [18:41:19.543] 0L) { [18:41:19.543] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:19.543] base::names(opts) <- ...future.futureOptionsAdded [18:41:19.543] base::options(opts) [18:41:19.543] } [18:41:19.543] { [18:41:19.543] { [18:41:19.543] NULL [18:41:19.543] RNGkind("Mersenne-Twister") [18:41:19.543] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:19.543] inherits = FALSE) [18:41:19.543] } [18:41:19.543] options(future.plan = NULL) [18:41:19.543] if (is.na(NA_character_)) [18:41:19.543] Sys.unsetenv("R_FUTURE_PLAN") [18:41:19.543] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:19.543] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:19.543] .init = FALSE) [18:41:19.543] } [18:41:19.543] } [18:41:19.543] } [18:41:19.543] }) [18:41:19.543] if (TRUE) { [18:41:19.543] base::sink(type = "output", split = FALSE) [18:41:19.543] if (TRUE) { [18:41:19.543] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:19.543] } [18:41:19.543] else { [18:41:19.543] ...future.result["stdout"] <- base::list(NULL) [18:41:19.543] } [18:41:19.543] base::close(...future.stdout) [18:41:19.543] ...future.stdout <- NULL [18:41:19.543] } [18:41:19.543] ...future.result$conditions <- ...future.conditions [18:41:19.543] ...future.result$finished <- base::Sys.time() [18:41:19.543] ...future.result [18:41:19.543] } [18:41:19.547] assign_globals() ... [18:41:19.547] List of 6 [18:41:19.547] $ ...future.FUN :function (z) [18:41:19.547] $ a : num 3.14 [18:41:19.547] $ future.call.arguments : list() [18:41:19.547] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:19.547] $ ...future.elements_ii :List of 10000 [18:41:19.547] ..$ : int 1 [18:41:19.547] ..$ : int 2 [18:41:19.547] ..$ : int 3 [18:41:19.547] ..$ : int 4 [18:41:19.547] ..$ : int 5 [18:41:19.547] ..$ : int 6 [18:41:19.547] ..$ : int 7 [18:41:19.547] ..$ : int 8 [18:41:19.547] ..$ : int 9 [18:41:19.547] ..$ : int 10 [18:41:19.547] ..$ : int 11 [18:41:19.547] ..$ : int 12 [18:41:19.547] ..$ : int 13 [18:41:19.547] ..$ : int 14 [18:41:19.547] ..$ : int 15 [18:41:19.547] ..$ : int 16 [18:41:19.547] ..$ : int 17 [18:41:19.547] ..$ : int 18 [18:41:19.547] ..$ : int 19 [18:41:19.547] ..$ : int 20 [18:41:19.547] ..$ : int 21 [18:41:19.547] ..$ : int 22 [18:41:19.547] ..$ : int 23 [18:41:19.547] ..$ : int 24 [18:41:19.547] ..$ : int 25 [18:41:19.547] ..$ : int 26 [18:41:19.547] ..$ : int 27 [18:41:19.547] ..$ : int 28 [18:41:19.547] ..$ : int 29 [18:41:19.547] ..$ : int 30 [18:41:19.547] ..$ : int 31 [18:41:19.547] ..$ : int 32 [18:41:19.547] ..$ : int 33 [18:41:19.547] ..$ : int 34 [18:41:19.547] ..$ : int 35 [18:41:19.547] ..$ : int 36 [18:41:19.547] ..$ : int 37 [18:41:19.547] ..$ : int 38 [18:41:19.547] ..$ : int 39 [18:41:19.547] ..$ : int 40 [18:41:19.547] ..$ : int 41 [18:41:19.547] ..$ : int 42 [18:41:19.547] ..$ : int 43 [18:41:19.547] ..$ : int 44 [18:41:19.547] ..$ : int 45 [18:41:19.547] ..$ : int 46 [18:41:19.547] ..$ : int 47 [18:41:19.547] ..$ : int 48 [18:41:19.547] ..$ : int 49 [18:41:19.547] ..$ : int 50 [18:41:19.547] ..$ : int 51 [18:41:19.547] ..$ : int 52 [18:41:19.547] ..$ : int 53 [18:41:19.547] ..$ : int 54 [18:41:19.547] ..$ : int 55 [18:41:19.547] ..$ : int 56 [18:41:19.547] ..$ : int 57 [18:41:19.547] ..$ : int 58 [18:41:19.547] ..$ : int 59 [18:41:19.547] ..$ : int 60 [18:41:19.547] ..$ : int 61 [18:41:19.547] ..$ : int 62 [18:41:19.547] ..$ : int 63 [18:41:19.547] ..$ : int 64 [18:41:19.547] ..$ : int 65 [18:41:19.547] ..$ : int 66 [18:41:19.547] ..$ : int 67 [18:41:19.547] ..$ : int 68 [18:41:19.547] ..$ : int 69 [18:41:19.547] ..$ : int 70 [18:41:19.547] ..$ : int 71 [18:41:19.547] ..$ : int 72 [18:41:19.547] ..$ : int 73 [18:41:19.547] ..$ : int 74 [18:41:19.547] ..$ : int 75 [18:41:19.547] ..$ : int 76 [18:41:19.547] ..$ : int 77 [18:41:19.547] ..$ : int 78 [18:41:19.547] ..$ : int 79 [18:41:19.547] ..$ : int 80 [18:41:19.547] ..$ : int 81 [18:41:19.547] ..$ : int 82 [18:41:19.547] ..$ : int 83 [18:41:19.547] ..$ : int 84 [18:41:19.547] ..$ : int 85 [18:41:19.547] ..$ : int 86 [18:41:19.547] ..$ : int 87 [18:41:19.547] ..$ : int 88 [18:41:19.547] ..$ : int 89 [18:41:19.547] ..$ : int 90 [18:41:19.547] ..$ : int 91 [18:41:19.547] ..$ : int 92 [18:41:19.547] ..$ : int 93 [18:41:19.547] ..$ : int 94 [18:41:19.547] ..$ : int 95 [18:41:19.547] ..$ : int 96 [18:41:19.547] ..$ : int 97 [18:41:19.547] ..$ : int 98 [18:41:19.547] ..$ : int 99 [18:41:19.547] .. [list output truncated] [18:41:19.547] $ ...future.seeds_ii : NULL [18:41:19.547] $ ...future.globals.maxSize: NULL [18:41:19.547] - attr(*, "where")=List of 6 [18:41:19.547] ..$ ...future.FUN : [18:41:19.547] ..$ a : [18:41:19.547] ..$ future.call.arguments : [18:41:19.547] ..$ ...future.elements_ii : [18:41:19.547] ..$ ...future.seeds_ii : [18:41:19.547] ..$ ...future.globals.maxSize: [18:41:19.547] - attr(*, "resolved")= logi FALSE [18:41:19.547] - attr(*, "total_size")= num 4016 [18:41:19.547] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:19.547] - attr(*, "already-done")= logi TRUE [18:41:19.596] - reassign environment for '...future.FUN' [18:41:19.597] - copied '...future.FUN' to environment [18:41:19.597] - copied 'a' to environment [18:41:19.597] - copied 'future.call.arguments' to environment [18:41:19.597] - copied '...future.elements_ii' to environment [18:41:19.597] - copied '...future.seeds_ii' to environment [18:41:19.597] - copied '...future.globals.maxSize' to environment [18:41:19.597] assign_globals() ... done [18:41:19.598] plan(): Setting new future strategy stack: [18:41:19.598] List of future strategies: [18:41:19.598] 1. sequential: [18:41:19.598] - args: function (..., envir = parent.frame(), workers = "") [18:41:19.598] - tweaked: FALSE [18:41:19.598] - call: NULL [18:41:19.599] plan(): nbrOfWorkers() = 1 [18:41:19.617] plan(): Setting new future strategy stack: [18:41:19.617] List of future strategies: [18:41:19.617] 1. multisession: [18:41:19.617] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:41:19.617] - tweaked: FALSE [18:41:19.617] - call: plan(strategy) [18:41:19.620] plan(): nbrOfWorkers() = 1 [18:41:19.620] SequentialFuture started (and completed) [18:41:19.620] - Launch lazy future ... done [18:41:19.620] run() for 'SequentialFuture' ... done [18:41:19.621] Created future: [18:41:19.621] SequentialFuture: [18:41:19.621] Label: 'future_lapply-1' [18:41:19.621] Expression: [18:41:19.621] { [18:41:19.621] do.call(function(...) { [18:41:19.621] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:19.621] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:19.621] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:19.621] on.exit(options(oopts), add = TRUE) [18:41:19.621] } [18:41:19.621] { [18:41:19.621] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:19.621] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:19.621] ...future.FUN(...future.X_jj, ...) [18:41:19.621] }) [18:41:19.621] } [18:41:19.621] }, args = future.call.arguments) [18:41:19.621] } [18:41:19.621] Lazy evaluation: FALSE [18:41:19.621] Asynchronous evaluation: FALSE [18:41:19.621] Local evaluation: TRUE [18:41:19.621] Environment: R_GlobalEnv [18:41:19.621] Capture standard output: TRUE [18:41:19.621] Capture condition classes: 'condition' (excluding 'nothing') [18:41:19.621] Globals: 6 objects totaling 117.79 KiB (function '...future.FUN' of 399 bytes, numeric 'a' of 39 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 117.22 KiB, NULL '...future.seeds_ii' of 27 bytes, ...) [18:41:19.621] Packages: [18:41:19.621] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:19.621] Resolved: TRUE [18:41:19.621] Value: 156.28 KiB of class 'list' [18:41:19.621] Early signaling: FALSE [18:41:19.621] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:19.621] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:19.622] Chunk #1 of 1 ... DONE [18:41:19.622] Launching 1 futures (chunks) ... DONE [18:41:19.623] Resolving 1 futures (chunks) ... [18:41:19.623] resolve() on list ... [18:41:19.623] recursive: 0 [18:41:19.623] length: 1 [18:41:19.623] [18:41:19.623] resolved() for 'SequentialFuture' ... [18:41:19.624] - state: 'finished' [18:41:19.624] - run: TRUE [18:41:19.624] - result: 'FutureResult' [18:41:19.624] resolved() for 'SequentialFuture' ... done [18:41:19.624] Future #1 [18:41:19.624] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:19.625] - nx: 1 [18:41:19.625] - relay: TRUE [18:41:19.625] - stdout: TRUE [18:41:19.625] - signal: TRUE [18:41:19.625] - resignal: FALSE [18:41:19.625] - force: TRUE [18:41:19.625] - relayed: [n=1] FALSE [18:41:19.626] - queued futures: [n=1] FALSE [18:41:19.626] - until=1 [18:41:19.626] - relaying element #1 [18:41:19.626] - relayed: [n=1] TRUE [18:41:19.626] - queued futures: [n=1] TRUE [18:41:19.626] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:19.627] length: 0 (resolved future 1) [18:41:19.627] Relaying remaining futures [18:41:19.627] signalConditionsASAP(NULL, pos=0) ... [18:41:19.627] - nx: 1 [18:41:19.627] - relay: TRUE [18:41:19.627] - stdout: TRUE [18:41:19.628] - signal: TRUE [18:41:19.628] - resignal: FALSE [18:41:19.628] - force: TRUE [18:41:19.628] - relayed: [n=1] TRUE [18:41:19.628] - queued futures: [n=1] TRUE - flush all [18:41:19.628] - relayed: [n=1] TRUE [18:41:19.628] - queued futures: [n=1] TRUE [18:41:19.629] signalConditionsASAP(NULL, pos=0) ... done [18:41:19.629] resolve() on list ... DONE [18:41:19.629] - Number of value chunks collected: 1 [18:41:19.629] Resolving 1 futures (chunks) ... DONE [18:41:19.629] Reducing values from 1 chunks ... [18:41:19.630] - Number of values collected after concatenation: 10000 [18:41:19.630] - Number of values expected: 10000 [18:41:19.630] Reducing values from 1 chunks ... DONE [18:41:19.630] future_lapply() ... DONE - future_lapply(x, FUN = table, ...) ... [18:41:19.631] future_lapply() ... [18:41:19.675] Number of chunks: 1 [18:41:19.675] getGlobalsAndPackagesXApply() ... [18:41:19.676] - future.globals: TRUE [18:41:19.676] getGlobalsAndPackages() ... [18:41:19.676] Searching for globals... [18:41:19.720] - globals found: [59] 'FUN', 'if', '==', 'c', 'list.names', '{', '<-', '[', 'as.list', 'substitute', '-', '&&', 'length', 'is.list', '!', 'is.null', 'names', 'return', 'seq_along', 'vapply', 'switch', '+', 'is.symbol', 'as.character', 'deparse', '[<-', 'missing', 'match', 'match.arg', '!=', 'warning', 'list', '[[', 'paste', 'stop', 'integer', 'for', 'is.factor', 'anyNA', 'options', 'on.exit', 'factor', '(', '||', 'levels', 'as.integer', 'which', 'is.na', 'is.na<-', '>', 'prod', '$', '.Machine', '*', 'names<-', 'array', 'tabulate', 'class', 'class<-' [18:41:19.720] Searching for globals ... DONE [18:41:19.720] Resolving globals: FALSE [18:41:19.722] The total size of the 1 globals is 31.30 KiB (32048 bytes) [18:41:19.723] The total size of the 1 globals exported for future expression ('FUN()') is 31.30 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (31.30 KiB of class 'function') [18:41:19.723] - globals: [1] 'FUN' [18:41:19.723] [18:41:19.723] getGlobalsAndPackages() ... DONE [18:41:19.724] - globals found/used: [n=1] 'FUN' [18:41:19.724] - needed namespaces: [n=0] [18:41:19.724] Finding globals ... DONE [18:41:19.724] - use_args: TRUE [18:41:19.724] - Getting '...' globals ... [18:41:19.725] resolve() on list ... [18:41:19.725] recursive: 0 [18:41:19.725] length: 1 [18:41:19.725] elements: '...' [18:41:19.725] length: 0 (resolved future 1) [18:41:19.726] resolve() on list ... DONE [18:41:19.726] - '...' content: [n=0] [18:41:19.726] List of 1 [18:41:19.726] $ ...: list() [18:41:19.726] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:19.726] - attr(*, "where")=List of 1 [18:41:19.726] ..$ ...: [18:41:19.726] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:19.726] - attr(*, "resolved")= logi TRUE [18:41:19.726] - attr(*, "total_size")= num NA [18:41:19.729] - Getting '...' globals ... DONE [18:41:19.729] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:19.730] List of 2 [18:41:19.730] $ ...future.FUN:function (..., exclude = if (useNA == "no") c(NA, NaN), useNA = c("no", [18:41:19.730] "ifany", "always"), dnn = list.names(...), deparse.level = 1) [18:41:19.730] $ ... : list() [18:41:19.730] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:19.730] - attr(*, "where")=List of 2 [18:41:19.730] ..$ ...future.FUN: [18:41:19.730] ..$ ... : [18:41:19.730] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:19.730] - attr(*, "resolved")= logi FALSE [18:41:19.730] - attr(*, "total_size")= int 67153 [18:41:19.733] Packages to be attached in all futures: [n=0] [18:41:19.733] getGlobalsAndPackagesXApply() ... DONE [18:41:19.733] Number of futures (= number of chunks): 1 [18:41:19.734] Launching 1 futures (chunks) ... [18:41:19.734] Chunk #1 of 1 ... [18:41:19.734] - Finding globals in 'X' for chunk #1 ... [18:41:19.734] getGlobalsAndPackages() ... [18:41:19.734] Searching for globals... [18:41:19.735] [18:41:19.735] Searching for globals ... DONE [18:41:19.735] - globals: [0] [18:41:19.735] getGlobalsAndPackages() ... DONE [18:41:19.735] + additional globals found: [n=0] [18:41:19.735] + additional namespaces needed: [n=0] [18:41:19.735] - Finding globals in 'X' for chunk #1 ... DONE [18:41:19.736] - seeds: [18:41:19.736] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.738] getGlobalsAndPackages() ... [18:41:19.738] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.739] Resolving globals: FALSE [18:41:19.739] Tweak future expression to call with '...' arguments ... [18:41:19.739] { [18:41:19.739] do.call(function(...) { [18:41:19.739] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:19.739] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:19.739] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:19.739] on.exit(options(oopts), add = TRUE) [18:41:19.739] } [18:41:19.739] { [18:41:19.739] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:19.739] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:19.739] ...future.FUN(...future.X_jj, ...) [18:41:19.739] }) [18:41:19.739] } [18:41:19.739] }, args = future.call.arguments) [18:41:19.739] } [18:41:19.740] Tweak future expression to call with '...' arguments ... DONE [18:41:19.740] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.740] [18:41:19.740] getGlobalsAndPackages() ... DONE [18:41:19.741] run() for 'Future' ... [18:41:19.741] - state: 'created' [18:41:19.741] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:19.743] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:19.744] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:19.744] - Field: 'label' [18:41:19.744] - Field: 'local' [18:41:19.744] - Field: 'owner' [18:41:19.744] - Field: 'envir' [18:41:19.745] - Field: 'packages' [18:41:19.745] - Field: 'gc' [18:41:19.745] - Field: 'conditions' [18:41:19.745] - Field: 'expr' [18:41:19.745] - Field: 'uuid' [18:41:19.745] - Field: 'seed' [18:41:19.746] - Field: 'version' [18:41:19.746] - Field: 'result' [18:41:19.746] - Field: 'asynchronous' [18:41:19.746] - Field: 'calls' [18:41:19.746] - Field: 'globals' [18:41:19.746] - Field: 'stdout' [18:41:19.747] - Field: 'earlySignal' [18:41:19.747] - Field: 'lazy' [18:41:19.747] - Field: 'state' [18:41:19.747] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:19.747] - Launch lazy future ... [18:41:19.748] Packages needed by the future expression (n = 0): [18:41:19.748] Packages needed by future strategies (n = 0): [18:41:19.748] { [18:41:19.748] { [18:41:19.748] { [18:41:19.748] ...future.startTime <- base::Sys.time() [18:41:19.748] { [18:41:19.748] { [18:41:19.748] { [18:41:19.748] base::local({ [18:41:19.748] has_future <- base::requireNamespace("future", [18:41:19.748] quietly = TRUE) [18:41:19.748] if (has_future) { [18:41:19.748] ns <- base::getNamespace("future") [18:41:19.748] version <- ns[[".package"]][["version"]] [18:41:19.748] if (is.null(version)) [18:41:19.748] version <- utils::packageVersion("future") [18:41:19.748] } [18:41:19.748] else { [18:41:19.748] version <- NULL [18:41:19.748] } [18:41:19.748] if (!has_future || version < "1.8.0") { [18:41:19.748] info <- base::c(r_version = base::gsub("R version ", [18:41:19.748] "", base::R.version$version.string), [18:41:19.748] platform = base::sprintf("%s (%s-bit)", [18:41:19.748] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:19.748] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:19.748] "release", "version")], collapse = " "), [18:41:19.748] hostname = base::Sys.info()[["nodename"]]) [18:41:19.748] info <- base::sprintf("%s: %s", base::names(info), [18:41:19.748] info) [18:41:19.748] info <- base::paste(info, collapse = "; ") [18:41:19.748] if (!has_future) { [18:41:19.748] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:19.748] info) [18:41:19.748] } [18:41:19.748] else { [18:41:19.748] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:19.748] info, version) [18:41:19.748] } [18:41:19.748] base::stop(msg) [18:41:19.748] } [18:41:19.748] }) [18:41:19.748] } [18:41:19.748] ...future.strategy.old <- future::plan("list") [18:41:19.748] options(future.plan = NULL) [18:41:19.748] Sys.unsetenv("R_FUTURE_PLAN") [18:41:19.748] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:19.748] } [18:41:19.748] ...future.workdir <- getwd() [18:41:19.748] } [18:41:19.748] ...future.oldOptions <- base::as.list(base::.Options) [18:41:19.748] ...future.oldEnvVars <- base::Sys.getenv() [18:41:19.748] } [18:41:19.748] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:19.748] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:19.748] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:19.748] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:19.748] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:19.748] future.stdout.windows.reencode = NULL, width = 80L) [18:41:19.748] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:19.748] base::names(...future.oldOptions)) [18:41:19.748] } [18:41:19.748] if (FALSE) { [18:41:19.748] } [18:41:19.748] else { [18:41:19.748] if (TRUE) { [18:41:19.748] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:19.748] open = "w") [18:41:19.748] } [18:41:19.748] else { [18:41:19.748] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:19.748] windows = "NUL", "/dev/null"), open = "w") [18:41:19.748] } [18:41:19.748] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:19.748] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:19.748] base::sink(type = "output", split = FALSE) [18:41:19.748] base::close(...future.stdout) [18:41:19.748] }, add = TRUE) [18:41:19.748] } [18:41:19.748] ...future.frame <- base::sys.nframe() [18:41:19.748] ...future.conditions <- base::list() [18:41:19.748] ...future.rng <- base::globalenv()$.Random.seed [18:41:19.748] if (FALSE) { [18:41:19.748] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:19.748] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:19.748] } [18:41:19.748] ...future.result <- base::tryCatch({ [18:41:19.748] base::withCallingHandlers({ [18:41:19.748] ...future.value <- base::withVisible(base::local({ [18:41:19.748] do.call(function(...) { [18:41:19.748] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:19.748] if (!identical(...future.globals.maxSize.org, [18:41:19.748] ...future.globals.maxSize)) { [18:41:19.748] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:19.748] on.exit(options(oopts), add = TRUE) [18:41:19.748] } [18:41:19.748] { [18:41:19.748] lapply(seq_along(...future.elements_ii), [18:41:19.748] FUN = function(jj) { [18:41:19.748] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:19.748] ...future.FUN(...future.X_jj, ...) [18:41:19.748] }) [18:41:19.748] } [18:41:19.748] }, args = future.call.arguments) [18:41:19.748] })) [18:41:19.748] future::FutureResult(value = ...future.value$value, [18:41:19.748] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:19.748] ...future.rng), globalenv = if (FALSE) [18:41:19.748] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:19.748] ...future.globalenv.names)) [18:41:19.748] else NULL, started = ...future.startTime, version = "1.8") [18:41:19.748] }, condition = base::local({ [18:41:19.748] c <- base::c [18:41:19.748] inherits <- base::inherits [18:41:19.748] invokeRestart <- base::invokeRestart [18:41:19.748] length <- base::length [18:41:19.748] list <- base::list [18:41:19.748] seq.int <- base::seq.int [18:41:19.748] signalCondition <- base::signalCondition [18:41:19.748] sys.calls <- base::sys.calls [18:41:19.748] `[[` <- base::`[[` [18:41:19.748] `+` <- base::`+` [18:41:19.748] `<<-` <- base::`<<-` [18:41:19.748] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:19.748] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:19.748] 3L)] [18:41:19.748] } [18:41:19.748] function(cond) { [18:41:19.748] is_error <- inherits(cond, "error") [18:41:19.748] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:19.748] NULL) [18:41:19.748] if (is_error) { [18:41:19.748] sessionInformation <- function() { [18:41:19.748] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:19.748] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:19.748] search = base::search(), system = base::Sys.info()) [18:41:19.748] } [18:41:19.748] ...future.conditions[[length(...future.conditions) + [18:41:19.748] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:19.748] cond$call), session = sessionInformation(), [18:41:19.748] timestamp = base::Sys.time(), signaled = 0L) [18:41:19.748] signalCondition(cond) [18:41:19.748] } [18:41:19.748] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:19.748] "immediateCondition"))) { [18:41:19.748] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:19.748] ...future.conditions[[length(...future.conditions) + [18:41:19.748] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:19.748] if (TRUE && !signal) { [18:41:19.748] muffleCondition <- function (cond, pattern = "^muffle") [18:41:19.748] { [18:41:19.748] inherits <- base::inherits [18:41:19.748] invokeRestart <- base::invokeRestart [18:41:19.748] is.null <- base::is.null [18:41:19.748] muffled <- FALSE [18:41:19.748] if (inherits(cond, "message")) { [18:41:19.748] muffled <- grepl(pattern, "muffleMessage") [18:41:19.748] if (muffled) [18:41:19.748] invokeRestart("muffleMessage") [18:41:19.748] } [18:41:19.748] else if (inherits(cond, "warning")) { [18:41:19.748] muffled <- grepl(pattern, "muffleWarning") [18:41:19.748] if (muffled) [18:41:19.748] invokeRestart("muffleWarning") [18:41:19.748] } [18:41:19.748] else if (inherits(cond, "condition")) { [18:41:19.748] if (!is.null(pattern)) { [18:41:19.748] computeRestarts <- base::computeRestarts [18:41:19.748] grepl <- base::grepl [18:41:19.748] restarts <- computeRestarts(cond) [18:41:19.748] for (restart in restarts) { [18:41:19.748] name <- restart$name [18:41:19.748] if (is.null(name)) [18:41:19.748] next [18:41:19.748] if (!grepl(pattern, name)) [18:41:19.748] next [18:41:19.748] invokeRestart(restart) [18:41:19.748] muffled <- TRUE [18:41:19.748] break [18:41:19.748] } [18:41:19.748] } [18:41:19.748] } [18:41:19.748] invisible(muffled) [18:41:19.748] } [18:41:19.748] muffleCondition(cond, pattern = "^muffle") [18:41:19.748] } [18:41:19.748] } [18:41:19.748] else { [18:41:19.748] if (TRUE) { [18:41:19.748] muffleCondition <- function (cond, pattern = "^muffle") [18:41:19.748] { [18:41:19.748] inherits <- base::inherits [18:41:19.748] invokeRestart <- base::invokeRestart [18:41:19.748] is.null <- base::is.null [18:41:19.748] muffled <- FALSE [18:41:19.748] if (inherits(cond, "message")) { [18:41:19.748] muffled <- grepl(pattern, "muffleMessage") [18:41:19.748] if (muffled) [18:41:19.748] invokeRestart("muffleMessage") [18:41:19.748] } [18:41:19.748] else if (inherits(cond, "warning")) { [18:41:19.748] muffled <- grepl(pattern, "muffleWarning") [18:41:19.748] if (muffled) [18:41:19.748] invokeRestart("muffleWarning") [18:41:19.748] } [18:41:19.748] else if (inherits(cond, "condition")) { [18:41:19.748] if (!is.null(pattern)) { [18:41:19.748] computeRestarts <- base::computeRestarts [18:41:19.748] grepl <- base::grepl [18:41:19.748] restarts <- computeRestarts(cond) [18:41:19.748] for (restart in restarts) { [18:41:19.748] name <- restart$name [18:41:19.748] if (is.null(name)) [18:41:19.748] next [18:41:19.748] if (!grepl(pattern, name)) [18:41:19.748] next [18:41:19.748] invokeRestart(restart) [18:41:19.748] muffled <- TRUE [18:41:19.748] break [18:41:19.748] } [18:41:19.748] } [18:41:19.748] } [18:41:19.748] invisible(muffled) [18:41:19.748] } [18:41:19.748] muffleCondition(cond, pattern = "^muffle") [18:41:19.748] } [18:41:19.748] } [18:41:19.748] } [18:41:19.748] })) [18:41:19.748] }, error = function(ex) { [18:41:19.748] base::structure(base::list(value = NULL, visible = NULL, [18:41:19.748] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:19.748] ...future.rng), started = ...future.startTime, [18:41:19.748] finished = Sys.time(), session_uuid = NA_character_, [18:41:19.748] version = "1.8"), class = "FutureResult") [18:41:19.748] }, finally = { [18:41:19.748] if (!identical(...future.workdir, getwd())) [18:41:19.748] setwd(...future.workdir) [18:41:19.748] { [18:41:19.748] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:19.748] ...future.oldOptions$nwarnings <- NULL [18:41:19.748] } [18:41:19.748] base::options(...future.oldOptions) [18:41:19.748] if (.Platform$OS.type == "windows") { [18:41:19.748] old_names <- names(...future.oldEnvVars) [18:41:19.748] envs <- base::Sys.getenv() [18:41:19.748] names <- names(envs) [18:41:19.748] common <- intersect(names, old_names) [18:41:19.748] added <- setdiff(names, old_names) [18:41:19.748] removed <- setdiff(old_names, names) [18:41:19.748] changed <- common[...future.oldEnvVars[common] != [18:41:19.748] envs[common]] [18:41:19.748] NAMES <- toupper(changed) [18:41:19.748] args <- list() [18:41:19.748] for (kk in seq_along(NAMES)) { [18:41:19.748] name <- changed[[kk]] [18:41:19.748] NAME <- NAMES[[kk]] [18:41:19.748] if (name != NAME && is.element(NAME, old_names)) [18:41:19.748] next [18:41:19.748] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:19.748] } [18:41:19.748] NAMES <- toupper(added) [18:41:19.748] for (kk in seq_along(NAMES)) { [18:41:19.748] name <- added[[kk]] [18:41:19.748] NAME <- NAMES[[kk]] [18:41:19.748] if (name != NAME && is.element(NAME, old_names)) [18:41:19.748] next [18:41:19.748] args[[name]] <- "" [18:41:19.748] } [18:41:19.748] NAMES <- toupper(removed) [18:41:19.748] for (kk in seq_along(NAMES)) { [18:41:19.748] name <- removed[[kk]] [18:41:19.748] NAME <- NAMES[[kk]] [18:41:19.748] if (name != NAME && is.element(NAME, old_names)) [18:41:19.748] next [18:41:19.748] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:19.748] } [18:41:19.748] if (length(args) > 0) [18:41:19.748] base::do.call(base::Sys.setenv, args = args) [18:41:19.748] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:19.748] } [18:41:19.748] else { [18:41:19.748] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:19.748] } [18:41:19.748] { [18:41:19.748] if (base::length(...future.futureOptionsAdded) > [18:41:19.748] 0L) { [18:41:19.748] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:19.748] base::names(opts) <- ...future.futureOptionsAdded [18:41:19.748] base::options(opts) [18:41:19.748] } [18:41:19.748] { [18:41:19.748] { [18:41:19.748] NULL [18:41:19.748] RNGkind("Mersenne-Twister") [18:41:19.748] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:19.748] inherits = FALSE) [18:41:19.748] } [18:41:19.748] options(future.plan = NULL) [18:41:19.748] if (is.na(NA_character_)) [18:41:19.748] Sys.unsetenv("R_FUTURE_PLAN") [18:41:19.748] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:19.748] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:19.748] .init = FALSE) [18:41:19.748] } [18:41:19.748] } [18:41:19.748] } [18:41:19.748] }) [18:41:19.748] if (TRUE) { [18:41:19.748] base::sink(type = "output", split = FALSE) [18:41:19.748] if (TRUE) { [18:41:19.748] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:19.748] } [18:41:19.748] else { [18:41:19.748] ...future.result["stdout"] <- base::list(NULL) [18:41:19.748] } [18:41:19.748] base::close(...future.stdout) [18:41:19.748] ...future.stdout <- NULL [18:41:19.748] } [18:41:19.748] ...future.result$conditions <- ...future.conditions [18:41:19.748] ...future.result$finished <- base::Sys.time() [18:41:19.748] ...future.result [18:41:19.748] } [18:41:19.753] assign_globals() ... [18:41:19.753] List of 5 [18:41:19.753] $ ...future.FUN :function (..., exclude = if (useNA == "no") c(NA, NaN), useNA = c("no", [18:41:19.753] "ifany", "always"), dnn = list.names(...), deparse.level = 1) [18:41:19.753] $ future.call.arguments : list() [18:41:19.753] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:19.753] $ ...future.elements_ii :List of 2 [18:41:19.753] ..$ a: int [1:4] 1 2 3 4 [18:41:19.753] ..$ b: int [1:4] 5 6 7 8 [18:41:19.753] $ ...future.seeds_ii : NULL [18:41:19.753] $ ...future.globals.maxSize: NULL [18:41:19.753] - attr(*, "where")=List of 5 [18:41:19.753] ..$ ...future.FUN : [18:41:19.753] ..$ future.call.arguments : [18:41:19.753] ..$ ...future.elements_ii : [18:41:19.753] ..$ ...future.seeds_ii : [18:41:19.753] ..$ ...future.globals.maxSize: [18:41:19.753] - attr(*, "resolved")= logi FALSE [18:41:19.753] - attr(*, "total_size")= num 67153 [18:41:19.753] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:19.753] - attr(*, "already-done")= logi TRUE [18:41:19.759] - copied '...future.FUN' to environment [18:41:19.759] - copied 'future.call.arguments' to environment [18:41:19.759] - copied '...future.elements_ii' to environment [18:41:19.759] - copied '...future.seeds_ii' to environment [18:41:19.759] - copied '...future.globals.maxSize' to environment [18:41:19.760] assign_globals() ... done [18:41:19.760] plan(): Setting new future strategy stack: [18:41:19.760] List of future strategies: [18:41:19.760] 1. sequential: [18:41:19.760] - args: function (..., envir = parent.frame(), workers = "") [18:41:19.760] - tweaked: FALSE [18:41:19.760] - call: NULL [18:41:19.761] plan(): nbrOfWorkers() = 1 [18:41:19.762] plan(): Setting new future strategy stack: [18:41:19.762] List of future strategies: [18:41:19.762] 1. multisession: [18:41:19.762] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:41:19.762] - tweaked: FALSE [18:41:19.762] - call: plan(strategy) [18:41:19.765] plan(): nbrOfWorkers() = 1 [18:41:19.765] SequentialFuture started (and completed) [18:41:19.765] - Launch lazy future ... done [18:41:19.765] run() for 'SequentialFuture' ... done [18:41:19.766] Created future: [18:41:19.766] SequentialFuture: [18:41:19.766] Label: 'future_lapply-1' [18:41:19.766] Expression: [18:41:19.766] { [18:41:19.766] do.call(function(...) { [18:41:19.766] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:19.766] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:19.766] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:19.766] on.exit(options(oopts), add = TRUE) [18:41:19.766] } [18:41:19.766] { [18:41:19.766] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:19.766] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:19.766] ...future.FUN(...future.X_jj, ...) [18:41:19.766] }) [18:41:19.766] } [18:41:19.766] }, args = future.call.arguments) [18:41:19.766] } [18:41:19.766] Lazy evaluation: FALSE [18:41:19.766] Asynchronous evaluation: FALSE [18:41:19.766] Local evaluation: TRUE [18:41:19.766] Environment: R_GlobalEnv [18:41:19.766] Capture standard output: TRUE [18:41:19.766] Capture condition classes: 'condition' (excluding 'nothing') [18:41:19.766] Globals: 5 objects totaling 31.71 KiB (function '...future.FUN' of 31.30 KiB, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 268 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:19.766] Packages: [18:41:19.766] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:19.766] Resolved: TRUE [18:41:19.766] Value: 442 bytes of class 'list' [18:41:19.766] Early signaling: FALSE [18:41:19.766] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:19.766] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:19.767] Chunk #1 of 1 ... DONE [18:41:19.767] Launching 1 futures (chunks) ... DONE [18:41:19.768] Resolving 1 futures (chunks) ... [18:41:19.768] resolve() on list ... [18:41:19.768] recursive: 0 [18:41:19.768] length: 1 [18:41:19.768] [18:41:19.768] resolved() for 'SequentialFuture' ... [18:41:19.769] - state: 'finished' [18:41:19.769] - run: TRUE [18:41:19.769] - result: 'FutureResult' [18:41:19.769] resolved() for 'SequentialFuture' ... done [18:41:19.769] Future #1 [18:41:19.770] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:19.770] - nx: 1 [18:41:19.770] - relay: TRUE [18:41:19.770] - stdout: TRUE [18:41:19.770] - signal: TRUE [18:41:19.770] - resignal: FALSE [18:41:19.771] - force: TRUE [18:41:19.771] - relayed: [n=1] FALSE [18:41:19.771] - queued futures: [n=1] FALSE [18:41:19.771] - until=1 [18:41:19.771] - relaying element #1 [18:41:19.771] - relayed: [n=1] TRUE [18:41:19.772] - queued futures: [n=1] TRUE [18:41:19.772] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:19.772] length: 0 (resolved future 1) [18:41:19.772] Relaying remaining futures [18:41:19.772] signalConditionsASAP(NULL, pos=0) ... [18:41:19.772] - nx: 1 [18:41:19.773] - relay: TRUE [18:41:19.773] - stdout: TRUE [18:41:19.773] - signal: TRUE [18:41:19.773] - resignal: FALSE [18:41:19.773] - force: TRUE [18:41:19.773] - relayed: [n=1] TRUE [18:41:19.773] - queued futures: [n=1] TRUE - flush all [18:41:19.774] - relayed: [n=1] TRUE [18:41:19.774] - queued futures: [n=1] TRUE [18:41:19.774] signalConditionsASAP(NULL, pos=0) ... done [18:41:19.774] resolve() on list ... DONE [18:41:19.774] - Number of value chunks collected: 1 [18:41:19.775] Resolving 1 futures (chunks) ... DONE [18:41:19.775] Reducing values from 1 chunks ... [18:41:19.775] - Number of values collected after concatenation: 2 [18:41:19.775] - Number of values expected: 2 [18:41:19.775] Reducing values from 1 chunks ... DONE [18:41:19.775] future_lapply() ... DONE - future_lapply(x, ...) where length(x) != length(as.list(x)) ... [18:41:19.776] future_lapply() ... [18:41:19.778] Number of chunks: 1 [18:41:19.778] getGlobalsAndPackagesXApply() ... [18:41:19.778] - future.globals: TRUE [18:41:19.778] getGlobalsAndPackages() ... [18:41:19.779] Searching for globals... [18:41:19.779] - globals found: [1] 'FUN' [18:41:19.779] Searching for globals ... DONE [18:41:19.780] Resolving globals: FALSE [18:41:19.780] The total size of the 1 globals is 37 bytes (37 bytes) [18:41:19.780] The total size of the 1 globals exported for future expression ('FUN()') is 37 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (37 bytes of class 'function') [18:41:19.781] - globals: [1] 'FUN' [18:41:19.781] [18:41:19.781] getGlobalsAndPackages() ... DONE [18:41:19.781] - globals found/used: [n=1] 'FUN' [18:41:19.781] - needed namespaces: [n=0] [18:41:19.781] Finding globals ... DONE [18:41:19.782] - use_args: TRUE [18:41:19.782] - Getting '...' globals ... [18:41:19.782] resolve() on list ... [18:41:19.782] recursive: 0 [18:41:19.783] length: 1 [18:41:19.783] elements: '...' [18:41:19.783] length: 0 (resolved future 1) [18:41:19.783] resolve() on list ... DONE [18:41:19.783] - '...' content: [n=0] [18:41:19.783] List of 1 [18:41:19.783] $ ...: list() [18:41:19.783] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:19.783] - attr(*, "where")=List of 1 [18:41:19.783] ..$ ...: [18:41:19.783] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:19.783] - attr(*, "resolved")= logi TRUE [18:41:19.783] - attr(*, "total_size")= num NA [18:41:19.786] - Getting '...' globals ... DONE [18:41:19.786] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:19.787] List of 2 [18:41:19.787] $ ...future.FUN:function (x) [18:41:19.787] $ ... : list() [18:41:19.787] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:19.787] - attr(*, "where")=List of 2 [18:41:19.787] ..$ ...future.FUN: [18:41:19.787] ..$ ... : [18:41:19.787] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:19.787] - attr(*, "resolved")= logi FALSE [18:41:19.787] - attr(*, "total_size")= int 2891 [18:41:19.790] Packages to be attached in all futures: [n=0] [18:41:19.790] getGlobalsAndPackagesXApply() ... DONE [18:41:19.790] Number of futures (= number of chunks): 1 [18:41:19.791] Launching 1 futures (chunks) ... [18:41:19.791] Chunk #1 of 1 ... [18:41:19.791] - Finding globals in 'X' for chunk #1 ... [18:41:19.791] getGlobalsAndPackages() ... [18:41:19.791] Searching for globals... [18:41:19.792] [18:41:19.792] Searching for globals ... DONE [18:41:19.792] - globals: [0] [18:41:19.792] getGlobalsAndPackages() ... DONE [18:41:19.792] + additional globals found: [n=0] [18:41:19.792] + additional namespaces needed: [n=0] [18:41:19.793] - Finding globals in 'X' for chunk #1 ... DONE [18:41:19.793] - seeds: [18:41:19.793] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.793] getGlobalsAndPackages() ... [18:41:19.793] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.793] Resolving globals: FALSE [18:41:19.794] Tweak future expression to call with '...' arguments ... [18:41:19.794] { [18:41:19.794] do.call(function(...) { [18:41:19.794] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:19.794] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:19.794] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:19.794] on.exit(options(oopts), add = TRUE) [18:41:19.794] } [18:41:19.794] { [18:41:19.794] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:19.794] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:19.794] ...future.FUN(...future.X_jj, ...) [18:41:19.794] }) [18:41:19.794] } [18:41:19.794] }, args = future.call.arguments) [18:41:19.794] } [18:41:19.794] Tweak future expression to call with '...' arguments ... DONE [18:41:19.795] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.795] [18:41:19.795] getGlobalsAndPackages() ... DONE [18:41:19.795] run() for 'Future' ... [18:41:19.796] - state: 'created' [18:41:19.796] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:19.798] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:19.798] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:19.798] - Field: 'label' [18:41:19.799] - Field: 'local' [18:41:19.799] - Field: 'owner' [18:41:19.799] - Field: 'envir' [18:41:19.799] - Field: 'packages' [18:41:19.799] - Field: 'gc' [18:41:19.800] - Field: 'conditions' [18:41:19.800] - Field: 'expr' [18:41:19.800] - Field: 'uuid' [18:41:19.800] - Field: 'seed' [18:41:19.800] - Field: 'version' [18:41:19.801] - Field: 'result' [18:41:19.801] - Field: 'asynchronous' [18:41:19.801] - Field: 'calls' [18:41:19.801] - Field: 'globals' [18:41:19.801] - Field: 'stdout' [18:41:19.801] - Field: 'earlySignal' [18:41:19.802] - Field: 'lazy' [18:41:19.802] - Field: 'state' [18:41:19.802] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:19.802] - Launch lazy future ... [18:41:19.802] Packages needed by the future expression (n = 0): [18:41:19.802] Packages needed by future strategies (n = 0): [18:41:19.803] { [18:41:19.803] { [18:41:19.803] { [18:41:19.803] ...future.startTime <- base::Sys.time() [18:41:19.803] { [18:41:19.803] { [18:41:19.803] { [18:41:19.803] base::local({ [18:41:19.803] has_future <- base::requireNamespace("future", [18:41:19.803] quietly = TRUE) [18:41:19.803] if (has_future) { [18:41:19.803] ns <- base::getNamespace("future") [18:41:19.803] version <- ns[[".package"]][["version"]] [18:41:19.803] if (is.null(version)) [18:41:19.803] version <- utils::packageVersion("future") [18:41:19.803] } [18:41:19.803] else { [18:41:19.803] version <- NULL [18:41:19.803] } [18:41:19.803] if (!has_future || version < "1.8.0") { [18:41:19.803] info <- base::c(r_version = base::gsub("R version ", [18:41:19.803] "", base::R.version$version.string), [18:41:19.803] platform = base::sprintf("%s (%s-bit)", [18:41:19.803] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:19.803] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:19.803] "release", "version")], collapse = " "), [18:41:19.803] hostname = base::Sys.info()[["nodename"]]) [18:41:19.803] info <- base::sprintf("%s: %s", base::names(info), [18:41:19.803] info) [18:41:19.803] info <- base::paste(info, collapse = "; ") [18:41:19.803] if (!has_future) { [18:41:19.803] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:19.803] info) [18:41:19.803] } [18:41:19.803] else { [18:41:19.803] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:19.803] info, version) [18:41:19.803] } [18:41:19.803] base::stop(msg) [18:41:19.803] } [18:41:19.803] }) [18:41:19.803] } [18:41:19.803] ...future.strategy.old <- future::plan("list") [18:41:19.803] options(future.plan = NULL) [18:41:19.803] Sys.unsetenv("R_FUTURE_PLAN") [18:41:19.803] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:19.803] } [18:41:19.803] ...future.workdir <- getwd() [18:41:19.803] } [18:41:19.803] ...future.oldOptions <- base::as.list(base::.Options) [18:41:19.803] ...future.oldEnvVars <- base::Sys.getenv() [18:41:19.803] } [18:41:19.803] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:19.803] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:19.803] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:19.803] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:19.803] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:19.803] future.stdout.windows.reencode = NULL, width = 80L) [18:41:19.803] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:19.803] base::names(...future.oldOptions)) [18:41:19.803] } [18:41:19.803] if (FALSE) { [18:41:19.803] } [18:41:19.803] else { [18:41:19.803] if (TRUE) { [18:41:19.803] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:19.803] open = "w") [18:41:19.803] } [18:41:19.803] else { [18:41:19.803] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:19.803] windows = "NUL", "/dev/null"), open = "w") [18:41:19.803] } [18:41:19.803] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:19.803] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:19.803] base::sink(type = "output", split = FALSE) [18:41:19.803] base::close(...future.stdout) [18:41:19.803] }, add = TRUE) [18:41:19.803] } [18:41:19.803] ...future.frame <- base::sys.nframe() [18:41:19.803] ...future.conditions <- base::list() [18:41:19.803] ...future.rng <- base::globalenv()$.Random.seed [18:41:19.803] if (FALSE) { [18:41:19.803] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:19.803] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:19.803] } [18:41:19.803] ...future.result <- base::tryCatch({ [18:41:19.803] base::withCallingHandlers({ [18:41:19.803] ...future.value <- base::withVisible(base::local({ [18:41:19.803] do.call(function(...) { [18:41:19.803] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:19.803] if (!identical(...future.globals.maxSize.org, [18:41:19.803] ...future.globals.maxSize)) { [18:41:19.803] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:19.803] on.exit(options(oopts), add = TRUE) [18:41:19.803] } [18:41:19.803] { [18:41:19.803] lapply(seq_along(...future.elements_ii), [18:41:19.803] FUN = function(jj) { [18:41:19.803] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:19.803] ...future.FUN(...future.X_jj, ...) [18:41:19.803] }) [18:41:19.803] } [18:41:19.803] }, args = future.call.arguments) [18:41:19.803] })) [18:41:19.803] future::FutureResult(value = ...future.value$value, [18:41:19.803] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:19.803] ...future.rng), globalenv = if (FALSE) [18:41:19.803] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:19.803] ...future.globalenv.names)) [18:41:19.803] else NULL, started = ...future.startTime, version = "1.8") [18:41:19.803] }, condition = base::local({ [18:41:19.803] c <- base::c [18:41:19.803] inherits <- base::inherits [18:41:19.803] invokeRestart <- base::invokeRestart [18:41:19.803] length <- base::length [18:41:19.803] list <- base::list [18:41:19.803] seq.int <- base::seq.int [18:41:19.803] signalCondition <- base::signalCondition [18:41:19.803] sys.calls <- base::sys.calls [18:41:19.803] `[[` <- base::`[[` [18:41:19.803] `+` <- base::`+` [18:41:19.803] `<<-` <- base::`<<-` [18:41:19.803] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:19.803] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:19.803] 3L)] [18:41:19.803] } [18:41:19.803] function(cond) { [18:41:19.803] is_error <- inherits(cond, "error") [18:41:19.803] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:19.803] NULL) [18:41:19.803] if (is_error) { [18:41:19.803] sessionInformation <- function() { [18:41:19.803] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:19.803] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:19.803] search = base::search(), system = base::Sys.info()) [18:41:19.803] } [18:41:19.803] ...future.conditions[[length(...future.conditions) + [18:41:19.803] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:19.803] cond$call), session = sessionInformation(), [18:41:19.803] timestamp = base::Sys.time(), signaled = 0L) [18:41:19.803] signalCondition(cond) [18:41:19.803] } [18:41:19.803] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:19.803] "immediateCondition"))) { [18:41:19.803] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:19.803] ...future.conditions[[length(...future.conditions) + [18:41:19.803] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:19.803] if (TRUE && !signal) { [18:41:19.803] muffleCondition <- function (cond, pattern = "^muffle") [18:41:19.803] { [18:41:19.803] inherits <- base::inherits [18:41:19.803] invokeRestart <- base::invokeRestart [18:41:19.803] is.null <- base::is.null [18:41:19.803] muffled <- FALSE [18:41:19.803] if (inherits(cond, "message")) { [18:41:19.803] muffled <- grepl(pattern, "muffleMessage") [18:41:19.803] if (muffled) [18:41:19.803] invokeRestart("muffleMessage") [18:41:19.803] } [18:41:19.803] else if (inherits(cond, "warning")) { [18:41:19.803] muffled <- grepl(pattern, "muffleWarning") [18:41:19.803] if (muffled) [18:41:19.803] invokeRestart("muffleWarning") [18:41:19.803] } [18:41:19.803] else if (inherits(cond, "condition")) { [18:41:19.803] if (!is.null(pattern)) { [18:41:19.803] computeRestarts <- base::computeRestarts [18:41:19.803] grepl <- base::grepl [18:41:19.803] restarts <- computeRestarts(cond) [18:41:19.803] for (restart in restarts) { [18:41:19.803] name <- restart$name [18:41:19.803] if (is.null(name)) [18:41:19.803] next [18:41:19.803] if (!grepl(pattern, name)) [18:41:19.803] next [18:41:19.803] invokeRestart(restart) [18:41:19.803] muffled <- TRUE [18:41:19.803] break [18:41:19.803] } [18:41:19.803] } [18:41:19.803] } [18:41:19.803] invisible(muffled) [18:41:19.803] } [18:41:19.803] muffleCondition(cond, pattern = "^muffle") [18:41:19.803] } [18:41:19.803] } [18:41:19.803] else { [18:41:19.803] if (TRUE) { [18:41:19.803] muffleCondition <- function (cond, pattern = "^muffle") [18:41:19.803] { [18:41:19.803] inherits <- base::inherits [18:41:19.803] invokeRestart <- base::invokeRestart [18:41:19.803] is.null <- base::is.null [18:41:19.803] muffled <- FALSE [18:41:19.803] if (inherits(cond, "message")) { [18:41:19.803] muffled <- grepl(pattern, "muffleMessage") [18:41:19.803] if (muffled) [18:41:19.803] invokeRestart("muffleMessage") [18:41:19.803] } [18:41:19.803] else if (inherits(cond, "warning")) { [18:41:19.803] muffled <- grepl(pattern, "muffleWarning") [18:41:19.803] if (muffled) [18:41:19.803] invokeRestart("muffleWarning") [18:41:19.803] } [18:41:19.803] else if (inherits(cond, "condition")) { [18:41:19.803] if (!is.null(pattern)) { [18:41:19.803] computeRestarts <- base::computeRestarts [18:41:19.803] grepl <- base::grepl [18:41:19.803] restarts <- computeRestarts(cond) [18:41:19.803] for (restart in restarts) { [18:41:19.803] name <- restart$name [18:41:19.803] if (is.null(name)) [18:41:19.803] next [18:41:19.803] if (!grepl(pattern, name)) [18:41:19.803] next [18:41:19.803] invokeRestart(restart) [18:41:19.803] muffled <- TRUE [18:41:19.803] break [18:41:19.803] } [18:41:19.803] } [18:41:19.803] } [18:41:19.803] invisible(muffled) [18:41:19.803] } [18:41:19.803] muffleCondition(cond, pattern = "^muffle") [18:41:19.803] } [18:41:19.803] } [18:41:19.803] } [18:41:19.803] })) [18:41:19.803] }, error = function(ex) { [18:41:19.803] base::structure(base::list(value = NULL, visible = NULL, [18:41:19.803] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:19.803] ...future.rng), started = ...future.startTime, [18:41:19.803] finished = Sys.time(), session_uuid = NA_character_, [18:41:19.803] version = "1.8"), class = "FutureResult") [18:41:19.803] }, finally = { [18:41:19.803] if (!identical(...future.workdir, getwd())) [18:41:19.803] setwd(...future.workdir) [18:41:19.803] { [18:41:19.803] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:19.803] ...future.oldOptions$nwarnings <- NULL [18:41:19.803] } [18:41:19.803] base::options(...future.oldOptions) [18:41:19.803] if (.Platform$OS.type == "windows") { [18:41:19.803] old_names <- names(...future.oldEnvVars) [18:41:19.803] envs <- base::Sys.getenv() [18:41:19.803] names <- names(envs) [18:41:19.803] common <- intersect(names, old_names) [18:41:19.803] added <- setdiff(names, old_names) [18:41:19.803] removed <- setdiff(old_names, names) [18:41:19.803] changed <- common[...future.oldEnvVars[common] != [18:41:19.803] envs[common]] [18:41:19.803] NAMES <- toupper(changed) [18:41:19.803] args <- list() [18:41:19.803] for (kk in seq_along(NAMES)) { [18:41:19.803] name <- changed[[kk]] [18:41:19.803] NAME <- NAMES[[kk]] [18:41:19.803] if (name != NAME && is.element(NAME, old_names)) [18:41:19.803] next [18:41:19.803] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:19.803] } [18:41:19.803] NAMES <- toupper(added) [18:41:19.803] for (kk in seq_along(NAMES)) { [18:41:19.803] name <- added[[kk]] [18:41:19.803] NAME <- NAMES[[kk]] [18:41:19.803] if (name != NAME && is.element(NAME, old_names)) [18:41:19.803] next [18:41:19.803] args[[name]] <- "" [18:41:19.803] } [18:41:19.803] NAMES <- toupper(removed) [18:41:19.803] for (kk in seq_along(NAMES)) { [18:41:19.803] name <- removed[[kk]] [18:41:19.803] NAME <- NAMES[[kk]] [18:41:19.803] if (name != NAME && is.element(NAME, old_names)) [18:41:19.803] next [18:41:19.803] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:19.803] } [18:41:19.803] if (length(args) > 0) [18:41:19.803] base::do.call(base::Sys.setenv, args = args) [18:41:19.803] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:19.803] } [18:41:19.803] else { [18:41:19.803] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:19.803] } [18:41:19.803] { [18:41:19.803] if (base::length(...future.futureOptionsAdded) > [18:41:19.803] 0L) { [18:41:19.803] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:19.803] base::names(opts) <- ...future.futureOptionsAdded [18:41:19.803] base::options(opts) [18:41:19.803] } [18:41:19.803] { [18:41:19.803] { [18:41:19.803] NULL [18:41:19.803] RNGkind("Mersenne-Twister") [18:41:19.803] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:19.803] inherits = FALSE) [18:41:19.803] } [18:41:19.803] options(future.plan = NULL) [18:41:19.803] if (is.na(NA_character_)) [18:41:19.803] Sys.unsetenv("R_FUTURE_PLAN") [18:41:19.803] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:19.803] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:19.803] .init = FALSE) [18:41:19.803] } [18:41:19.803] } [18:41:19.803] } [18:41:19.803] }) [18:41:19.803] if (TRUE) { [18:41:19.803] base::sink(type = "output", split = FALSE) [18:41:19.803] if (TRUE) { [18:41:19.803] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:19.803] } [18:41:19.803] else { [18:41:19.803] ...future.result["stdout"] <- base::list(NULL) [18:41:19.803] } [18:41:19.803] base::close(...future.stdout) [18:41:19.803] ...future.stdout <- NULL [18:41:19.803] } [18:41:19.803] ...future.result$conditions <- ...future.conditions [18:41:19.803] ...future.result$finished <- base::Sys.time() [18:41:19.803] ...future.result [18:41:19.803] } [18:41:19.807] assign_globals() ... [18:41:19.807] List of 5 [18:41:19.807] $ ...future.FUN :function (x) [18:41:19.807] $ future.call.arguments : list() [18:41:19.807] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:19.807] $ ...future.elements_ii :List of 3 [18:41:19.807] ..$ a: num 1 [18:41:19.807] ..$ b: num 2 [18:41:19.807] ..$ c: num 3 [18:41:19.807] $ ...future.seeds_ii : NULL [18:41:19.807] $ ...future.globals.maxSize: NULL [18:41:19.807] - attr(*, "where")=List of 5 [18:41:19.807] ..$ ...future.FUN : [18:41:19.807] ..$ future.call.arguments : [18:41:19.807] ..$ ...future.elements_ii : [18:41:19.807] ..$ ...future.seeds_ii : [18:41:19.807] ..$ ...future.globals.maxSize: [18:41:19.807] - attr(*, "resolved")= logi FALSE [18:41:19.807] - attr(*, "total_size")= num 2891 [18:41:19.807] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:19.807] - attr(*, "already-done")= logi TRUE [18:41:19.813] - copied '...future.FUN' to environment [18:41:19.814] - copied 'future.call.arguments' to environment [18:41:19.814] - copied '...future.elements_ii' to environment [18:41:19.814] - copied '...future.seeds_ii' to environment [18:41:19.814] - copied '...future.globals.maxSize' to environment [18:41:19.814] assign_globals() ... done [18:41:19.815] plan(): Setting new future strategy stack: [18:41:19.815] List of future strategies: [18:41:19.815] 1. sequential: [18:41:19.815] - args: function (..., envir = parent.frame(), workers = "") [18:41:19.815] - tweaked: FALSE [18:41:19.815] - call: NULL [18:41:19.815] plan(): nbrOfWorkers() = 1 [18:41:19.817] plan(): Setting new future strategy stack: [18:41:19.817] List of future strategies: [18:41:19.817] 1. multisession: [18:41:19.817] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:41:19.817] - tweaked: FALSE [18:41:19.817] - call: plan(strategy) [18:41:19.819] plan(): nbrOfWorkers() = 1 [18:41:19.820] SequentialFuture started (and completed) [18:41:19.820] - Launch lazy future ... done [18:41:19.820] run() for 'SequentialFuture' ... done [18:41:19.820] Created future: [18:41:19.820] SequentialFuture: [18:41:19.820] Label: 'future_lapply-1' [18:41:19.820] Expression: [18:41:19.820] { [18:41:19.820] do.call(function(...) { [18:41:19.820] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:19.820] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:19.820] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:19.820] on.exit(options(oopts), add = TRUE) [18:41:19.820] } [18:41:19.820] { [18:41:19.820] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:19.820] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:19.820] ...future.FUN(...future.X_jj, ...) [18:41:19.820] }) [18:41:19.820] } [18:41:19.820] }, args = future.call.arguments) [18:41:19.820] } [18:41:19.820] Lazy evaluation: FALSE [18:41:19.820] Asynchronous evaluation: FALSE [18:41:19.820] Local evaluation: TRUE [18:41:19.820] Environment: R_GlobalEnv [18:41:19.820] Capture standard output: TRUE [18:41:19.820] Capture condition classes: 'condition' (excluding 'nothing') [18:41:19.820] Globals: 5 objects totaling 327 bytes (function '...future.FUN' of 37 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 139 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:19.820] Packages: [18:41:19.820] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:19.820] Resolved: TRUE [18:41:19.820] Value: 67 bytes of class 'list' [18:41:19.820] Early signaling: FALSE [18:41:19.820] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:19.820] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:19.822] Chunk #1 of 1 ... DONE [18:41:19.822] Launching 1 futures (chunks) ... DONE [18:41:19.822] Resolving 1 futures (chunks) ... [18:41:19.822] resolve() on list ... [18:41:19.822] recursive: 0 [18:41:19.822] length: 1 [18:41:19.823] [18:41:19.823] resolved() for 'SequentialFuture' ... [18:41:19.823] - state: 'finished' [18:41:19.823] - run: TRUE [18:41:19.823] - result: 'FutureResult' [18:41:19.823] resolved() for 'SequentialFuture' ... done [18:41:19.824] Future #1 [18:41:19.824] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:19.824] - nx: 1 [18:41:19.824] - relay: TRUE [18:41:19.824] - stdout: TRUE [18:41:19.824] - signal: TRUE [18:41:19.825] - resignal: FALSE [18:41:19.825] - force: TRUE [18:41:19.825] - relayed: [n=1] FALSE [18:41:19.825] - queued futures: [n=1] FALSE [18:41:19.825] - until=1 [18:41:19.825] - relaying element #1 [18:41:19.826] - relayed: [n=1] TRUE [18:41:19.826] - queued futures: [n=1] TRUE [18:41:19.826] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:19.826] length: 0 (resolved future 1) [18:41:19.826] Relaying remaining futures [18:41:19.827] signalConditionsASAP(NULL, pos=0) ... [18:41:19.827] - nx: 1 [18:41:19.827] - relay: TRUE [18:41:19.827] - stdout: TRUE [18:41:19.827] - signal: TRUE [18:41:19.827] - resignal: FALSE [18:41:19.828] - force: TRUE [18:41:19.828] - relayed: [n=1] TRUE [18:41:19.828] - queued futures: [n=1] TRUE - flush all [18:41:19.828] - relayed: [n=1] TRUE [18:41:19.828] - queued futures: [n=1] TRUE [18:41:19.828] signalConditionsASAP(NULL, pos=0) ... done [18:41:19.829] resolve() on list ... DONE [18:41:19.829] - Number of value chunks collected: 1 [18:41:19.829] Resolving 1 futures (chunks) ... DONE [18:41:19.829] Reducing values from 1 chunks ... [18:41:19.829] - Number of values collected after concatenation: 3 [18:41:19.829] - Number of values expected: 3 [18:41:19.830] Reducing values from 1 chunks ... DONE [18:41:19.830] future_lapply() ... DONE - future_lapply(x, ...) where x[[i]] subsets via S3 method ... [18:41:19.830] future_lapply() ... [18:41:19.833] Number of chunks: 1 [18:41:19.833] getGlobalsAndPackagesXApply() ... [18:41:19.833] - future.globals: TRUE [18:41:19.833] getGlobalsAndPackages() ... [18:41:19.833] Searching for globals... [18:41:19.834] - globals found: [1] 'FUN' [18:41:19.835] Searching for globals ... DONE [18:41:19.835] Resolving globals: FALSE [18:41:19.835] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:19.836] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:19.836] - globals: [1] 'FUN' [18:41:19.836] [18:41:19.836] getGlobalsAndPackages() ... DONE [18:41:19.836] - globals found/used: [n=1] 'FUN' [18:41:19.836] - needed namespaces: [n=0] [18:41:19.837] Finding globals ... DONE [18:41:19.837] - use_args: TRUE [18:41:19.837] - Getting '...' globals ... [18:41:19.837] resolve() on list ... [18:41:19.838] recursive: 0 [18:41:19.838] length: 1 [18:41:19.838] elements: '...' [18:41:19.838] length: 0 (resolved future 1) [18:41:19.838] resolve() on list ... DONE [18:41:19.838] - '...' content: [n=0] [18:41:19.839] List of 1 [18:41:19.839] $ ...: list() [18:41:19.839] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:19.839] - attr(*, "where")=List of 1 [18:41:19.839] ..$ ...: [18:41:19.839] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:19.839] - attr(*, "resolved")= logi TRUE [18:41:19.839] - attr(*, "total_size")= num NA [18:41:19.842] - Getting '...' globals ... DONE [18:41:19.842] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:19.842] List of 2 [18:41:19.842] $ ...future.FUN:function (x) [18:41:19.842] $ ... : list() [18:41:19.842] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:19.842] - attr(*, "where")=List of 2 [18:41:19.842] ..$ ...future.FUN: [18:41:19.842] ..$ ... : [18:41:19.842] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:19.842] - attr(*, "resolved")= logi FALSE [18:41:19.842] - attr(*, "total_size")= int 3176 [18:41:19.845] Packages to be attached in all futures: [n=0] [18:41:19.846] getGlobalsAndPackagesXApply() ... DONE [18:41:19.846] Number of futures (= number of chunks): 1 [18:41:19.846] Launching 1 futures (chunks) ... [18:41:19.846] Chunk #1 of 1 ... [18:41:19.846] - Finding globals in 'X' for chunk #1 ... [18:41:19.849] getGlobalsAndPackages() ... [18:41:19.849] Searching for globals... [18:41:19.849] [18:41:19.850] Searching for globals ... DONE [18:41:19.850] - globals: [0] [18:41:19.850] getGlobalsAndPackages() ... DONE [18:41:19.850] + additional globals found: [n=0] [18:41:19.850] + additional namespaces needed: [n=0] [18:41:19.850] - Finding globals in 'X' for chunk #1 ... DONE [18:41:19.851] - seeds: [18:41:19.851] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.851] getGlobalsAndPackages() ... [18:41:19.851] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.851] Resolving globals: FALSE [18:41:19.851] Tweak future expression to call with '...' arguments ... [18:41:19.852] { [18:41:19.852] do.call(function(...) { [18:41:19.852] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:19.852] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:19.852] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:19.852] on.exit(options(oopts), add = TRUE) [18:41:19.852] } [18:41:19.852] { [18:41:19.852] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:19.852] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:19.852] ...future.FUN(...future.X_jj, ...) [18:41:19.852] }) [18:41:19.852] } [18:41:19.852] }, args = future.call.arguments) [18:41:19.852] } [18:41:19.852] Tweak future expression to call with '...' arguments ... DONE [18:41:19.853] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.853] [18:41:19.853] getGlobalsAndPackages() ... DONE [18:41:19.853] run() for 'Future' ... [18:41:19.853] - state: 'created' [18:41:19.854] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:19.856] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:19.856] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:19.856] - Field: 'label' [18:41:19.857] - Field: 'local' [18:41:19.857] - Field: 'owner' [18:41:19.857] - Field: 'envir' [18:41:19.857] - Field: 'packages' [18:41:19.857] - Field: 'gc' [18:41:19.857] - Field: 'conditions' [18:41:19.858] - Field: 'expr' [18:41:19.858] - Field: 'uuid' [18:41:19.858] - Field: 'seed' [18:41:19.858] - Field: 'version' [18:41:19.858] - Field: 'result' [18:41:19.858] - Field: 'asynchronous' [18:41:19.859] - Field: 'calls' [18:41:19.859] - Field: 'globals' [18:41:19.859] - Field: 'stdout' [18:41:19.859] - Field: 'earlySignal' [18:41:19.859] - Field: 'lazy' [18:41:19.859] - Field: 'state' [18:41:19.860] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:19.860] - Launch lazy future ... [18:41:19.860] Packages needed by the future expression (n = 0): [18:41:19.860] Packages needed by future strategies (n = 0): [18:41:19.861] { [18:41:19.861] { [18:41:19.861] { [18:41:19.861] ...future.startTime <- base::Sys.time() [18:41:19.861] { [18:41:19.861] { [18:41:19.861] { [18:41:19.861] base::local({ [18:41:19.861] has_future <- base::requireNamespace("future", [18:41:19.861] quietly = TRUE) [18:41:19.861] if (has_future) { [18:41:19.861] ns <- base::getNamespace("future") [18:41:19.861] version <- ns[[".package"]][["version"]] [18:41:19.861] if (is.null(version)) [18:41:19.861] version <- utils::packageVersion("future") [18:41:19.861] } [18:41:19.861] else { [18:41:19.861] version <- NULL [18:41:19.861] } [18:41:19.861] if (!has_future || version < "1.8.0") { [18:41:19.861] info <- base::c(r_version = base::gsub("R version ", [18:41:19.861] "", base::R.version$version.string), [18:41:19.861] platform = base::sprintf("%s (%s-bit)", [18:41:19.861] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:19.861] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:19.861] "release", "version")], collapse = " "), [18:41:19.861] hostname = base::Sys.info()[["nodename"]]) [18:41:19.861] info <- base::sprintf("%s: %s", base::names(info), [18:41:19.861] info) [18:41:19.861] info <- base::paste(info, collapse = "; ") [18:41:19.861] if (!has_future) { [18:41:19.861] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:19.861] info) [18:41:19.861] } [18:41:19.861] else { [18:41:19.861] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:19.861] info, version) [18:41:19.861] } [18:41:19.861] base::stop(msg) [18:41:19.861] } [18:41:19.861] }) [18:41:19.861] } [18:41:19.861] ...future.strategy.old <- future::plan("list") [18:41:19.861] options(future.plan = NULL) [18:41:19.861] Sys.unsetenv("R_FUTURE_PLAN") [18:41:19.861] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:19.861] } [18:41:19.861] ...future.workdir <- getwd() [18:41:19.861] } [18:41:19.861] ...future.oldOptions <- base::as.list(base::.Options) [18:41:19.861] ...future.oldEnvVars <- base::Sys.getenv() [18:41:19.861] } [18:41:19.861] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:19.861] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:19.861] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:19.861] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:19.861] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:19.861] future.stdout.windows.reencode = NULL, width = 80L) [18:41:19.861] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:19.861] base::names(...future.oldOptions)) [18:41:19.861] } [18:41:19.861] if (FALSE) { [18:41:19.861] } [18:41:19.861] else { [18:41:19.861] if (TRUE) { [18:41:19.861] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:19.861] open = "w") [18:41:19.861] } [18:41:19.861] else { [18:41:19.861] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:19.861] windows = "NUL", "/dev/null"), open = "w") [18:41:19.861] } [18:41:19.861] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:19.861] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:19.861] base::sink(type = "output", split = FALSE) [18:41:19.861] base::close(...future.stdout) [18:41:19.861] }, add = TRUE) [18:41:19.861] } [18:41:19.861] ...future.frame <- base::sys.nframe() [18:41:19.861] ...future.conditions <- base::list() [18:41:19.861] ...future.rng <- base::globalenv()$.Random.seed [18:41:19.861] if (FALSE) { [18:41:19.861] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:19.861] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:19.861] } [18:41:19.861] ...future.result <- base::tryCatch({ [18:41:19.861] base::withCallingHandlers({ [18:41:19.861] ...future.value <- base::withVisible(base::local({ [18:41:19.861] do.call(function(...) { [18:41:19.861] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:19.861] if (!identical(...future.globals.maxSize.org, [18:41:19.861] ...future.globals.maxSize)) { [18:41:19.861] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:19.861] on.exit(options(oopts), add = TRUE) [18:41:19.861] } [18:41:19.861] { [18:41:19.861] lapply(seq_along(...future.elements_ii), [18:41:19.861] FUN = function(jj) { [18:41:19.861] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:19.861] ...future.FUN(...future.X_jj, ...) [18:41:19.861] }) [18:41:19.861] } [18:41:19.861] }, args = future.call.arguments) [18:41:19.861] })) [18:41:19.861] future::FutureResult(value = ...future.value$value, [18:41:19.861] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:19.861] ...future.rng), globalenv = if (FALSE) [18:41:19.861] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:19.861] ...future.globalenv.names)) [18:41:19.861] else NULL, started = ...future.startTime, version = "1.8") [18:41:19.861] }, condition = base::local({ [18:41:19.861] c <- base::c [18:41:19.861] inherits <- base::inherits [18:41:19.861] invokeRestart <- base::invokeRestart [18:41:19.861] length <- base::length [18:41:19.861] list <- base::list [18:41:19.861] seq.int <- base::seq.int [18:41:19.861] signalCondition <- base::signalCondition [18:41:19.861] sys.calls <- base::sys.calls [18:41:19.861] `[[` <- base::`[[` [18:41:19.861] `+` <- base::`+` [18:41:19.861] `<<-` <- base::`<<-` [18:41:19.861] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:19.861] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:19.861] 3L)] [18:41:19.861] } [18:41:19.861] function(cond) { [18:41:19.861] is_error <- inherits(cond, "error") [18:41:19.861] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:19.861] NULL) [18:41:19.861] if (is_error) { [18:41:19.861] sessionInformation <- function() { [18:41:19.861] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:19.861] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:19.861] search = base::search(), system = base::Sys.info()) [18:41:19.861] } [18:41:19.861] ...future.conditions[[length(...future.conditions) + [18:41:19.861] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:19.861] cond$call), session = sessionInformation(), [18:41:19.861] timestamp = base::Sys.time(), signaled = 0L) [18:41:19.861] signalCondition(cond) [18:41:19.861] } [18:41:19.861] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:19.861] "immediateCondition"))) { [18:41:19.861] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:19.861] ...future.conditions[[length(...future.conditions) + [18:41:19.861] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:19.861] if (TRUE && !signal) { [18:41:19.861] muffleCondition <- function (cond, pattern = "^muffle") [18:41:19.861] { [18:41:19.861] inherits <- base::inherits [18:41:19.861] invokeRestart <- base::invokeRestart [18:41:19.861] is.null <- base::is.null [18:41:19.861] muffled <- FALSE [18:41:19.861] if (inherits(cond, "message")) { [18:41:19.861] muffled <- grepl(pattern, "muffleMessage") [18:41:19.861] if (muffled) [18:41:19.861] invokeRestart("muffleMessage") [18:41:19.861] } [18:41:19.861] else if (inherits(cond, "warning")) { [18:41:19.861] muffled <- grepl(pattern, "muffleWarning") [18:41:19.861] if (muffled) [18:41:19.861] invokeRestart("muffleWarning") [18:41:19.861] } [18:41:19.861] else if (inherits(cond, "condition")) { [18:41:19.861] if (!is.null(pattern)) { [18:41:19.861] computeRestarts <- base::computeRestarts [18:41:19.861] grepl <- base::grepl [18:41:19.861] restarts <- computeRestarts(cond) [18:41:19.861] for (restart in restarts) { [18:41:19.861] name <- restart$name [18:41:19.861] if (is.null(name)) [18:41:19.861] next [18:41:19.861] if (!grepl(pattern, name)) [18:41:19.861] next [18:41:19.861] invokeRestart(restart) [18:41:19.861] muffled <- TRUE [18:41:19.861] break [18:41:19.861] } [18:41:19.861] } [18:41:19.861] } [18:41:19.861] invisible(muffled) [18:41:19.861] } [18:41:19.861] muffleCondition(cond, pattern = "^muffle") [18:41:19.861] } [18:41:19.861] } [18:41:19.861] else { [18:41:19.861] if (TRUE) { [18:41:19.861] muffleCondition <- function (cond, pattern = "^muffle") [18:41:19.861] { [18:41:19.861] inherits <- base::inherits [18:41:19.861] invokeRestart <- base::invokeRestart [18:41:19.861] is.null <- base::is.null [18:41:19.861] muffled <- FALSE [18:41:19.861] if (inherits(cond, "message")) { [18:41:19.861] muffled <- grepl(pattern, "muffleMessage") [18:41:19.861] if (muffled) [18:41:19.861] invokeRestart("muffleMessage") [18:41:19.861] } [18:41:19.861] else if (inherits(cond, "warning")) { [18:41:19.861] muffled <- grepl(pattern, "muffleWarning") [18:41:19.861] if (muffled) [18:41:19.861] invokeRestart("muffleWarning") [18:41:19.861] } [18:41:19.861] else if (inherits(cond, "condition")) { [18:41:19.861] if (!is.null(pattern)) { [18:41:19.861] computeRestarts <- base::computeRestarts [18:41:19.861] grepl <- base::grepl [18:41:19.861] restarts <- computeRestarts(cond) [18:41:19.861] for (restart in restarts) { [18:41:19.861] name <- restart$name [18:41:19.861] if (is.null(name)) [18:41:19.861] next [18:41:19.861] if (!grepl(pattern, name)) [18:41:19.861] next [18:41:19.861] invokeRestart(restart) [18:41:19.861] muffled <- TRUE [18:41:19.861] break [18:41:19.861] } [18:41:19.861] } [18:41:19.861] } [18:41:19.861] invisible(muffled) [18:41:19.861] } [18:41:19.861] muffleCondition(cond, pattern = "^muffle") [18:41:19.861] } [18:41:19.861] } [18:41:19.861] } [18:41:19.861] })) [18:41:19.861] }, error = function(ex) { [18:41:19.861] base::structure(base::list(value = NULL, visible = NULL, [18:41:19.861] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:19.861] ...future.rng), started = ...future.startTime, [18:41:19.861] finished = Sys.time(), session_uuid = NA_character_, [18:41:19.861] version = "1.8"), class = "FutureResult") [18:41:19.861] }, finally = { [18:41:19.861] if (!identical(...future.workdir, getwd())) [18:41:19.861] setwd(...future.workdir) [18:41:19.861] { [18:41:19.861] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:19.861] ...future.oldOptions$nwarnings <- NULL [18:41:19.861] } [18:41:19.861] base::options(...future.oldOptions) [18:41:19.861] if (.Platform$OS.type == "windows") { [18:41:19.861] old_names <- names(...future.oldEnvVars) [18:41:19.861] envs <- base::Sys.getenv() [18:41:19.861] names <- names(envs) [18:41:19.861] common <- intersect(names, old_names) [18:41:19.861] added <- setdiff(names, old_names) [18:41:19.861] removed <- setdiff(old_names, names) [18:41:19.861] changed <- common[...future.oldEnvVars[common] != [18:41:19.861] envs[common]] [18:41:19.861] NAMES <- toupper(changed) [18:41:19.861] args <- list() [18:41:19.861] for (kk in seq_along(NAMES)) { [18:41:19.861] name <- changed[[kk]] [18:41:19.861] NAME <- NAMES[[kk]] [18:41:19.861] if (name != NAME && is.element(NAME, old_names)) [18:41:19.861] next [18:41:19.861] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:19.861] } [18:41:19.861] NAMES <- toupper(added) [18:41:19.861] for (kk in seq_along(NAMES)) { [18:41:19.861] name <- added[[kk]] [18:41:19.861] NAME <- NAMES[[kk]] [18:41:19.861] if (name != NAME && is.element(NAME, old_names)) [18:41:19.861] next [18:41:19.861] args[[name]] <- "" [18:41:19.861] } [18:41:19.861] NAMES <- toupper(removed) [18:41:19.861] for (kk in seq_along(NAMES)) { [18:41:19.861] name <- removed[[kk]] [18:41:19.861] NAME <- NAMES[[kk]] [18:41:19.861] if (name != NAME && is.element(NAME, old_names)) [18:41:19.861] next [18:41:19.861] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:19.861] } [18:41:19.861] if (length(args) > 0) [18:41:19.861] base::do.call(base::Sys.setenv, args = args) [18:41:19.861] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:19.861] } [18:41:19.861] else { [18:41:19.861] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:19.861] } [18:41:19.861] { [18:41:19.861] if (base::length(...future.futureOptionsAdded) > [18:41:19.861] 0L) { [18:41:19.861] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:19.861] base::names(opts) <- ...future.futureOptionsAdded [18:41:19.861] base::options(opts) [18:41:19.861] } [18:41:19.861] { [18:41:19.861] { [18:41:19.861] NULL [18:41:19.861] RNGkind("Mersenne-Twister") [18:41:19.861] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:19.861] inherits = FALSE) [18:41:19.861] } [18:41:19.861] options(future.plan = NULL) [18:41:19.861] if (is.na(NA_character_)) [18:41:19.861] Sys.unsetenv("R_FUTURE_PLAN") [18:41:19.861] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:19.861] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:19.861] .init = FALSE) [18:41:19.861] } [18:41:19.861] } [18:41:19.861] } [18:41:19.861] }) [18:41:19.861] if (TRUE) { [18:41:19.861] base::sink(type = "output", split = FALSE) [18:41:19.861] if (TRUE) { [18:41:19.861] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:19.861] } [18:41:19.861] else { [18:41:19.861] ...future.result["stdout"] <- base::list(NULL) [18:41:19.861] } [18:41:19.861] base::close(...future.stdout) [18:41:19.861] ...future.stdout <- NULL [18:41:19.861] } [18:41:19.861] ...future.result$conditions <- ...future.conditions [18:41:19.861] ...future.result$finished <- base::Sys.time() [18:41:19.861] ...future.result [18:41:19.861] } [18:41:19.865] assign_globals() ... [18:41:19.865] List of 5 [18:41:19.865] $ ...future.FUN :function (x) [18:41:19.865] $ future.call.arguments : list() [18:41:19.865] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:19.865] $ ...future.elements_ii :List of 2 [18:41:19.865] ..$ a: num 0 [18:41:19.865] ..$ b: num 0 [18:41:19.865] $ ...future.seeds_ii : NULL [18:41:19.865] $ ...future.globals.maxSize: NULL [18:41:19.865] - attr(*, "where")=List of 5 [18:41:19.865] ..$ ...future.FUN : [18:41:19.865] ..$ future.call.arguments : [18:41:19.865] ..$ ...future.elements_ii : [18:41:19.865] ..$ ...future.seeds_ii : [18:41:19.865] ..$ ...future.globals.maxSize: [18:41:19.865] - attr(*, "resolved")= logi FALSE [18:41:19.865] - attr(*, "total_size")= num 3176 [18:41:19.865] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:19.865] - attr(*, "already-done")= logi TRUE [18:41:19.871] - copied '...future.FUN' to environment [18:41:19.871] - copied 'future.call.arguments' to environment [18:41:19.871] - copied '...future.elements_ii' to environment [18:41:19.871] - copied '...future.seeds_ii' to environment [18:41:19.872] - copied '...future.globals.maxSize' to environment [18:41:19.872] assign_globals() ... done [18:41:19.872] plan(): Setting new future strategy stack: [18:41:19.872] List of future strategies: [18:41:19.872] 1. sequential: [18:41:19.872] - args: function (..., envir = parent.frame(), workers = "") [18:41:19.872] - tweaked: FALSE [18:41:19.872] - call: NULL [18:41:19.873] plan(): nbrOfWorkers() = 1 [18:41:19.874] plan(): Setting new future strategy stack: [18:41:19.874] List of future strategies: [18:41:19.874] 1. multisession: [18:41:19.874] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:41:19.874] - tweaked: FALSE [18:41:19.874] - call: plan(strategy) [18:41:19.877] plan(): nbrOfWorkers() = 1 [18:41:19.877] SequentialFuture started (and completed) [18:41:19.877] - Launch lazy future ... done [18:41:19.877] run() for 'SequentialFuture' ... done [18:41:19.878] Created future: [18:41:19.878] SequentialFuture: [18:41:19.878] Label: 'future_lapply-1' [18:41:19.878] Expression: [18:41:19.878] { [18:41:19.878] do.call(function(...) { [18:41:19.878] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:19.878] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:19.878] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:19.878] on.exit(options(oopts), add = TRUE) [18:41:19.878] } [18:41:19.878] { [18:41:19.878] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:19.878] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:19.878] ...future.FUN(...future.X_jj, ...) [18:41:19.878] }) [18:41:19.878] } [18:41:19.878] }, args = future.call.arguments) [18:41:19.878] } [18:41:19.878] Lazy evaluation: FALSE [18:41:19.878] Asynchronous evaluation: FALSE [18:41:19.878] Local evaluation: TRUE [18:41:19.878] Environment: R_GlobalEnv [18:41:19.878] Capture standard output: TRUE [18:41:19.878] Capture condition classes: 'condition' (excluding 'nothing') [18:41:19.878] Globals: 5 objects totaling 450 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:19.878] Packages: [18:41:19.878] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:19.878] Resolved: TRUE [18:41:19.878] Value: 63 bytes of class 'list' [18:41:19.878] Early signaling: FALSE [18:41:19.878] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:19.878] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:19.879] Chunk #1 of 1 ... DONE [18:41:19.879] Launching 1 futures (chunks) ... DONE [18:41:19.879] Resolving 1 futures (chunks) ... [18:41:19.879] resolve() on list ... [18:41:19.879] recursive: 0 [18:41:19.880] length: 1 [18:41:19.880] [18:41:19.880] resolved() for 'SequentialFuture' ... [18:41:19.880] - state: 'finished' [18:41:19.880] - run: TRUE [18:41:19.880] - result: 'FutureResult' [18:41:19.881] resolved() for 'SequentialFuture' ... done [18:41:19.881] Future #1 [18:41:19.881] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:19.881] - nx: 1 [18:41:19.881] - relay: TRUE [18:41:19.882] - stdout: TRUE [18:41:19.882] - signal: TRUE [18:41:19.882] - resignal: FALSE [18:41:19.882] - force: TRUE [18:41:19.882] - relayed: [n=1] FALSE [18:41:19.882] - queued futures: [n=1] FALSE [18:41:19.882] - until=1 [18:41:19.883] - relaying element #1 [18:41:19.883] - relayed: [n=1] TRUE [18:41:19.883] - queued futures: [n=1] TRUE [18:41:19.883] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:19.883] length: 0 (resolved future 1) [18:41:19.884] Relaying remaining futures [18:41:19.884] signalConditionsASAP(NULL, pos=0) ... [18:41:19.884] - nx: 1 [18:41:19.884] - relay: TRUE [18:41:19.884] - stdout: TRUE [18:41:19.884] - signal: TRUE [18:41:19.884] - resignal: FALSE [18:41:19.885] - force: TRUE [18:41:19.885] - relayed: [n=1] TRUE [18:41:19.885] - queued futures: [n=1] TRUE - flush all [18:41:19.885] - relayed: [n=1] TRUE [18:41:19.885] - queued futures: [n=1] TRUE [18:41:19.885] signalConditionsASAP(NULL, pos=0) ... done [18:41:19.886] resolve() on list ... DONE [18:41:19.886] - Number of value chunks collected: 1 [18:41:19.886] Resolving 1 futures (chunks) ... DONE [18:41:19.886] Reducing values from 1 chunks ... [18:41:19.886] - Number of values collected after concatenation: 2 [18:41:19.886] - Number of values expected: 2 [18:41:19.887] Reducing values from 1 chunks ... DONE [18:41:19.887] future_lapply() ... DONE Testing with 1 cores ... DONE Testing with 2 cores ... - plan('sequential') ... [18:41:19.887] plan(): Setting new future strategy stack: [18:41:19.887] List of future strategies: [18:41:19.887] 1. sequential: [18:41:19.887] - args: function (..., envir = parent.frame(), workers = "") [18:41:19.887] - tweaked: FALSE [18:41:19.887] - call: plan(strategy) [18:41:19.888] plan(): nbrOfWorkers() = 1 - future_lapply(x, FUN = vector, ...) ... [18:41:19.889] future_lapply() ... [18:41:19.890] Number of chunks: 4 [18:41:19.890] getGlobalsAndPackagesXApply() ... [18:41:19.890] - future.globals: TRUE [18:41:19.890] getGlobalsAndPackages() ... [18:41:19.890] Searching for globals... [18:41:19.892] - globals found: [2] 'FUN', '.Internal' [18:41:19.892] Searching for globals ... DONE [18:41:19.892] Resolving globals: FALSE [18:41:19.892] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:19.893] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:19.893] - globals: [1] 'FUN' [18:41:19.893] [18:41:19.893] getGlobalsAndPackages() ... DONE [18:41:19.894] - globals found/used: [n=1] 'FUN' [18:41:19.894] - needed namespaces: [n=0] [18:41:19.894] Finding globals ... DONE [18:41:19.894] - use_args: TRUE [18:41:19.894] - Getting '...' globals ... [18:41:19.895] resolve() on list ... [18:41:19.895] recursive: 0 [18:41:19.895] length: 1 [18:41:19.895] elements: '...' [18:41:19.895] length: 0 (resolved future 1) [18:41:19.896] resolve() on list ... DONE [18:41:19.896] - '...' content: [n=1] 'length' [18:41:19.896] List of 1 [18:41:19.896] $ ...:List of 1 [18:41:19.896] ..$ length: int 2 [18:41:19.896] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:19.896] - attr(*, "where")=List of 1 [18:41:19.896] ..$ ...: [18:41:19.896] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:19.896] - attr(*, "resolved")= logi TRUE [18:41:19.896] - attr(*, "total_size")= num NA [18:41:19.899] - Getting '...' globals ... DONE [18:41:19.899] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:19.900] List of 2 [18:41:19.900] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:19.900] $ ... :List of 1 [18:41:19.900] ..$ length: int 2 [18:41:19.900] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:19.900] - attr(*, "where")=List of 2 [18:41:19.900] ..$ ...future.FUN: [18:41:19.900] ..$ ... : [18:41:19.900] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:19.900] - attr(*, "resolved")= logi FALSE [18:41:19.900] - attr(*, "total_size")= int 4288 [18:41:19.903] Packages to be attached in all futures: [n=0] [18:41:19.903] getGlobalsAndPackagesXApply() ... DONE [18:41:19.904] Number of futures (= number of chunks): 4 [18:41:19.904] Launching 4 futures (chunks) ... [18:41:19.904] Chunk #1 of 4 ... [18:41:19.904] - Finding globals in 'X' for chunk #1 ... [18:41:19.904] getGlobalsAndPackages() ... [18:41:19.905] Searching for globals... [18:41:19.905] [18:41:19.905] Searching for globals ... DONE [18:41:19.905] - globals: [0] [18:41:19.905] getGlobalsAndPackages() ... DONE [18:41:19.905] + additional globals found: [n=0] [18:41:19.906] + additional namespaces needed: [n=0] [18:41:19.906] - Finding globals in 'X' for chunk #1 ... DONE [18:41:19.906] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:19.906] - seeds: [18:41:19.906] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.906] getGlobalsAndPackages() ... [18:41:19.907] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.907] Resolving globals: FALSE [18:41:19.907] Tweak future expression to call with '...' arguments ... [18:41:19.907] { [18:41:19.907] do.call(function(...) { [18:41:19.907] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:19.907] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:19.907] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:19.907] on.exit(options(oopts), add = TRUE) [18:41:19.907] } [18:41:19.907] { [18:41:19.907] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:19.907] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:19.907] ...future.FUN(...future.X_jj, ...) [18:41:19.907] }) [18:41:19.907] } [18:41:19.907] }, args = future.call.arguments) [18:41:19.907] } [18:41:19.908] Tweak future expression to call with '...' arguments ... DONE [18:41:19.908] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.908] [18:41:19.908] getGlobalsAndPackages() ... DONE [18:41:19.909] run() for 'Future' ... [18:41:19.909] - state: 'created' [18:41:19.909] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:19.910] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:19.910] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:19.910] - Field: 'label' [18:41:19.910] - Field: 'local' [18:41:19.910] - Field: 'owner' [18:41:19.910] - Field: 'envir' [18:41:19.911] - Field: 'packages' [18:41:19.911] - Field: 'gc' [18:41:19.911] - Field: 'conditions' [18:41:19.911] - Field: 'expr' [18:41:19.911] - Field: 'uuid' [18:41:19.911] - Field: 'seed' [18:41:19.912] - Field: 'version' [18:41:19.912] - Field: 'result' [18:41:19.912] - Field: 'asynchronous' [18:41:19.912] - Field: 'calls' [18:41:19.912] - Field: 'globals' [18:41:19.913] - Field: 'stdout' [18:41:19.913] - Field: 'earlySignal' [18:41:19.913] - Field: 'lazy' [18:41:19.913] - Field: 'state' [18:41:19.913] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:19.913] - Launch lazy future ... [18:41:19.914] Packages needed by the future expression (n = 0): [18:41:19.914] Packages needed by future strategies (n = 0): [18:41:19.914] { [18:41:19.914] { [18:41:19.914] { [18:41:19.914] ...future.startTime <- base::Sys.time() [18:41:19.914] { [18:41:19.914] { [18:41:19.914] { [18:41:19.914] base::local({ [18:41:19.914] has_future <- base::requireNamespace("future", [18:41:19.914] quietly = TRUE) [18:41:19.914] if (has_future) { [18:41:19.914] ns <- base::getNamespace("future") [18:41:19.914] version <- ns[[".package"]][["version"]] [18:41:19.914] if (is.null(version)) [18:41:19.914] version <- utils::packageVersion("future") [18:41:19.914] } [18:41:19.914] else { [18:41:19.914] version <- NULL [18:41:19.914] } [18:41:19.914] if (!has_future || version < "1.8.0") { [18:41:19.914] info <- base::c(r_version = base::gsub("R version ", [18:41:19.914] "", base::R.version$version.string), [18:41:19.914] platform = base::sprintf("%s (%s-bit)", [18:41:19.914] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:19.914] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:19.914] "release", "version")], collapse = " "), [18:41:19.914] hostname = base::Sys.info()[["nodename"]]) [18:41:19.914] info <- base::sprintf("%s: %s", base::names(info), [18:41:19.914] info) [18:41:19.914] info <- base::paste(info, collapse = "; ") [18:41:19.914] if (!has_future) { [18:41:19.914] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:19.914] info) [18:41:19.914] } [18:41:19.914] else { [18:41:19.914] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:19.914] info, version) [18:41:19.914] } [18:41:19.914] base::stop(msg) [18:41:19.914] } [18:41:19.914] }) [18:41:19.914] } [18:41:19.914] ...future.strategy.old <- future::plan("list") [18:41:19.914] options(future.plan = NULL) [18:41:19.914] Sys.unsetenv("R_FUTURE_PLAN") [18:41:19.914] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:19.914] } [18:41:19.914] ...future.workdir <- getwd() [18:41:19.914] } [18:41:19.914] ...future.oldOptions <- base::as.list(base::.Options) [18:41:19.914] ...future.oldEnvVars <- base::Sys.getenv() [18:41:19.914] } [18:41:19.914] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:19.914] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:19.914] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:19.914] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:19.914] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:19.914] future.stdout.windows.reencode = NULL, width = 80L) [18:41:19.914] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:19.914] base::names(...future.oldOptions)) [18:41:19.914] } [18:41:19.914] if (FALSE) { [18:41:19.914] } [18:41:19.914] else { [18:41:19.914] if (TRUE) { [18:41:19.914] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:19.914] open = "w") [18:41:19.914] } [18:41:19.914] else { [18:41:19.914] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:19.914] windows = "NUL", "/dev/null"), open = "w") [18:41:19.914] } [18:41:19.914] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:19.914] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:19.914] base::sink(type = "output", split = FALSE) [18:41:19.914] base::close(...future.stdout) [18:41:19.914] }, add = TRUE) [18:41:19.914] } [18:41:19.914] ...future.frame <- base::sys.nframe() [18:41:19.914] ...future.conditions <- base::list() [18:41:19.914] ...future.rng <- base::globalenv()$.Random.seed [18:41:19.914] if (FALSE) { [18:41:19.914] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:19.914] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:19.914] } [18:41:19.914] ...future.result <- base::tryCatch({ [18:41:19.914] base::withCallingHandlers({ [18:41:19.914] ...future.value <- base::withVisible(base::local({ [18:41:19.914] do.call(function(...) { [18:41:19.914] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:19.914] if (!identical(...future.globals.maxSize.org, [18:41:19.914] ...future.globals.maxSize)) { [18:41:19.914] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:19.914] on.exit(options(oopts), add = TRUE) [18:41:19.914] } [18:41:19.914] { [18:41:19.914] lapply(seq_along(...future.elements_ii), [18:41:19.914] FUN = function(jj) { [18:41:19.914] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:19.914] ...future.FUN(...future.X_jj, ...) [18:41:19.914] }) [18:41:19.914] } [18:41:19.914] }, args = future.call.arguments) [18:41:19.914] })) [18:41:19.914] future::FutureResult(value = ...future.value$value, [18:41:19.914] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:19.914] ...future.rng), globalenv = if (FALSE) [18:41:19.914] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:19.914] ...future.globalenv.names)) [18:41:19.914] else NULL, started = ...future.startTime, version = "1.8") [18:41:19.914] }, condition = base::local({ [18:41:19.914] c <- base::c [18:41:19.914] inherits <- base::inherits [18:41:19.914] invokeRestart <- base::invokeRestart [18:41:19.914] length <- base::length [18:41:19.914] list <- base::list [18:41:19.914] seq.int <- base::seq.int [18:41:19.914] signalCondition <- base::signalCondition [18:41:19.914] sys.calls <- base::sys.calls [18:41:19.914] `[[` <- base::`[[` [18:41:19.914] `+` <- base::`+` [18:41:19.914] `<<-` <- base::`<<-` [18:41:19.914] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:19.914] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:19.914] 3L)] [18:41:19.914] } [18:41:19.914] function(cond) { [18:41:19.914] is_error <- inherits(cond, "error") [18:41:19.914] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:19.914] NULL) [18:41:19.914] if (is_error) { [18:41:19.914] sessionInformation <- function() { [18:41:19.914] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:19.914] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:19.914] search = base::search(), system = base::Sys.info()) [18:41:19.914] } [18:41:19.914] ...future.conditions[[length(...future.conditions) + [18:41:19.914] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:19.914] cond$call), session = sessionInformation(), [18:41:19.914] timestamp = base::Sys.time(), signaled = 0L) [18:41:19.914] signalCondition(cond) [18:41:19.914] } [18:41:19.914] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:19.914] "immediateCondition"))) { [18:41:19.914] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:19.914] ...future.conditions[[length(...future.conditions) + [18:41:19.914] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:19.914] if (TRUE && !signal) { [18:41:19.914] muffleCondition <- function (cond, pattern = "^muffle") [18:41:19.914] { [18:41:19.914] inherits <- base::inherits [18:41:19.914] invokeRestart <- base::invokeRestart [18:41:19.914] is.null <- base::is.null [18:41:19.914] muffled <- FALSE [18:41:19.914] if (inherits(cond, "message")) { [18:41:19.914] muffled <- grepl(pattern, "muffleMessage") [18:41:19.914] if (muffled) [18:41:19.914] invokeRestart("muffleMessage") [18:41:19.914] } [18:41:19.914] else if (inherits(cond, "warning")) { [18:41:19.914] muffled <- grepl(pattern, "muffleWarning") [18:41:19.914] if (muffled) [18:41:19.914] invokeRestart("muffleWarning") [18:41:19.914] } [18:41:19.914] else if (inherits(cond, "condition")) { [18:41:19.914] if (!is.null(pattern)) { [18:41:19.914] computeRestarts <- base::computeRestarts [18:41:19.914] grepl <- base::grepl [18:41:19.914] restarts <- computeRestarts(cond) [18:41:19.914] for (restart in restarts) { [18:41:19.914] name <- restart$name [18:41:19.914] if (is.null(name)) [18:41:19.914] next [18:41:19.914] if (!grepl(pattern, name)) [18:41:19.914] next [18:41:19.914] invokeRestart(restart) [18:41:19.914] muffled <- TRUE [18:41:19.914] break [18:41:19.914] } [18:41:19.914] } [18:41:19.914] } [18:41:19.914] invisible(muffled) [18:41:19.914] } [18:41:19.914] muffleCondition(cond, pattern = "^muffle") [18:41:19.914] } [18:41:19.914] } [18:41:19.914] else { [18:41:19.914] if (TRUE) { [18:41:19.914] muffleCondition <- function (cond, pattern = "^muffle") [18:41:19.914] { [18:41:19.914] inherits <- base::inherits [18:41:19.914] invokeRestart <- base::invokeRestart [18:41:19.914] is.null <- base::is.null [18:41:19.914] muffled <- FALSE [18:41:19.914] if (inherits(cond, "message")) { [18:41:19.914] muffled <- grepl(pattern, "muffleMessage") [18:41:19.914] if (muffled) [18:41:19.914] invokeRestart("muffleMessage") [18:41:19.914] } [18:41:19.914] else if (inherits(cond, "warning")) { [18:41:19.914] muffled <- grepl(pattern, "muffleWarning") [18:41:19.914] if (muffled) [18:41:19.914] invokeRestart("muffleWarning") [18:41:19.914] } [18:41:19.914] else if (inherits(cond, "condition")) { [18:41:19.914] if (!is.null(pattern)) { [18:41:19.914] computeRestarts <- base::computeRestarts [18:41:19.914] grepl <- base::grepl [18:41:19.914] restarts <- computeRestarts(cond) [18:41:19.914] for (restart in restarts) { [18:41:19.914] name <- restart$name [18:41:19.914] if (is.null(name)) [18:41:19.914] next [18:41:19.914] if (!grepl(pattern, name)) [18:41:19.914] next [18:41:19.914] invokeRestart(restart) [18:41:19.914] muffled <- TRUE [18:41:19.914] break [18:41:19.914] } [18:41:19.914] } [18:41:19.914] } [18:41:19.914] invisible(muffled) [18:41:19.914] } [18:41:19.914] muffleCondition(cond, pattern = "^muffle") [18:41:19.914] } [18:41:19.914] } [18:41:19.914] } [18:41:19.914] })) [18:41:19.914] }, error = function(ex) { [18:41:19.914] base::structure(base::list(value = NULL, visible = NULL, [18:41:19.914] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:19.914] ...future.rng), started = ...future.startTime, [18:41:19.914] finished = Sys.time(), session_uuid = NA_character_, [18:41:19.914] version = "1.8"), class = "FutureResult") [18:41:19.914] }, finally = { [18:41:19.914] if (!identical(...future.workdir, getwd())) [18:41:19.914] setwd(...future.workdir) [18:41:19.914] { [18:41:19.914] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:19.914] ...future.oldOptions$nwarnings <- NULL [18:41:19.914] } [18:41:19.914] base::options(...future.oldOptions) [18:41:19.914] if (.Platform$OS.type == "windows") { [18:41:19.914] old_names <- names(...future.oldEnvVars) [18:41:19.914] envs <- base::Sys.getenv() [18:41:19.914] names <- names(envs) [18:41:19.914] common <- intersect(names, old_names) [18:41:19.914] added <- setdiff(names, old_names) [18:41:19.914] removed <- setdiff(old_names, names) [18:41:19.914] changed <- common[...future.oldEnvVars[common] != [18:41:19.914] envs[common]] [18:41:19.914] NAMES <- toupper(changed) [18:41:19.914] args <- list() [18:41:19.914] for (kk in seq_along(NAMES)) { [18:41:19.914] name <- changed[[kk]] [18:41:19.914] NAME <- NAMES[[kk]] [18:41:19.914] if (name != NAME && is.element(NAME, old_names)) [18:41:19.914] next [18:41:19.914] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:19.914] } [18:41:19.914] NAMES <- toupper(added) [18:41:19.914] for (kk in seq_along(NAMES)) { [18:41:19.914] name <- added[[kk]] [18:41:19.914] NAME <- NAMES[[kk]] [18:41:19.914] if (name != NAME && is.element(NAME, old_names)) [18:41:19.914] next [18:41:19.914] args[[name]] <- "" [18:41:19.914] } [18:41:19.914] NAMES <- toupper(removed) [18:41:19.914] for (kk in seq_along(NAMES)) { [18:41:19.914] name <- removed[[kk]] [18:41:19.914] NAME <- NAMES[[kk]] [18:41:19.914] if (name != NAME && is.element(NAME, old_names)) [18:41:19.914] next [18:41:19.914] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:19.914] } [18:41:19.914] if (length(args) > 0) [18:41:19.914] base::do.call(base::Sys.setenv, args = args) [18:41:19.914] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:19.914] } [18:41:19.914] else { [18:41:19.914] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:19.914] } [18:41:19.914] { [18:41:19.914] if (base::length(...future.futureOptionsAdded) > [18:41:19.914] 0L) { [18:41:19.914] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:19.914] base::names(opts) <- ...future.futureOptionsAdded [18:41:19.914] base::options(opts) [18:41:19.914] } [18:41:19.914] { [18:41:19.914] { [18:41:19.914] NULL [18:41:19.914] RNGkind("Mersenne-Twister") [18:41:19.914] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:19.914] inherits = FALSE) [18:41:19.914] } [18:41:19.914] options(future.plan = NULL) [18:41:19.914] if (is.na(NA_character_)) [18:41:19.914] Sys.unsetenv("R_FUTURE_PLAN") [18:41:19.914] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:19.914] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:19.914] .init = FALSE) [18:41:19.914] } [18:41:19.914] } [18:41:19.914] } [18:41:19.914] }) [18:41:19.914] if (TRUE) { [18:41:19.914] base::sink(type = "output", split = FALSE) [18:41:19.914] if (TRUE) { [18:41:19.914] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:19.914] } [18:41:19.914] else { [18:41:19.914] ...future.result["stdout"] <- base::list(NULL) [18:41:19.914] } [18:41:19.914] base::close(...future.stdout) [18:41:19.914] ...future.stdout <- NULL [18:41:19.914] } [18:41:19.914] ...future.result$conditions <- ...future.conditions [18:41:19.914] ...future.result$finished <- base::Sys.time() [18:41:19.914] ...future.result [18:41:19.914] } [18:41:19.918] assign_globals() ... [18:41:19.918] List of 5 [18:41:19.918] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:19.918] $ future.call.arguments :List of 1 [18:41:19.918] ..$ length: int 2 [18:41:19.918] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:19.918] $ ...future.elements_ii :List of 1 [18:41:19.918] ..$ a: chr "integer" [18:41:19.918] $ ...future.seeds_ii : NULL [18:41:19.918] $ ...future.globals.maxSize: NULL [18:41:19.918] - attr(*, "where")=List of 5 [18:41:19.918] ..$ ...future.FUN : [18:41:19.918] ..$ future.call.arguments : [18:41:19.918] ..$ ...future.elements_ii : [18:41:19.918] ..$ ...future.seeds_ii : [18:41:19.918] ..$ ...future.globals.maxSize: [18:41:19.918] - attr(*, "resolved")= logi FALSE [18:41:19.918] - attr(*, "total_size")= num 4288 [18:41:19.918] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:19.918] - attr(*, "already-done")= logi TRUE [18:41:19.924] - copied '...future.FUN' to environment [18:41:19.925] - copied 'future.call.arguments' to environment [18:41:19.925] - copied '...future.elements_ii' to environment [18:41:19.925] - copied '...future.seeds_ii' to environment [18:41:19.925] - copied '...future.globals.maxSize' to environment [18:41:19.925] assign_globals() ... done [18:41:19.926] plan(): Setting new future strategy stack: [18:41:19.926] List of future strategies: [18:41:19.926] 1. sequential: [18:41:19.926] - args: function (..., envir = parent.frame(), workers = "") [18:41:19.926] - tweaked: FALSE [18:41:19.926] - call: NULL [18:41:19.927] plan(): nbrOfWorkers() = 1 [18:41:19.928] plan(): Setting new future strategy stack: [18:41:19.928] List of future strategies: [18:41:19.928] 1. sequential: [18:41:19.928] - args: function (..., envir = parent.frame(), workers = "") [18:41:19.928] - tweaked: FALSE [18:41:19.928] - call: plan(strategy) [18:41:19.929] plan(): nbrOfWorkers() = 1 [18:41:19.929] SequentialFuture started (and completed) [18:41:19.929] - Launch lazy future ... done [18:41:19.929] run() for 'SequentialFuture' ... done [18:41:19.929] Created future: [18:41:19.930] SequentialFuture: [18:41:19.930] Label: 'future_lapply-1' [18:41:19.930] Expression: [18:41:19.930] { [18:41:19.930] do.call(function(...) { [18:41:19.930] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:19.930] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:19.930] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:19.930] on.exit(options(oopts), add = TRUE) [18:41:19.930] } [18:41:19.930] { [18:41:19.930] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:19.930] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:19.930] ...future.FUN(...future.X_jj, ...) [18:41:19.930] }) [18:41:19.930] } [18:41:19.930] }, args = future.call.arguments) [18:41:19.930] } [18:41:19.930] Lazy evaluation: FALSE [18:41:19.930] Asynchronous evaluation: FALSE [18:41:19.930] Local evaluation: TRUE [18:41:19.930] Environment: R_GlobalEnv [18:41:19.930] Capture standard output: TRUE [18:41:19.930] Capture condition classes: 'condition' (excluding 'nothing') [18:41:19.930] Globals: 5 objects totaling 758 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 96 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:19.930] Packages: [18:41:19.930] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:19.930] Resolved: TRUE [18:41:19.930] Value: 47 bytes of class 'list' [18:41:19.930] Early signaling: FALSE [18:41:19.930] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:19.930] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:19.931] Chunk #1 of 4 ... DONE [18:41:19.931] Chunk #2 of 4 ... [18:41:19.931] - Finding globals in 'X' for chunk #2 ... [18:41:19.931] getGlobalsAndPackages() ... [18:41:19.931] Searching for globals... [18:41:19.932] [18:41:19.932] Searching for globals ... DONE [18:41:19.932] - globals: [0] [18:41:19.932] getGlobalsAndPackages() ... DONE [18:41:19.932] + additional globals found: [n=0] [18:41:19.933] + additional namespaces needed: [n=0] [18:41:19.933] - Finding globals in 'X' for chunk #2 ... DONE [18:41:19.933] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:19.933] - seeds: [18:41:19.933] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.933] getGlobalsAndPackages() ... [18:41:19.934] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.934] Resolving globals: FALSE [18:41:19.934] Tweak future expression to call with '...' arguments ... [18:41:19.934] { [18:41:19.934] do.call(function(...) { [18:41:19.934] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:19.934] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:19.934] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:19.934] on.exit(options(oopts), add = TRUE) [18:41:19.934] } [18:41:19.934] { [18:41:19.934] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:19.934] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:19.934] ...future.FUN(...future.X_jj, ...) [18:41:19.934] }) [18:41:19.934] } [18:41:19.934] }, args = future.call.arguments) [18:41:19.934] } [18:41:19.934] Tweak future expression to call with '...' arguments ... DONE [18:41:19.935] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.935] [18:41:19.935] getGlobalsAndPackages() ... DONE [18:41:19.936] run() for 'Future' ... [18:41:19.936] - state: 'created' [18:41:19.936] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:19.936] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:19.937] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:19.937] - Field: 'label' [18:41:19.937] - Field: 'local' [18:41:19.937] - Field: 'owner' [18:41:19.937] - Field: 'envir' [18:41:19.938] - Field: 'packages' [18:41:19.938] - Field: 'gc' [18:41:19.938] - Field: 'conditions' [18:41:19.938] - Field: 'expr' [18:41:19.938] - Field: 'uuid' [18:41:19.938] - Field: 'seed' [18:41:19.939] - Field: 'version' [18:41:19.939] - Field: 'result' [18:41:19.939] - Field: 'asynchronous' [18:41:19.939] - Field: 'calls' [18:41:19.939] - Field: 'globals' [18:41:19.940] - Field: 'stdout' [18:41:19.940] - Field: 'earlySignal' [18:41:19.940] - Field: 'lazy' [18:41:19.940] - Field: 'state' [18:41:19.940] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:19.940] - Launch lazy future ... [18:41:19.941] Packages needed by the future expression (n = 0): [18:41:19.941] Packages needed by future strategies (n = 0): [18:41:19.941] { [18:41:19.941] { [18:41:19.941] { [18:41:19.941] ...future.startTime <- base::Sys.time() [18:41:19.941] { [18:41:19.941] { [18:41:19.941] { [18:41:19.941] base::local({ [18:41:19.941] has_future <- base::requireNamespace("future", [18:41:19.941] quietly = TRUE) [18:41:19.941] if (has_future) { [18:41:19.941] ns <- base::getNamespace("future") [18:41:19.941] version <- ns[[".package"]][["version"]] [18:41:19.941] if (is.null(version)) [18:41:19.941] version <- utils::packageVersion("future") [18:41:19.941] } [18:41:19.941] else { [18:41:19.941] version <- NULL [18:41:19.941] } [18:41:19.941] if (!has_future || version < "1.8.0") { [18:41:19.941] info <- base::c(r_version = base::gsub("R version ", [18:41:19.941] "", base::R.version$version.string), [18:41:19.941] platform = base::sprintf("%s (%s-bit)", [18:41:19.941] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:19.941] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:19.941] "release", "version")], collapse = " "), [18:41:19.941] hostname = base::Sys.info()[["nodename"]]) [18:41:19.941] info <- base::sprintf("%s: %s", base::names(info), [18:41:19.941] info) [18:41:19.941] info <- base::paste(info, collapse = "; ") [18:41:19.941] if (!has_future) { [18:41:19.941] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:19.941] info) [18:41:19.941] } [18:41:19.941] else { [18:41:19.941] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:19.941] info, version) [18:41:19.941] } [18:41:19.941] base::stop(msg) [18:41:19.941] } [18:41:19.941] }) [18:41:19.941] } [18:41:19.941] ...future.strategy.old <- future::plan("list") [18:41:19.941] options(future.plan = NULL) [18:41:19.941] Sys.unsetenv("R_FUTURE_PLAN") [18:41:19.941] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:19.941] } [18:41:19.941] ...future.workdir <- getwd() [18:41:19.941] } [18:41:19.941] ...future.oldOptions <- base::as.list(base::.Options) [18:41:19.941] ...future.oldEnvVars <- base::Sys.getenv() [18:41:19.941] } [18:41:19.941] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:19.941] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:19.941] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:19.941] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:19.941] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:19.941] future.stdout.windows.reencode = NULL, width = 80L) [18:41:19.941] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:19.941] base::names(...future.oldOptions)) [18:41:19.941] } [18:41:19.941] if (FALSE) { [18:41:19.941] } [18:41:19.941] else { [18:41:19.941] if (TRUE) { [18:41:19.941] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:19.941] open = "w") [18:41:19.941] } [18:41:19.941] else { [18:41:19.941] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:19.941] windows = "NUL", "/dev/null"), open = "w") [18:41:19.941] } [18:41:19.941] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:19.941] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:19.941] base::sink(type = "output", split = FALSE) [18:41:19.941] base::close(...future.stdout) [18:41:19.941] }, add = TRUE) [18:41:19.941] } [18:41:19.941] ...future.frame <- base::sys.nframe() [18:41:19.941] ...future.conditions <- base::list() [18:41:19.941] ...future.rng <- base::globalenv()$.Random.seed [18:41:19.941] if (FALSE) { [18:41:19.941] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:19.941] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:19.941] } [18:41:19.941] ...future.result <- base::tryCatch({ [18:41:19.941] base::withCallingHandlers({ [18:41:19.941] ...future.value <- base::withVisible(base::local({ [18:41:19.941] do.call(function(...) { [18:41:19.941] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:19.941] if (!identical(...future.globals.maxSize.org, [18:41:19.941] ...future.globals.maxSize)) { [18:41:19.941] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:19.941] on.exit(options(oopts), add = TRUE) [18:41:19.941] } [18:41:19.941] { [18:41:19.941] lapply(seq_along(...future.elements_ii), [18:41:19.941] FUN = function(jj) { [18:41:19.941] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:19.941] ...future.FUN(...future.X_jj, ...) [18:41:19.941] }) [18:41:19.941] } [18:41:19.941] }, args = future.call.arguments) [18:41:19.941] })) [18:41:19.941] future::FutureResult(value = ...future.value$value, [18:41:19.941] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:19.941] ...future.rng), globalenv = if (FALSE) [18:41:19.941] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:19.941] ...future.globalenv.names)) [18:41:19.941] else NULL, started = ...future.startTime, version = "1.8") [18:41:19.941] }, condition = base::local({ [18:41:19.941] c <- base::c [18:41:19.941] inherits <- base::inherits [18:41:19.941] invokeRestart <- base::invokeRestart [18:41:19.941] length <- base::length [18:41:19.941] list <- base::list [18:41:19.941] seq.int <- base::seq.int [18:41:19.941] signalCondition <- base::signalCondition [18:41:19.941] sys.calls <- base::sys.calls [18:41:19.941] `[[` <- base::`[[` [18:41:19.941] `+` <- base::`+` [18:41:19.941] `<<-` <- base::`<<-` [18:41:19.941] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:19.941] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:19.941] 3L)] [18:41:19.941] } [18:41:19.941] function(cond) { [18:41:19.941] is_error <- inherits(cond, "error") [18:41:19.941] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:19.941] NULL) [18:41:19.941] if (is_error) { [18:41:19.941] sessionInformation <- function() { [18:41:19.941] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:19.941] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:19.941] search = base::search(), system = base::Sys.info()) [18:41:19.941] } [18:41:19.941] ...future.conditions[[length(...future.conditions) + [18:41:19.941] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:19.941] cond$call), session = sessionInformation(), [18:41:19.941] timestamp = base::Sys.time(), signaled = 0L) [18:41:19.941] signalCondition(cond) [18:41:19.941] } [18:41:19.941] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:19.941] "immediateCondition"))) { [18:41:19.941] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:19.941] ...future.conditions[[length(...future.conditions) + [18:41:19.941] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:19.941] if (TRUE && !signal) { [18:41:19.941] muffleCondition <- function (cond, pattern = "^muffle") [18:41:19.941] { [18:41:19.941] inherits <- base::inherits [18:41:19.941] invokeRestart <- base::invokeRestart [18:41:19.941] is.null <- base::is.null [18:41:19.941] muffled <- FALSE [18:41:19.941] if (inherits(cond, "message")) { [18:41:19.941] muffled <- grepl(pattern, "muffleMessage") [18:41:19.941] if (muffled) [18:41:19.941] invokeRestart("muffleMessage") [18:41:19.941] } [18:41:19.941] else if (inherits(cond, "warning")) { [18:41:19.941] muffled <- grepl(pattern, "muffleWarning") [18:41:19.941] if (muffled) [18:41:19.941] invokeRestart("muffleWarning") [18:41:19.941] } [18:41:19.941] else if (inherits(cond, "condition")) { [18:41:19.941] if (!is.null(pattern)) { [18:41:19.941] computeRestarts <- base::computeRestarts [18:41:19.941] grepl <- base::grepl [18:41:19.941] restarts <- computeRestarts(cond) [18:41:19.941] for (restart in restarts) { [18:41:19.941] name <- restart$name [18:41:19.941] if (is.null(name)) [18:41:19.941] next [18:41:19.941] if (!grepl(pattern, name)) [18:41:19.941] next [18:41:19.941] invokeRestart(restart) [18:41:19.941] muffled <- TRUE [18:41:19.941] break [18:41:19.941] } [18:41:19.941] } [18:41:19.941] } [18:41:19.941] invisible(muffled) [18:41:19.941] } [18:41:19.941] muffleCondition(cond, pattern = "^muffle") [18:41:19.941] } [18:41:19.941] } [18:41:19.941] else { [18:41:19.941] if (TRUE) { [18:41:19.941] muffleCondition <- function (cond, pattern = "^muffle") [18:41:19.941] { [18:41:19.941] inherits <- base::inherits [18:41:19.941] invokeRestart <- base::invokeRestart [18:41:19.941] is.null <- base::is.null [18:41:19.941] muffled <- FALSE [18:41:19.941] if (inherits(cond, "message")) { [18:41:19.941] muffled <- grepl(pattern, "muffleMessage") [18:41:19.941] if (muffled) [18:41:19.941] invokeRestart("muffleMessage") [18:41:19.941] } [18:41:19.941] else if (inherits(cond, "warning")) { [18:41:19.941] muffled <- grepl(pattern, "muffleWarning") [18:41:19.941] if (muffled) [18:41:19.941] invokeRestart("muffleWarning") [18:41:19.941] } [18:41:19.941] else if (inherits(cond, "condition")) { [18:41:19.941] if (!is.null(pattern)) { [18:41:19.941] computeRestarts <- base::computeRestarts [18:41:19.941] grepl <- base::grepl [18:41:19.941] restarts <- computeRestarts(cond) [18:41:19.941] for (restart in restarts) { [18:41:19.941] name <- restart$name [18:41:19.941] if (is.null(name)) [18:41:19.941] next [18:41:19.941] if (!grepl(pattern, name)) [18:41:19.941] next [18:41:19.941] invokeRestart(restart) [18:41:19.941] muffled <- TRUE [18:41:19.941] break [18:41:19.941] } [18:41:19.941] } [18:41:19.941] } [18:41:19.941] invisible(muffled) [18:41:19.941] } [18:41:19.941] muffleCondition(cond, pattern = "^muffle") [18:41:19.941] } [18:41:19.941] } [18:41:19.941] } [18:41:19.941] })) [18:41:19.941] }, error = function(ex) { [18:41:19.941] base::structure(base::list(value = NULL, visible = NULL, [18:41:19.941] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:19.941] ...future.rng), started = ...future.startTime, [18:41:19.941] finished = Sys.time(), session_uuid = NA_character_, [18:41:19.941] version = "1.8"), class = "FutureResult") [18:41:19.941] }, finally = { [18:41:19.941] if (!identical(...future.workdir, getwd())) [18:41:19.941] setwd(...future.workdir) [18:41:19.941] { [18:41:19.941] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:19.941] ...future.oldOptions$nwarnings <- NULL [18:41:19.941] } [18:41:19.941] base::options(...future.oldOptions) [18:41:19.941] if (.Platform$OS.type == "windows") { [18:41:19.941] old_names <- names(...future.oldEnvVars) [18:41:19.941] envs <- base::Sys.getenv() [18:41:19.941] names <- names(envs) [18:41:19.941] common <- intersect(names, old_names) [18:41:19.941] added <- setdiff(names, old_names) [18:41:19.941] removed <- setdiff(old_names, names) [18:41:19.941] changed <- common[...future.oldEnvVars[common] != [18:41:19.941] envs[common]] [18:41:19.941] NAMES <- toupper(changed) [18:41:19.941] args <- list() [18:41:19.941] for (kk in seq_along(NAMES)) { [18:41:19.941] name <- changed[[kk]] [18:41:19.941] NAME <- NAMES[[kk]] [18:41:19.941] if (name != NAME && is.element(NAME, old_names)) [18:41:19.941] next [18:41:19.941] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:19.941] } [18:41:19.941] NAMES <- toupper(added) [18:41:19.941] for (kk in seq_along(NAMES)) { [18:41:19.941] name <- added[[kk]] [18:41:19.941] NAME <- NAMES[[kk]] [18:41:19.941] if (name != NAME && is.element(NAME, old_names)) [18:41:19.941] next [18:41:19.941] args[[name]] <- "" [18:41:19.941] } [18:41:19.941] NAMES <- toupper(removed) [18:41:19.941] for (kk in seq_along(NAMES)) { [18:41:19.941] name <- removed[[kk]] [18:41:19.941] NAME <- NAMES[[kk]] [18:41:19.941] if (name != NAME && is.element(NAME, old_names)) [18:41:19.941] next [18:41:19.941] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:19.941] } [18:41:19.941] if (length(args) > 0) [18:41:19.941] base::do.call(base::Sys.setenv, args = args) [18:41:19.941] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:19.941] } [18:41:19.941] else { [18:41:19.941] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:19.941] } [18:41:19.941] { [18:41:19.941] if (base::length(...future.futureOptionsAdded) > [18:41:19.941] 0L) { [18:41:19.941] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:19.941] base::names(opts) <- ...future.futureOptionsAdded [18:41:19.941] base::options(opts) [18:41:19.941] } [18:41:19.941] { [18:41:19.941] { [18:41:19.941] NULL [18:41:19.941] RNGkind("Mersenne-Twister") [18:41:19.941] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:19.941] inherits = FALSE) [18:41:19.941] } [18:41:19.941] options(future.plan = NULL) [18:41:19.941] if (is.na(NA_character_)) [18:41:19.941] Sys.unsetenv("R_FUTURE_PLAN") [18:41:19.941] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:19.941] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:19.941] .init = FALSE) [18:41:19.941] } [18:41:19.941] } [18:41:19.941] } [18:41:19.941] }) [18:41:19.941] if (TRUE) { [18:41:19.941] base::sink(type = "output", split = FALSE) [18:41:19.941] if (TRUE) { [18:41:19.941] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:19.941] } [18:41:19.941] else { [18:41:19.941] ...future.result["stdout"] <- base::list(NULL) [18:41:19.941] } [18:41:19.941] base::close(...future.stdout) [18:41:19.941] ...future.stdout <- NULL [18:41:19.941] } [18:41:19.941] ...future.result$conditions <- ...future.conditions [18:41:19.941] ...future.result$finished <- base::Sys.time() [18:41:19.941] ...future.result [18:41:19.941] } [18:41:19.945] assign_globals() ... [18:41:19.946] List of 5 [18:41:19.946] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:19.946] $ future.call.arguments :List of 1 [18:41:19.946] ..$ length: int 2 [18:41:19.946] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:19.946] $ ...future.elements_ii :List of 1 [18:41:19.946] ..$ b: chr "numeric" [18:41:19.946] $ ...future.seeds_ii : NULL [18:41:19.946] $ ...future.globals.maxSize: NULL [18:41:19.946] - attr(*, "where")=List of 5 [18:41:19.946] ..$ ...future.FUN : [18:41:19.946] ..$ future.call.arguments : [18:41:19.946] ..$ ...future.elements_ii : [18:41:19.946] ..$ ...future.seeds_ii : [18:41:19.946] ..$ ...future.globals.maxSize: [18:41:19.946] - attr(*, "resolved")= logi FALSE [18:41:19.946] - attr(*, "total_size")= num 4288 [18:41:19.946] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:19.946] - attr(*, "already-done")= logi TRUE [18:41:19.952] - copied '...future.FUN' to environment [18:41:19.952] - copied 'future.call.arguments' to environment [18:41:19.952] - copied '...future.elements_ii' to environment [18:41:19.952] - copied '...future.seeds_ii' to environment [18:41:19.952] - copied '...future.globals.maxSize' to environment [18:41:19.953] assign_globals() ... done [18:41:19.953] plan(): Setting new future strategy stack: [18:41:19.953] List of future strategies: [18:41:19.953] 1. sequential: [18:41:19.953] - args: function (..., envir = parent.frame(), workers = "") [18:41:19.953] - tweaked: FALSE [18:41:19.953] - call: NULL [18:41:19.954] plan(): nbrOfWorkers() = 1 [18:41:19.955] plan(): Setting new future strategy stack: [18:41:19.955] List of future strategies: [18:41:19.955] 1. sequential: [18:41:19.955] - args: function (..., envir = parent.frame(), workers = "") [18:41:19.955] - tweaked: FALSE [18:41:19.955] - call: plan(strategy) [18:41:19.956] plan(): nbrOfWorkers() = 1 [18:41:19.956] SequentialFuture started (and completed) [18:41:19.956] - Launch lazy future ... done [18:41:19.956] run() for 'SequentialFuture' ... done [18:41:19.959] Created future: [18:41:19.959] SequentialFuture: [18:41:19.959] Label: 'future_lapply-2' [18:41:19.959] Expression: [18:41:19.959] { [18:41:19.959] do.call(function(...) { [18:41:19.959] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:19.959] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:19.959] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:19.959] on.exit(options(oopts), add = TRUE) [18:41:19.959] } [18:41:19.959] { [18:41:19.959] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:19.959] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:19.959] ...future.FUN(...future.X_jj, ...) [18:41:19.959] }) [18:41:19.959] } [18:41:19.959] }, args = future.call.arguments) [18:41:19.959] } [18:41:19.959] Lazy evaluation: FALSE [18:41:19.959] Asynchronous evaluation: FALSE [18:41:19.959] Local evaluation: TRUE [18:41:19.959] Environment: R_GlobalEnv [18:41:19.959] Capture standard output: TRUE [18:41:19.959] Capture condition classes: 'condition' (excluding 'nothing') [18:41:19.959] Globals: 5 objects totaling 758 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 96 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:19.959] Packages: [18:41:19.959] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:19.959] Resolved: TRUE [18:41:19.959] Value: 55 bytes of class 'list' [18:41:19.959] Early signaling: FALSE [18:41:19.959] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:19.959] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:19.960] Chunk #2 of 4 ... DONE [18:41:19.961] Chunk #3 of 4 ... [18:41:19.961] - Finding globals in 'X' for chunk #3 ... [18:41:19.961] getGlobalsAndPackages() ... [18:41:19.961] Searching for globals... [18:41:19.962] [18:41:19.962] Searching for globals ... DONE [18:41:19.962] - globals: [0] [18:41:19.962] getGlobalsAndPackages() ... DONE [18:41:19.962] + additional globals found: [n=0] [18:41:19.962] + additional namespaces needed: [n=0] [18:41:19.962] - Finding globals in 'X' for chunk #3 ... DONE [18:41:19.963] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:19.963] - seeds: [18:41:19.963] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.963] getGlobalsAndPackages() ... [18:41:19.963] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.963] Resolving globals: FALSE [18:41:19.964] Tweak future expression to call with '...' arguments ... [18:41:19.964] { [18:41:19.964] do.call(function(...) { [18:41:19.964] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:19.964] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:19.964] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:19.964] on.exit(options(oopts), add = TRUE) [18:41:19.964] } [18:41:19.964] { [18:41:19.964] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:19.964] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:19.964] ...future.FUN(...future.X_jj, ...) [18:41:19.964] }) [18:41:19.964] } [18:41:19.964] }, args = future.call.arguments) [18:41:19.964] } [18:41:19.964] Tweak future expression to call with '...' arguments ... DONE [18:41:19.965] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.965] [18:41:19.965] getGlobalsAndPackages() ... DONE [18:41:19.965] run() for 'Future' ... [18:41:19.966] - state: 'created' [18:41:19.966] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:19.966] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:19.966] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:19.967] - Field: 'label' [18:41:19.967] - Field: 'local' [18:41:19.967] - Field: 'owner' [18:41:19.967] - Field: 'envir' [18:41:19.967] - Field: 'packages' [18:41:19.967] - Field: 'gc' [18:41:19.968] - Field: 'conditions' [18:41:19.968] - Field: 'expr' [18:41:19.968] - Field: 'uuid' [18:41:19.968] - Field: 'seed' [18:41:19.968] - Field: 'version' [18:41:19.968] - Field: 'result' [18:41:19.969] - Field: 'asynchronous' [18:41:19.969] - Field: 'calls' [18:41:19.969] - Field: 'globals' [18:41:19.969] - Field: 'stdout' [18:41:19.969] - Field: 'earlySignal' [18:41:19.969] - Field: 'lazy' [18:41:19.970] - Field: 'state' [18:41:19.970] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:19.970] - Launch lazy future ... [18:41:19.970] Packages needed by the future expression (n = 0): [18:41:19.970] Packages needed by future strategies (n = 0): [18:41:19.971] { [18:41:19.971] { [18:41:19.971] { [18:41:19.971] ...future.startTime <- base::Sys.time() [18:41:19.971] { [18:41:19.971] { [18:41:19.971] { [18:41:19.971] base::local({ [18:41:19.971] has_future <- base::requireNamespace("future", [18:41:19.971] quietly = TRUE) [18:41:19.971] if (has_future) { [18:41:19.971] ns <- base::getNamespace("future") [18:41:19.971] version <- ns[[".package"]][["version"]] [18:41:19.971] if (is.null(version)) [18:41:19.971] version <- utils::packageVersion("future") [18:41:19.971] } [18:41:19.971] else { [18:41:19.971] version <- NULL [18:41:19.971] } [18:41:19.971] if (!has_future || version < "1.8.0") { [18:41:19.971] info <- base::c(r_version = base::gsub("R version ", [18:41:19.971] "", base::R.version$version.string), [18:41:19.971] platform = base::sprintf("%s (%s-bit)", [18:41:19.971] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:19.971] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:19.971] "release", "version")], collapse = " "), [18:41:19.971] hostname = base::Sys.info()[["nodename"]]) [18:41:19.971] info <- base::sprintf("%s: %s", base::names(info), [18:41:19.971] info) [18:41:19.971] info <- base::paste(info, collapse = "; ") [18:41:19.971] if (!has_future) { [18:41:19.971] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:19.971] info) [18:41:19.971] } [18:41:19.971] else { [18:41:19.971] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:19.971] info, version) [18:41:19.971] } [18:41:19.971] base::stop(msg) [18:41:19.971] } [18:41:19.971] }) [18:41:19.971] } [18:41:19.971] ...future.strategy.old <- future::plan("list") [18:41:19.971] options(future.plan = NULL) [18:41:19.971] Sys.unsetenv("R_FUTURE_PLAN") [18:41:19.971] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:19.971] } [18:41:19.971] ...future.workdir <- getwd() [18:41:19.971] } [18:41:19.971] ...future.oldOptions <- base::as.list(base::.Options) [18:41:19.971] ...future.oldEnvVars <- base::Sys.getenv() [18:41:19.971] } [18:41:19.971] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:19.971] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:19.971] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:19.971] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:19.971] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:19.971] future.stdout.windows.reencode = NULL, width = 80L) [18:41:19.971] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:19.971] base::names(...future.oldOptions)) [18:41:19.971] } [18:41:19.971] if (FALSE) { [18:41:19.971] } [18:41:19.971] else { [18:41:19.971] if (TRUE) { [18:41:19.971] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:19.971] open = "w") [18:41:19.971] } [18:41:19.971] else { [18:41:19.971] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:19.971] windows = "NUL", "/dev/null"), open = "w") [18:41:19.971] } [18:41:19.971] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:19.971] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:19.971] base::sink(type = "output", split = FALSE) [18:41:19.971] base::close(...future.stdout) [18:41:19.971] }, add = TRUE) [18:41:19.971] } [18:41:19.971] ...future.frame <- base::sys.nframe() [18:41:19.971] ...future.conditions <- base::list() [18:41:19.971] ...future.rng <- base::globalenv()$.Random.seed [18:41:19.971] if (FALSE) { [18:41:19.971] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:19.971] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:19.971] } [18:41:19.971] ...future.result <- base::tryCatch({ [18:41:19.971] base::withCallingHandlers({ [18:41:19.971] ...future.value <- base::withVisible(base::local({ [18:41:19.971] do.call(function(...) { [18:41:19.971] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:19.971] if (!identical(...future.globals.maxSize.org, [18:41:19.971] ...future.globals.maxSize)) { [18:41:19.971] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:19.971] on.exit(options(oopts), add = TRUE) [18:41:19.971] } [18:41:19.971] { [18:41:19.971] lapply(seq_along(...future.elements_ii), [18:41:19.971] FUN = function(jj) { [18:41:19.971] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:19.971] ...future.FUN(...future.X_jj, ...) [18:41:19.971] }) [18:41:19.971] } [18:41:19.971] }, args = future.call.arguments) [18:41:19.971] })) [18:41:19.971] future::FutureResult(value = ...future.value$value, [18:41:19.971] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:19.971] ...future.rng), globalenv = if (FALSE) [18:41:19.971] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:19.971] ...future.globalenv.names)) [18:41:19.971] else NULL, started = ...future.startTime, version = "1.8") [18:41:19.971] }, condition = base::local({ [18:41:19.971] c <- base::c [18:41:19.971] inherits <- base::inherits [18:41:19.971] invokeRestart <- base::invokeRestart [18:41:19.971] length <- base::length [18:41:19.971] list <- base::list [18:41:19.971] seq.int <- base::seq.int [18:41:19.971] signalCondition <- base::signalCondition [18:41:19.971] sys.calls <- base::sys.calls [18:41:19.971] `[[` <- base::`[[` [18:41:19.971] `+` <- base::`+` [18:41:19.971] `<<-` <- base::`<<-` [18:41:19.971] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:19.971] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:19.971] 3L)] [18:41:19.971] } [18:41:19.971] function(cond) { [18:41:19.971] is_error <- inherits(cond, "error") [18:41:19.971] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:19.971] NULL) [18:41:19.971] if (is_error) { [18:41:19.971] sessionInformation <- function() { [18:41:19.971] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:19.971] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:19.971] search = base::search(), system = base::Sys.info()) [18:41:19.971] } [18:41:19.971] ...future.conditions[[length(...future.conditions) + [18:41:19.971] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:19.971] cond$call), session = sessionInformation(), [18:41:19.971] timestamp = base::Sys.time(), signaled = 0L) [18:41:19.971] signalCondition(cond) [18:41:19.971] } [18:41:19.971] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:19.971] "immediateCondition"))) { [18:41:19.971] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:19.971] ...future.conditions[[length(...future.conditions) + [18:41:19.971] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:19.971] if (TRUE && !signal) { [18:41:19.971] muffleCondition <- function (cond, pattern = "^muffle") [18:41:19.971] { [18:41:19.971] inherits <- base::inherits [18:41:19.971] invokeRestart <- base::invokeRestart [18:41:19.971] is.null <- base::is.null [18:41:19.971] muffled <- FALSE [18:41:19.971] if (inherits(cond, "message")) { [18:41:19.971] muffled <- grepl(pattern, "muffleMessage") [18:41:19.971] if (muffled) [18:41:19.971] invokeRestart("muffleMessage") [18:41:19.971] } [18:41:19.971] else if (inherits(cond, "warning")) { [18:41:19.971] muffled <- grepl(pattern, "muffleWarning") [18:41:19.971] if (muffled) [18:41:19.971] invokeRestart("muffleWarning") [18:41:19.971] } [18:41:19.971] else if (inherits(cond, "condition")) { [18:41:19.971] if (!is.null(pattern)) { [18:41:19.971] computeRestarts <- base::computeRestarts [18:41:19.971] grepl <- base::grepl [18:41:19.971] restarts <- computeRestarts(cond) [18:41:19.971] for (restart in restarts) { [18:41:19.971] name <- restart$name [18:41:19.971] if (is.null(name)) [18:41:19.971] next [18:41:19.971] if (!grepl(pattern, name)) [18:41:19.971] next [18:41:19.971] invokeRestart(restart) [18:41:19.971] muffled <- TRUE [18:41:19.971] break [18:41:19.971] } [18:41:19.971] } [18:41:19.971] } [18:41:19.971] invisible(muffled) [18:41:19.971] } [18:41:19.971] muffleCondition(cond, pattern = "^muffle") [18:41:19.971] } [18:41:19.971] } [18:41:19.971] else { [18:41:19.971] if (TRUE) { [18:41:19.971] muffleCondition <- function (cond, pattern = "^muffle") [18:41:19.971] { [18:41:19.971] inherits <- base::inherits [18:41:19.971] invokeRestart <- base::invokeRestart [18:41:19.971] is.null <- base::is.null [18:41:19.971] muffled <- FALSE [18:41:19.971] if (inherits(cond, "message")) { [18:41:19.971] muffled <- grepl(pattern, "muffleMessage") [18:41:19.971] if (muffled) [18:41:19.971] invokeRestart("muffleMessage") [18:41:19.971] } [18:41:19.971] else if (inherits(cond, "warning")) { [18:41:19.971] muffled <- grepl(pattern, "muffleWarning") [18:41:19.971] if (muffled) [18:41:19.971] invokeRestart("muffleWarning") [18:41:19.971] } [18:41:19.971] else if (inherits(cond, "condition")) { [18:41:19.971] if (!is.null(pattern)) { [18:41:19.971] computeRestarts <- base::computeRestarts [18:41:19.971] grepl <- base::grepl [18:41:19.971] restarts <- computeRestarts(cond) [18:41:19.971] for (restart in restarts) { [18:41:19.971] name <- restart$name [18:41:19.971] if (is.null(name)) [18:41:19.971] next [18:41:19.971] if (!grepl(pattern, name)) [18:41:19.971] next [18:41:19.971] invokeRestart(restart) [18:41:19.971] muffled <- TRUE [18:41:19.971] break [18:41:19.971] } [18:41:19.971] } [18:41:19.971] } [18:41:19.971] invisible(muffled) [18:41:19.971] } [18:41:19.971] muffleCondition(cond, pattern = "^muffle") [18:41:19.971] } [18:41:19.971] } [18:41:19.971] } [18:41:19.971] })) [18:41:19.971] }, error = function(ex) { [18:41:19.971] base::structure(base::list(value = NULL, visible = NULL, [18:41:19.971] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:19.971] ...future.rng), started = ...future.startTime, [18:41:19.971] finished = Sys.time(), session_uuid = NA_character_, [18:41:19.971] version = "1.8"), class = "FutureResult") [18:41:19.971] }, finally = { [18:41:19.971] if (!identical(...future.workdir, getwd())) [18:41:19.971] setwd(...future.workdir) [18:41:19.971] { [18:41:19.971] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:19.971] ...future.oldOptions$nwarnings <- NULL [18:41:19.971] } [18:41:19.971] base::options(...future.oldOptions) [18:41:19.971] if (.Platform$OS.type == "windows") { [18:41:19.971] old_names <- names(...future.oldEnvVars) [18:41:19.971] envs <- base::Sys.getenv() [18:41:19.971] names <- names(envs) [18:41:19.971] common <- intersect(names, old_names) [18:41:19.971] added <- setdiff(names, old_names) [18:41:19.971] removed <- setdiff(old_names, names) [18:41:19.971] changed <- common[...future.oldEnvVars[common] != [18:41:19.971] envs[common]] [18:41:19.971] NAMES <- toupper(changed) [18:41:19.971] args <- list() [18:41:19.971] for (kk in seq_along(NAMES)) { [18:41:19.971] name <- changed[[kk]] [18:41:19.971] NAME <- NAMES[[kk]] [18:41:19.971] if (name != NAME && is.element(NAME, old_names)) [18:41:19.971] next [18:41:19.971] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:19.971] } [18:41:19.971] NAMES <- toupper(added) [18:41:19.971] for (kk in seq_along(NAMES)) { [18:41:19.971] name <- added[[kk]] [18:41:19.971] NAME <- NAMES[[kk]] [18:41:19.971] if (name != NAME && is.element(NAME, old_names)) [18:41:19.971] next [18:41:19.971] args[[name]] <- "" [18:41:19.971] } [18:41:19.971] NAMES <- toupper(removed) [18:41:19.971] for (kk in seq_along(NAMES)) { [18:41:19.971] name <- removed[[kk]] [18:41:19.971] NAME <- NAMES[[kk]] [18:41:19.971] if (name != NAME && is.element(NAME, old_names)) [18:41:19.971] next [18:41:19.971] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:19.971] } [18:41:19.971] if (length(args) > 0) [18:41:19.971] base::do.call(base::Sys.setenv, args = args) [18:41:19.971] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:19.971] } [18:41:19.971] else { [18:41:19.971] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:19.971] } [18:41:19.971] { [18:41:19.971] if (base::length(...future.futureOptionsAdded) > [18:41:19.971] 0L) { [18:41:19.971] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:19.971] base::names(opts) <- ...future.futureOptionsAdded [18:41:19.971] base::options(opts) [18:41:19.971] } [18:41:19.971] { [18:41:19.971] { [18:41:19.971] NULL [18:41:19.971] RNGkind("Mersenne-Twister") [18:41:19.971] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:19.971] inherits = FALSE) [18:41:19.971] } [18:41:19.971] options(future.plan = NULL) [18:41:19.971] if (is.na(NA_character_)) [18:41:19.971] Sys.unsetenv("R_FUTURE_PLAN") [18:41:19.971] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:19.971] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:19.971] .init = FALSE) [18:41:19.971] } [18:41:19.971] } [18:41:19.971] } [18:41:19.971] }) [18:41:19.971] if (TRUE) { [18:41:19.971] base::sink(type = "output", split = FALSE) [18:41:19.971] if (TRUE) { [18:41:19.971] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:19.971] } [18:41:19.971] else { [18:41:19.971] ...future.result["stdout"] <- base::list(NULL) [18:41:19.971] } [18:41:19.971] base::close(...future.stdout) [18:41:19.971] ...future.stdout <- NULL [18:41:19.971] } [18:41:19.971] ...future.result$conditions <- ...future.conditions [18:41:19.971] ...future.result$finished <- base::Sys.time() [18:41:19.971] ...future.result [18:41:19.971] } [18:41:19.975] assign_globals() ... [18:41:19.975] List of 5 [18:41:19.975] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:19.975] $ future.call.arguments :List of 1 [18:41:19.975] ..$ length: int 2 [18:41:19.975] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:19.975] $ ...future.elements_ii :List of 1 [18:41:19.975] ..$ c: chr "character" [18:41:19.975] $ ...future.seeds_ii : NULL [18:41:19.975] $ ...future.globals.maxSize: NULL [18:41:19.975] - attr(*, "where")=List of 5 [18:41:19.975] ..$ ...future.FUN : [18:41:19.975] ..$ future.call.arguments : [18:41:19.975] ..$ ...future.elements_ii : [18:41:19.975] ..$ ...future.seeds_ii : [18:41:19.975] ..$ ...future.globals.maxSize: [18:41:19.975] - attr(*, "resolved")= logi FALSE [18:41:19.975] - attr(*, "total_size")= num 4288 [18:41:19.975] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:19.975] - attr(*, "already-done")= logi TRUE [18:41:19.981] - copied '...future.FUN' to environment [18:41:19.981] - copied 'future.call.arguments' to environment [18:41:19.982] - copied '...future.elements_ii' to environment [18:41:19.982] - copied '...future.seeds_ii' to environment [18:41:19.982] - copied '...future.globals.maxSize' to environment [18:41:19.982] assign_globals() ... done [18:41:19.982] plan(): Setting new future strategy stack: [18:41:19.983] List of future strategies: [18:41:19.983] 1. sequential: [18:41:19.983] - args: function (..., envir = parent.frame(), workers = "") [18:41:19.983] - tweaked: FALSE [18:41:19.983] - call: NULL [18:41:19.983] plan(): nbrOfWorkers() = 1 [18:41:19.984] plan(): Setting new future strategy stack: [18:41:19.985] List of future strategies: [18:41:19.985] 1. sequential: [18:41:19.985] - args: function (..., envir = parent.frame(), workers = "") [18:41:19.985] - tweaked: FALSE [18:41:19.985] - call: plan(strategy) [18:41:19.985] plan(): nbrOfWorkers() = 1 [18:41:19.985] SequentialFuture started (and completed) [18:41:19.986] - Launch lazy future ... done [18:41:19.986] run() for 'SequentialFuture' ... done [18:41:19.986] Created future: [18:41:19.986] SequentialFuture: [18:41:19.986] Label: 'future_lapply-3' [18:41:19.986] Expression: [18:41:19.986] { [18:41:19.986] do.call(function(...) { [18:41:19.986] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:19.986] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:19.986] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:19.986] on.exit(options(oopts), add = TRUE) [18:41:19.986] } [18:41:19.986] { [18:41:19.986] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:19.986] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:19.986] ...future.FUN(...future.X_jj, ...) [18:41:19.986] }) [18:41:19.986] } [18:41:19.986] }, args = future.call.arguments) [18:41:19.986] } [18:41:19.986] Lazy evaluation: FALSE [18:41:19.986] Asynchronous evaluation: FALSE [18:41:19.986] Local evaluation: TRUE [18:41:19.986] Environment: R_GlobalEnv [18:41:19.986] Capture standard output: TRUE [18:41:19.986] Capture condition classes: 'condition' (excluding 'nothing') [18:41:19.986] Globals: 5 objects totaling 760 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 98 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:19.986] Packages: [18:41:19.986] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:19.986] Resolved: TRUE [18:41:19.986] Value: 55 bytes of class 'list' [18:41:19.986] Early signaling: FALSE [18:41:19.986] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:19.986] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:19.987] Chunk #3 of 4 ... DONE [18:41:19.988] Chunk #4 of 4 ... [18:41:19.988] - Finding globals in 'X' for chunk #4 ... [18:41:19.988] getGlobalsAndPackages() ... [18:41:19.988] Searching for globals... [18:41:19.989] [18:41:19.989] Searching for globals ... DONE [18:41:19.989] - globals: [0] [18:41:19.989] getGlobalsAndPackages() ... DONE [18:41:19.989] + additional globals found: [n=0] [18:41:19.989] + additional namespaces needed: [n=0] [18:41:19.989] - Finding globals in 'X' for chunk #4 ... DONE [18:41:19.990] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:19.990] - seeds: [18:41:19.990] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.990] getGlobalsAndPackages() ... [18:41:19.990] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.990] Resolving globals: FALSE [18:41:19.991] Tweak future expression to call with '...' arguments ... [18:41:19.991] { [18:41:19.991] do.call(function(...) { [18:41:19.991] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:19.991] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:19.991] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:19.991] on.exit(options(oopts), add = TRUE) [18:41:19.991] } [18:41:19.991] { [18:41:19.991] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:19.991] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:19.991] ...future.FUN(...future.X_jj, ...) [18:41:19.991] }) [18:41:19.991] } [18:41:19.991] }, args = future.call.arguments) [18:41:19.991] } [18:41:19.991] Tweak future expression to call with '...' arguments ... DONE [18:41:19.992] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:19.992] [18:41:19.992] getGlobalsAndPackages() ... DONE [18:41:19.992] run() for 'Future' ... [18:41:19.993] - state: 'created' [18:41:19.993] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:19.993] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:19.993] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:19.994] - Field: 'label' [18:41:19.994] - Field: 'local' [18:41:19.994] - Field: 'owner' [18:41:19.994] - Field: 'envir' [18:41:19.994] - Field: 'packages' [18:41:19.994] - Field: 'gc' [18:41:19.995] - Field: 'conditions' [18:41:19.995] - Field: 'expr' [18:41:19.995] - Field: 'uuid' [18:41:19.995] - Field: 'seed' [18:41:19.995] - Field: 'version' [18:41:19.996] - Field: 'result' [18:41:19.996] - Field: 'asynchronous' [18:41:19.996] - Field: 'calls' [18:41:19.996] - Field: 'globals' [18:41:19.996] - Field: 'stdout' [18:41:19.996] - Field: 'earlySignal' [18:41:19.997] - Field: 'lazy' [18:41:19.997] - Field: 'state' [18:41:19.997] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:19.997] - Launch lazy future ... [18:41:19.997] Packages needed by the future expression (n = 0): [18:41:19.997] Packages needed by future strategies (n = 0): [18:41:19.998] { [18:41:19.998] { [18:41:19.998] { [18:41:19.998] ...future.startTime <- base::Sys.time() [18:41:19.998] { [18:41:19.998] { [18:41:19.998] { [18:41:19.998] base::local({ [18:41:19.998] has_future <- base::requireNamespace("future", [18:41:19.998] quietly = TRUE) [18:41:19.998] if (has_future) { [18:41:19.998] ns <- base::getNamespace("future") [18:41:19.998] version <- ns[[".package"]][["version"]] [18:41:19.998] if (is.null(version)) [18:41:19.998] version <- utils::packageVersion("future") [18:41:19.998] } [18:41:19.998] else { [18:41:19.998] version <- NULL [18:41:19.998] } [18:41:19.998] if (!has_future || version < "1.8.0") { [18:41:19.998] info <- base::c(r_version = base::gsub("R version ", [18:41:19.998] "", base::R.version$version.string), [18:41:19.998] platform = base::sprintf("%s (%s-bit)", [18:41:19.998] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:19.998] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:19.998] "release", "version")], collapse = " "), [18:41:19.998] hostname = base::Sys.info()[["nodename"]]) [18:41:19.998] info <- base::sprintf("%s: %s", base::names(info), [18:41:19.998] info) [18:41:19.998] info <- base::paste(info, collapse = "; ") [18:41:19.998] if (!has_future) { [18:41:19.998] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:19.998] info) [18:41:19.998] } [18:41:19.998] else { [18:41:19.998] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:19.998] info, version) [18:41:19.998] } [18:41:19.998] base::stop(msg) [18:41:19.998] } [18:41:19.998] }) [18:41:19.998] } [18:41:19.998] ...future.strategy.old <- future::plan("list") [18:41:19.998] options(future.plan = NULL) [18:41:19.998] Sys.unsetenv("R_FUTURE_PLAN") [18:41:19.998] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:19.998] } [18:41:19.998] ...future.workdir <- getwd() [18:41:19.998] } [18:41:19.998] ...future.oldOptions <- base::as.list(base::.Options) [18:41:19.998] ...future.oldEnvVars <- base::Sys.getenv() [18:41:19.998] } [18:41:19.998] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:19.998] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:19.998] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:19.998] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:19.998] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:19.998] future.stdout.windows.reencode = NULL, width = 80L) [18:41:19.998] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:19.998] base::names(...future.oldOptions)) [18:41:19.998] } [18:41:19.998] if (FALSE) { [18:41:19.998] } [18:41:19.998] else { [18:41:19.998] if (TRUE) { [18:41:19.998] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:19.998] open = "w") [18:41:19.998] } [18:41:19.998] else { [18:41:19.998] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:19.998] windows = "NUL", "/dev/null"), open = "w") [18:41:19.998] } [18:41:19.998] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:19.998] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:19.998] base::sink(type = "output", split = FALSE) [18:41:19.998] base::close(...future.stdout) [18:41:19.998] }, add = TRUE) [18:41:19.998] } [18:41:19.998] ...future.frame <- base::sys.nframe() [18:41:19.998] ...future.conditions <- base::list() [18:41:19.998] ...future.rng <- base::globalenv()$.Random.seed [18:41:19.998] if (FALSE) { [18:41:19.998] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:19.998] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:19.998] } [18:41:19.998] ...future.result <- base::tryCatch({ [18:41:19.998] base::withCallingHandlers({ [18:41:19.998] ...future.value <- base::withVisible(base::local({ [18:41:19.998] do.call(function(...) { [18:41:19.998] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:19.998] if (!identical(...future.globals.maxSize.org, [18:41:19.998] ...future.globals.maxSize)) { [18:41:19.998] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:19.998] on.exit(options(oopts), add = TRUE) [18:41:19.998] } [18:41:19.998] { [18:41:19.998] lapply(seq_along(...future.elements_ii), [18:41:19.998] FUN = function(jj) { [18:41:19.998] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:19.998] ...future.FUN(...future.X_jj, ...) [18:41:19.998] }) [18:41:19.998] } [18:41:19.998] }, args = future.call.arguments) [18:41:19.998] })) [18:41:19.998] future::FutureResult(value = ...future.value$value, [18:41:19.998] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:19.998] ...future.rng), globalenv = if (FALSE) [18:41:19.998] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:19.998] ...future.globalenv.names)) [18:41:19.998] else NULL, started = ...future.startTime, version = "1.8") [18:41:19.998] }, condition = base::local({ [18:41:19.998] c <- base::c [18:41:19.998] inherits <- base::inherits [18:41:19.998] invokeRestart <- base::invokeRestart [18:41:19.998] length <- base::length [18:41:19.998] list <- base::list [18:41:19.998] seq.int <- base::seq.int [18:41:19.998] signalCondition <- base::signalCondition [18:41:19.998] sys.calls <- base::sys.calls [18:41:19.998] `[[` <- base::`[[` [18:41:19.998] `+` <- base::`+` [18:41:19.998] `<<-` <- base::`<<-` [18:41:19.998] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:19.998] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:19.998] 3L)] [18:41:19.998] } [18:41:19.998] function(cond) { [18:41:19.998] is_error <- inherits(cond, "error") [18:41:19.998] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:19.998] NULL) [18:41:19.998] if (is_error) { [18:41:19.998] sessionInformation <- function() { [18:41:19.998] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:19.998] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:19.998] search = base::search(), system = base::Sys.info()) [18:41:19.998] } [18:41:19.998] ...future.conditions[[length(...future.conditions) + [18:41:19.998] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:19.998] cond$call), session = sessionInformation(), [18:41:19.998] timestamp = base::Sys.time(), signaled = 0L) [18:41:19.998] signalCondition(cond) [18:41:19.998] } [18:41:19.998] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:19.998] "immediateCondition"))) { [18:41:19.998] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:19.998] ...future.conditions[[length(...future.conditions) + [18:41:19.998] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:19.998] if (TRUE && !signal) { [18:41:19.998] muffleCondition <- function (cond, pattern = "^muffle") [18:41:19.998] { [18:41:19.998] inherits <- base::inherits [18:41:19.998] invokeRestart <- base::invokeRestart [18:41:19.998] is.null <- base::is.null [18:41:19.998] muffled <- FALSE [18:41:19.998] if (inherits(cond, "message")) { [18:41:19.998] muffled <- grepl(pattern, "muffleMessage") [18:41:19.998] if (muffled) [18:41:19.998] invokeRestart("muffleMessage") [18:41:19.998] } [18:41:19.998] else if (inherits(cond, "warning")) { [18:41:19.998] muffled <- grepl(pattern, "muffleWarning") [18:41:19.998] if (muffled) [18:41:19.998] invokeRestart("muffleWarning") [18:41:19.998] } [18:41:19.998] else if (inherits(cond, "condition")) { [18:41:19.998] if (!is.null(pattern)) { [18:41:19.998] computeRestarts <- base::computeRestarts [18:41:19.998] grepl <- base::grepl [18:41:19.998] restarts <- computeRestarts(cond) [18:41:19.998] for (restart in restarts) { [18:41:19.998] name <- restart$name [18:41:19.998] if (is.null(name)) [18:41:19.998] next [18:41:19.998] if (!grepl(pattern, name)) [18:41:19.998] next [18:41:19.998] invokeRestart(restart) [18:41:19.998] muffled <- TRUE [18:41:19.998] break [18:41:19.998] } [18:41:19.998] } [18:41:19.998] } [18:41:19.998] invisible(muffled) [18:41:19.998] } [18:41:19.998] muffleCondition(cond, pattern = "^muffle") [18:41:19.998] } [18:41:19.998] } [18:41:19.998] else { [18:41:19.998] if (TRUE) { [18:41:19.998] muffleCondition <- function (cond, pattern = "^muffle") [18:41:19.998] { [18:41:19.998] inherits <- base::inherits [18:41:19.998] invokeRestart <- base::invokeRestart [18:41:19.998] is.null <- base::is.null [18:41:19.998] muffled <- FALSE [18:41:19.998] if (inherits(cond, "message")) { [18:41:19.998] muffled <- grepl(pattern, "muffleMessage") [18:41:19.998] if (muffled) [18:41:19.998] invokeRestart("muffleMessage") [18:41:19.998] } [18:41:19.998] else if (inherits(cond, "warning")) { [18:41:19.998] muffled <- grepl(pattern, "muffleWarning") [18:41:19.998] if (muffled) [18:41:19.998] invokeRestart("muffleWarning") [18:41:19.998] } [18:41:19.998] else if (inherits(cond, "condition")) { [18:41:19.998] if (!is.null(pattern)) { [18:41:19.998] computeRestarts <- base::computeRestarts [18:41:19.998] grepl <- base::grepl [18:41:19.998] restarts <- computeRestarts(cond) [18:41:19.998] for (restart in restarts) { [18:41:19.998] name <- restart$name [18:41:19.998] if (is.null(name)) [18:41:19.998] next [18:41:19.998] if (!grepl(pattern, name)) [18:41:19.998] next [18:41:19.998] invokeRestart(restart) [18:41:19.998] muffled <- TRUE [18:41:19.998] break [18:41:19.998] } [18:41:19.998] } [18:41:19.998] } [18:41:19.998] invisible(muffled) [18:41:19.998] } [18:41:19.998] muffleCondition(cond, pattern = "^muffle") [18:41:19.998] } [18:41:19.998] } [18:41:19.998] } [18:41:19.998] })) [18:41:19.998] }, error = function(ex) { [18:41:19.998] base::structure(base::list(value = NULL, visible = NULL, [18:41:19.998] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:19.998] ...future.rng), started = ...future.startTime, [18:41:19.998] finished = Sys.time(), session_uuid = NA_character_, [18:41:19.998] version = "1.8"), class = "FutureResult") [18:41:19.998] }, finally = { [18:41:19.998] if (!identical(...future.workdir, getwd())) [18:41:19.998] setwd(...future.workdir) [18:41:19.998] { [18:41:19.998] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:19.998] ...future.oldOptions$nwarnings <- NULL [18:41:19.998] } [18:41:19.998] base::options(...future.oldOptions) [18:41:19.998] if (.Platform$OS.type == "windows") { [18:41:19.998] old_names <- names(...future.oldEnvVars) [18:41:19.998] envs <- base::Sys.getenv() [18:41:19.998] names <- names(envs) [18:41:19.998] common <- intersect(names, old_names) [18:41:19.998] added <- setdiff(names, old_names) [18:41:19.998] removed <- setdiff(old_names, names) [18:41:19.998] changed <- common[...future.oldEnvVars[common] != [18:41:19.998] envs[common]] [18:41:19.998] NAMES <- toupper(changed) [18:41:19.998] args <- list() [18:41:19.998] for (kk in seq_along(NAMES)) { [18:41:19.998] name <- changed[[kk]] [18:41:19.998] NAME <- NAMES[[kk]] [18:41:19.998] if (name != NAME && is.element(NAME, old_names)) [18:41:19.998] next [18:41:19.998] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:19.998] } [18:41:19.998] NAMES <- toupper(added) [18:41:19.998] for (kk in seq_along(NAMES)) { [18:41:19.998] name <- added[[kk]] [18:41:19.998] NAME <- NAMES[[kk]] [18:41:19.998] if (name != NAME && is.element(NAME, old_names)) [18:41:19.998] next [18:41:19.998] args[[name]] <- "" [18:41:19.998] } [18:41:19.998] NAMES <- toupper(removed) [18:41:19.998] for (kk in seq_along(NAMES)) { [18:41:19.998] name <- removed[[kk]] [18:41:19.998] NAME <- NAMES[[kk]] [18:41:19.998] if (name != NAME && is.element(NAME, old_names)) [18:41:19.998] next [18:41:19.998] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:19.998] } [18:41:19.998] if (length(args) > 0) [18:41:19.998] base::do.call(base::Sys.setenv, args = args) [18:41:19.998] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:19.998] } [18:41:19.998] else { [18:41:19.998] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:19.998] } [18:41:19.998] { [18:41:19.998] if (base::length(...future.futureOptionsAdded) > [18:41:19.998] 0L) { [18:41:19.998] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:19.998] base::names(opts) <- ...future.futureOptionsAdded [18:41:19.998] base::options(opts) [18:41:19.998] } [18:41:19.998] { [18:41:19.998] { [18:41:19.998] NULL [18:41:19.998] RNGkind("Mersenne-Twister") [18:41:19.998] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:19.998] inherits = FALSE) [18:41:19.998] } [18:41:19.998] options(future.plan = NULL) [18:41:19.998] if (is.na(NA_character_)) [18:41:19.998] Sys.unsetenv("R_FUTURE_PLAN") [18:41:19.998] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:19.998] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:19.998] .init = FALSE) [18:41:19.998] } [18:41:19.998] } [18:41:19.998] } [18:41:19.998] }) [18:41:19.998] if (TRUE) { [18:41:19.998] base::sink(type = "output", split = FALSE) [18:41:19.998] if (TRUE) { [18:41:19.998] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:19.998] } [18:41:19.998] else { [18:41:19.998] ...future.result["stdout"] <- base::list(NULL) [18:41:19.998] } [18:41:19.998] base::close(...future.stdout) [18:41:19.998] ...future.stdout <- NULL [18:41:19.998] } [18:41:19.998] ...future.result$conditions <- ...future.conditions [18:41:19.998] ...future.result$finished <- base::Sys.time() [18:41:19.998] ...future.result [18:41:19.998] } [18:41:20.002] assign_globals() ... [18:41:20.002] List of 5 [18:41:20.002] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:20.002] $ future.call.arguments :List of 1 [18:41:20.002] ..$ length: int 2 [18:41:20.002] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:20.002] $ ...future.elements_ii :List of 1 [18:41:20.002] ..$ c: chr "list" [18:41:20.002] $ ...future.seeds_ii : NULL [18:41:20.002] $ ...future.globals.maxSize: NULL [18:41:20.002] - attr(*, "where")=List of 5 [18:41:20.002] ..$ ...future.FUN : [18:41:20.002] ..$ future.call.arguments : [18:41:20.002] ..$ ...future.elements_ii : [18:41:20.002] ..$ ...future.seeds_ii : [18:41:20.002] ..$ ...future.globals.maxSize: [18:41:20.002] - attr(*, "resolved")= logi FALSE [18:41:20.002] - attr(*, "total_size")= num 4288 [18:41:20.002] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:20.002] - attr(*, "already-done")= logi TRUE [18:41:20.008] - copied '...future.FUN' to environment [18:41:20.008] - copied 'future.call.arguments' to environment [18:41:20.008] - copied '...future.elements_ii' to environment [18:41:20.009] - copied '...future.seeds_ii' to environment [18:41:20.009] - copied '...future.globals.maxSize' to environment [18:41:20.009] assign_globals() ... done [18:41:20.009] plan(): Setting new future strategy stack: [18:41:20.009] List of future strategies: [18:41:20.009] 1. sequential: [18:41:20.009] - args: function (..., envir = parent.frame(), workers = "") [18:41:20.009] - tweaked: FALSE [18:41:20.009] - call: NULL [18:41:20.010] plan(): nbrOfWorkers() = 1 [18:41:20.011] plan(): Setting new future strategy stack: [18:41:20.011] List of future strategies: [18:41:20.011] 1. sequential: [18:41:20.011] - args: function (..., envir = parent.frame(), workers = "") [18:41:20.011] - tweaked: FALSE [18:41:20.011] - call: plan(strategy) [18:41:20.012] plan(): nbrOfWorkers() = 1 [18:41:20.012] SequentialFuture started (and completed) [18:41:20.013] - Launch lazy future ... done [18:41:20.013] run() for 'SequentialFuture' ... done [18:41:20.013] Created future: [18:41:20.013] SequentialFuture: [18:41:20.013] Label: 'future_lapply-4' [18:41:20.013] Expression: [18:41:20.013] { [18:41:20.013] do.call(function(...) { [18:41:20.013] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.013] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:20.013] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.013] on.exit(options(oopts), add = TRUE) [18:41:20.013] } [18:41:20.013] { [18:41:20.013] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:20.013] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.013] ...future.FUN(...future.X_jj, ...) [18:41:20.013] }) [18:41:20.013] } [18:41:20.013] }, args = future.call.arguments) [18:41:20.013] } [18:41:20.013] Lazy evaluation: FALSE [18:41:20.013] Asynchronous evaluation: FALSE [18:41:20.013] Local evaluation: TRUE [18:41:20.013] Environment: R_GlobalEnv [18:41:20.013] Capture standard output: TRUE [18:41:20.013] Capture condition classes: 'condition' (excluding 'nothing') [18:41:20.013] Globals: 5 objects totaling 755 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 93 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:20.013] Packages: [18:41:20.013] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:20.013] Resolved: TRUE [18:41:20.013] Value: 47 bytes of class 'list' [18:41:20.013] Early signaling: FALSE [18:41:20.013] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:20.013] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:20.014] Chunk #4 of 4 ... DONE [18:41:20.014] Launching 4 futures (chunks) ... DONE [18:41:20.014] Resolving 4 futures (chunks) ... [18:41:20.015] resolve() on list ... [18:41:20.015] recursive: 0 [18:41:20.015] length: 4 [18:41:20.015] [18:41:20.015] resolved() for 'SequentialFuture' ... [18:41:20.015] - state: 'finished' [18:41:20.016] - run: TRUE [18:41:20.016] - result: 'FutureResult' [18:41:20.016] resolved() for 'SequentialFuture' ... done [18:41:20.016] Future #1 [18:41:20.016] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:20.017] - nx: 4 [18:41:20.017] - relay: TRUE [18:41:20.017] - stdout: TRUE [18:41:20.017] - signal: TRUE [18:41:20.017] - resignal: FALSE [18:41:20.017] - force: TRUE [18:41:20.017] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [18:41:20.018] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:41:20.018] - until=1 [18:41:20.018] - relaying element #1 [18:41:20.018] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:20.018] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:20.019] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:20.019] length: 3 (resolved future 1) [18:41:20.019] resolved() for 'SequentialFuture' ... [18:41:20.019] - state: 'finished' [18:41:20.019] - run: TRUE [18:41:20.019] - result: 'FutureResult' [18:41:20.020] resolved() for 'SequentialFuture' ... done [18:41:20.020] Future #2 [18:41:20.020] signalConditionsASAP(SequentialFuture, pos=2) ... [18:41:20.020] - nx: 4 [18:41:20.020] - relay: TRUE [18:41:20.020] - stdout: TRUE [18:41:20.021] - signal: TRUE [18:41:20.021] - resignal: FALSE [18:41:20.021] - force: TRUE [18:41:20.021] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:20.021] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:20.021] - until=2 [18:41:20.022] - relaying element #2 [18:41:20.022] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:20.022] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:20.022] signalConditionsASAP(SequentialFuture, pos=2) ... done [18:41:20.022] length: 2 (resolved future 2) [18:41:20.022] resolved() for 'SequentialFuture' ... [18:41:20.023] - state: 'finished' [18:41:20.023] - run: TRUE [18:41:20.023] - result: 'FutureResult' [18:41:20.023] resolved() for 'SequentialFuture' ... done [18:41:20.023] Future #3 [18:41:20.024] signalConditionsASAP(SequentialFuture, pos=3) ... [18:41:20.024] - nx: 4 [18:41:20.024] - relay: TRUE [18:41:20.024] - stdout: TRUE [18:41:20.024] - signal: TRUE [18:41:20.024] - resignal: FALSE [18:41:20.024] - force: TRUE [18:41:20.025] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:20.025] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:20.025] - until=3 [18:41:20.025] - relaying element #3 [18:41:20.025] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:20.026] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:20.026] signalConditionsASAP(SequentialFuture, pos=3) ... done [18:41:20.026] length: 1 (resolved future 3) [18:41:20.026] resolved() for 'SequentialFuture' ... [18:41:20.026] - state: 'finished' [18:41:20.027] - run: TRUE [18:41:20.027] - result: 'FutureResult' [18:41:20.027] resolved() for 'SequentialFuture' ... done [18:41:20.027] Future #4 [18:41:20.027] signalConditionsASAP(SequentialFuture, pos=4) ... [18:41:20.027] - nx: 4 [18:41:20.028] - relay: TRUE [18:41:20.028] - stdout: TRUE [18:41:20.028] - signal: TRUE [18:41:20.028] - resignal: FALSE [18:41:20.028] - force: TRUE [18:41:20.028] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:20.029] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:20.029] - until=4 [18:41:20.029] - relaying element #4 [18:41:20.029] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:20.029] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:20.029] signalConditionsASAP(SequentialFuture, pos=4) ... done [18:41:20.030] length: 0 (resolved future 4) [18:41:20.030] Relaying remaining futures [18:41:20.030] signalConditionsASAP(NULL, pos=0) ... [18:41:20.030] - nx: 4 [18:41:20.030] - relay: TRUE [18:41:20.030] - stdout: TRUE [18:41:20.030] - signal: TRUE [18:41:20.031] - resignal: FALSE [18:41:20.031] - force: TRUE [18:41:20.031] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:20.031] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [18:41:20.031] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:20.031] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:20.032] signalConditionsASAP(NULL, pos=0) ... done [18:41:20.032] resolve() on list ... DONE [18:41:20.032] - Number of value chunks collected: 4 [18:41:20.032] Resolving 4 futures (chunks) ... DONE [18:41:20.033] Reducing values from 4 chunks ... [18:41:20.033] - Number of values collected after concatenation: 4 [18:41:20.033] - Number of values expected: 4 [18:41:20.033] Reducing values from 4 chunks ... DONE [18:41:20.033] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL [18:41:20.036] future_lapply() ... [18:41:20.037] Number of chunks: 4 [18:41:20.037] getGlobalsAndPackagesXApply() ... [18:41:20.037] - future.globals: TRUE [18:41:20.037] getGlobalsAndPackages() ... [18:41:20.037] Searching for globals... [18:41:20.039] - globals found: [2] 'FUN', '.Internal' [18:41:20.039] Searching for globals ... DONE [18:41:20.039] Resolving globals: FALSE [18:41:20.040] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:20.040] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:20.040] - globals: [1] 'FUN' [18:41:20.040] [18:41:20.041] getGlobalsAndPackages() ... DONE [18:41:20.041] - globals found/used: [n=1] 'FUN' [18:41:20.041] - needed namespaces: [n=0] [18:41:20.041] Finding globals ... DONE [18:41:20.041] - use_args: TRUE [18:41:20.041] - Getting '...' globals ... [18:41:20.042] resolve() on list ... [18:41:20.042] recursive: 0 [18:41:20.042] length: 1 [18:41:20.042] elements: '...' [18:41:20.042] length: 0 (resolved future 1) [18:41:20.043] resolve() on list ... DONE [18:41:20.043] - '...' content: [n=1] 'length' [18:41:20.043] List of 1 [18:41:20.043] $ ...:List of 1 [18:41:20.043] ..$ length: int 2 [18:41:20.043] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:20.043] - attr(*, "where")=List of 1 [18:41:20.043] ..$ ...: [18:41:20.043] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:20.043] - attr(*, "resolved")= logi TRUE [18:41:20.043] - attr(*, "total_size")= num NA [18:41:20.046] - Getting '...' globals ... DONE [18:41:20.046] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:20.047] List of 2 [18:41:20.047] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:20.047] $ ... :List of 1 [18:41:20.047] ..$ length: int 2 [18:41:20.047] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:20.047] - attr(*, "where")=List of 2 [18:41:20.047] ..$ ...future.FUN: [18:41:20.047] ..$ ... : [18:41:20.047] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:20.047] - attr(*, "resolved")= logi FALSE [18:41:20.047] - attr(*, "total_size")= int 4324 [18:41:20.051] Packages to be attached in all futures: [n=0] [18:41:20.051] getGlobalsAndPackagesXApply() ... DONE [18:41:20.051] Number of futures (= number of chunks): 4 [18:41:20.051] Launching 4 futures (chunks) ... [18:41:20.051] Chunk #1 of 4 ... [18:41:20.052] - Finding globals in 'X' for chunk #1 ... [18:41:20.052] getGlobalsAndPackages() ... [18:41:20.052] Searching for globals... [18:41:20.052] [18:41:20.052] Searching for globals ... DONE [18:41:20.053] - globals: [0] [18:41:20.053] getGlobalsAndPackages() ... DONE [18:41:20.053] + additional globals found: [n=0] [18:41:20.053] + additional namespaces needed: [n=0] [18:41:20.053] - Finding globals in 'X' for chunk #1 ... DONE [18:41:20.053] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:20.053] - seeds: [18:41:20.054] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.054] getGlobalsAndPackages() ... [18:41:20.054] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.054] Resolving globals: FALSE [18:41:20.054] Tweak future expression to call with '...' arguments ... [18:41:20.054] { [18:41:20.054] do.call(function(...) { [18:41:20.054] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.054] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:20.054] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.054] on.exit(options(oopts), add = TRUE) [18:41:20.054] } [18:41:20.054] { [18:41:20.054] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:20.054] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.054] ...future.FUN(...future.X_jj, ...) [18:41:20.054] }) [18:41:20.054] } [18:41:20.054] }, args = future.call.arguments) [18:41:20.054] } [18:41:20.055] Tweak future expression to call with '...' arguments ... DONE [18:41:20.055] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.056] [18:41:20.056] getGlobalsAndPackages() ... DONE [18:41:20.056] run() for 'Future' ... [18:41:20.056] - state: 'created' [18:41:20.056] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:20.057] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:20.057] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:20.057] - Field: 'label' [18:41:20.057] - Field: 'local' [18:41:20.058] - Field: 'owner' [18:41:20.058] - Field: 'envir' [18:41:20.058] - Field: 'packages' [18:41:20.058] - Field: 'gc' [18:41:20.058] - Field: 'conditions' [18:41:20.058] - Field: 'expr' [18:41:20.059] - Field: 'uuid' [18:41:20.059] - Field: 'seed' [18:41:20.059] - Field: 'version' [18:41:20.059] - Field: 'result' [18:41:20.059] - Field: 'asynchronous' [18:41:20.059] - Field: 'calls' [18:41:20.060] - Field: 'globals' [18:41:20.060] - Field: 'stdout' [18:41:20.060] - Field: 'earlySignal' [18:41:20.060] - Field: 'lazy' [18:41:20.060] - Field: 'state' [18:41:20.061] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:20.061] - Launch lazy future ... [18:41:20.061] Packages needed by the future expression (n = 0): [18:41:20.061] Packages needed by future strategies (n = 0): [18:41:20.062] { [18:41:20.062] { [18:41:20.062] { [18:41:20.062] ...future.startTime <- base::Sys.time() [18:41:20.062] { [18:41:20.062] { [18:41:20.062] { [18:41:20.062] base::local({ [18:41:20.062] has_future <- base::requireNamespace("future", [18:41:20.062] quietly = TRUE) [18:41:20.062] if (has_future) { [18:41:20.062] ns <- base::getNamespace("future") [18:41:20.062] version <- ns[[".package"]][["version"]] [18:41:20.062] if (is.null(version)) [18:41:20.062] version <- utils::packageVersion("future") [18:41:20.062] } [18:41:20.062] else { [18:41:20.062] version <- NULL [18:41:20.062] } [18:41:20.062] if (!has_future || version < "1.8.0") { [18:41:20.062] info <- base::c(r_version = base::gsub("R version ", [18:41:20.062] "", base::R.version$version.string), [18:41:20.062] platform = base::sprintf("%s (%s-bit)", [18:41:20.062] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:20.062] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:20.062] "release", "version")], collapse = " "), [18:41:20.062] hostname = base::Sys.info()[["nodename"]]) [18:41:20.062] info <- base::sprintf("%s: %s", base::names(info), [18:41:20.062] info) [18:41:20.062] info <- base::paste(info, collapse = "; ") [18:41:20.062] if (!has_future) { [18:41:20.062] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:20.062] info) [18:41:20.062] } [18:41:20.062] else { [18:41:20.062] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:20.062] info, version) [18:41:20.062] } [18:41:20.062] base::stop(msg) [18:41:20.062] } [18:41:20.062] }) [18:41:20.062] } [18:41:20.062] ...future.strategy.old <- future::plan("list") [18:41:20.062] options(future.plan = NULL) [18:41:20.062] Sys.unsetenv("R_FUTURE_PLAN") [18:41:20.062] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:20.062] } [18:41:20.062] ...future.workdir <- getwd() [18:41:20.062] } [18:41:20.062] ...future.oldOptions <- base::as.list(base::.Options) [18:41:20.062] ...future.oldEnvVars <- base::Sys.getenv() [18:41:20.062] } [18:41:20.062] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:20.062] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:20.062] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:20.062] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:20.062] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:20.062] future.stdout.windows.reencode = NULL, width = 80L) [18:41:20.062] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:20.062] base::names(...future.oldOptions)) [18:41:20.062] } [18:41:20.062] if (FALSE) { [18:41:20.062] } [18:41:20.062] else { [18:41:20.062] if (TRUE) { [18:41:20.062] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:20.062] open = "w") [18:41:20.062] } [18:41:20.062] else { [18:41:20.062] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:20.062] windows = "NUL", "/dev/null"), open = "w") [18:41:20.062] } [18:41:20.062] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:20.062] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:20.062] base::sink(type = "output", split = FALSE) [18:41:20.062] base::close(...future.stdout) [18:41:20.062] }, add = TRUE) [18:41:20.062] } [18:41:20.062] ...future.frame <- base::sys.nframe() [18:41:20.062] ...future.conditions <- base::list() [18:41:20.062] ...future.rng <- base::globalenv()$.Random.seed [18:41:20.062] if (FALSE) { [18:41:20.062] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:20.062] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:20.062] } [18:41:20.062] ...future.result <- base::tryCatch({ [18:41:20.062] base::withCallingHandlers({ [18:41:20.062] ...future.value <- base::withVisible(base::local({ [18:41:20.062] do.call(function(...) { [18:41:20.062] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.062] if (!identical(...future.globals.maxSize.org, [18:41:20.062] ...future.globals.maxSize)) { [18:41:20.062] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.062] on.exit(options(oopts), add = TRUE) [18:41:20.062] } [18:41:20.062] { [18:41:20.062] lapply(seq_along(...future.elements_ii), [18:41:20.062] FUN = function(jj) { [18:41:20.062] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.062] ...future.FUN(...future.X_jj, ...) [18:41:20.062] }) [18:41:20.062] } [18:41:20.062] }, args = future.call.arguments) [18:41:20.062] })) [18:41:20.062] future::FutureResult(value = ...future.value$value, [18:41:20.062] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:20.062] ...future.rng), globalenv = if (FALSE) [18:41:20.062] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:20.062] ...future.globalenv.names)) [18:41:20.062] else NULL, started = ...future.startTime, version = "1.8") [18:41:20.062] }, condition = base::local({ [18:41:20.062] c <- base::c [18:41:20.062] inherits <- base::inherits [18:41:20.062] invokeRestart <- base::invokeRestart [18:41:20.062] length <- base::length [18:41:20.062] list <- base::list [18:41:20.062] seq.int <- base::seq.int [18:41:20.062] signalCondition <- base::signalCondition [18:41:20.062] sys.calls <- base::sys.calls [18:41:20.062] `[[` <- base::`[[` [18:41:20.062] `+` <- base::`+` [18:41:20.062] `<<-` <- base::`<<-` [18:41:20.062] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:20.062] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:20.062] 3L)] [18:41:20.062] } [18:41:20.062] function(cond) { [18:41:20.062] is_error <- inherits(cond, "error") [18:41:20.062] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:20.062] NULL) [18:41:20.062] if (is_error) { [18:41:20.062] sessionInformation <- function() { [18:41:20.062] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:20.062] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:20.062] search = base::search(), system = base::Sys.info()) [18:41:20.062] } [18:41:20.062] ...future.conditions[[length(...future.conditions) + [18:41:20.062] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:20.062] cond$call), session = sessionInformation(), [18:41:20.062] timestamp = base::Sys.time(), signaled = 0L) [18:41:20.062] signalCondition(cond) [18:41:20.062] } [18:41:20.062] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:20.062] "immediateCondition"))) { [18:41:20.062] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:20.062] ...future.conditions[[length(...future.conditions) + [18:41:20.062] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:20.062] if (TRUE && !signal) { [18:41:20.062] muffleCondition <- function (cond, pattern = "^muffle") [18:41:20.062] { [18:41:20.062] inherits <- base::inherits [18:41:20.062] invokeRestart <- base::invokeRestart [18:41:20.062] is.null <- base::is.null [18:41:20.062] muffled <- FALSE [18:41:20.062] if (inherits(cond, "message")) { [18:41:20.062] muffled <- grepl(pattern, "muffleMessage") [18:41:20.062] if (muffled) [18:41:20.062] invokeRestart("muffleMessage") [18:41:20.062] } [18:41:20.062] else if (inherits(cond, "warning")) { [18:41:20.062] muffled <- grepl(pattern, "muffleWarning") [18:41:20.062] if (muffled) [18:41:20.062] invokeRestart("muffleWarning") [18:41:20.062] } [18:41:20.062] else if (inherits(cond, "condition")) { [18:41:20.062] if (!is.null(pattern)) { [18:41:20.062] computeRestarts <- base::computeRestarts [18:41:20.062] grepl <- base::grepl [18:41:20.062] restarts <- computeRestarts(cond) [18:41:20.062] for (restart in restarts) { [18:41:20.062] name <- restart$name [18:41:20.062] if (is.null(name)) [18:41:20.062] next [18:41:20.062] if (!grepl(pattern, name)) [18:41:20.062] next [18:41:20.062] invokeRestart(restart) [18:41:20.062] muffled <- TRUE [18:41:20.062] break [18:41:20.062] } [18:41:20.062] } [18:41:20.062] } [18:41:20.062] invisible(muffled) [18:41:20.062] } [18:41:20.062] muffleCondition(cond, pattern = "^muffle") [18:41:20.062] } [18:41:20.062] } [18:41:20.062] else { [18:41:20.062] if (TRUE) { [18:41:20.062] muffleCondition <- function (cond, pattern = "^muffle") [18:41:20.062] { [18:41:20.062] inherits <- base::inherits [18:41:20.062] invokeRestart <- base::invokeRestart [18:41:20.062] is.null <- base::is.null [18:41:20.062] muffled <- FALSE [18:41:20.062] if (inherits(cond, "message")) { [18:41:20.062] muffled <- grepl(pattern, "muffleMessage") [18:41:20.062] if (muffled) [18:41:20.062] invokeRestart("muffleMessage") [18:41:20.062] } [18:41:20.062] else if (inherits(cond, "warning")) { [18:41:20.062] muffled <- grepl(pattern, "muffleWarning") [18:41:20.062] if (muffled) [18:41:20.062] invokeRestart("muffleWarning") [18:41:20.062] } [18:41:20.062] else if (inherits(cond, "condition")) { [18:41:20.062] if (!is.null(pattern)) { [18:41:20.062] computeRestarts <- base::computeRestarts [18:41:20.062] grepl <- base::grepl [18:41:20.062] restarts <- computeRestarts(cond) [18:41:20.062] for (restart in restarts) { [18:41:20.062] name <- restart$name [18:41:20.062] if (is.null(name)) [18:41:20.062] next [18:41:20.062] if (!grepl(pattern, name)) [18:41:20.062] next [18:41:20.062] invokeRestart(restart) [18:41:20.062] muffled <- TRUE [18:41:20.062] break [18:41:20.062] } [18:41:20.062] } [18:41:20.062] } [18:41:20.062] invisible(muffled) [18:41:20.062] } [18:41:20.062] muffleCondition(cond, pattern = "^muffle") [18:41:20.062] } [18:41:20.062] } [18:41:20.062] } [18:41:20.062] })) [18:41:20.062] }, error = function(ex) { [18:41:20.062] base::structure(base::list(value = NULL, visible = NULL, [18:41:20.062] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:20.062] ...future.rng), started = ...future.startTime, [18:41:20.062] finished = Sys.time(), session_uuid = NA_character_, [18:41:20.062] version = "1.8"), class = "FutureResult") [18:41:20.062] }, finally = { [18:41:20.062] if (!identical(...future.workdir, getwd())) [18:41:20.062] setwd(...future.workdir) [18:41:20.062] { [18:41:20.062] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:20.062] ...future.oldOptions$nwarnings <- NULL [18:41:20.062] } [18:41:20.062] base::options(...future.oldOptions) [18:41:20.062] if (.Platform$OS.type == "windows") { [18:41:20.062] old_names <- names(...future.oldEnvVars) [18:41:20.062] envs <- base::Sys.getenv() [18:41:20.062] names <- names(envs) [18:41:20.062] common <- intersect(names, old_names) [18:41:20.062] added <- setdiff(names, old_names) [18:41:20.062] removed <- setdiff(old_names, names) [18:41:20.062] changed <- common[...future.oldEnvVars[common] != [18:41:20.062] envs[common]] [18:41:20.062] NAMES <- toupper(changed) [18:41:20.062] args <- list() [18:41:20.062] for (kk in seq_along(NAMES)) { [18:41:20.062] name <- changed[[kk]] [18:41:20.062] NAME <- NAMES[[kk]] [18:41:20.062] if (name != NAME && is.element(NAME, old_names)) [18:41:20.062] next [18:41:20.062] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:20.062] } [18:41:20.062] NAMES <- toupper(added) [18:41:20.062] for (kk in seq_along(NAMES)) { [18:41:20.062] name <- added[[kk]] [18:41:20.062] NAME <- NAMES[[kk]] [18:41:20.062] if (name != NAME && is.element(NAME, old_names)) [18:41:20.062] next [18:41:20.062] args[[name]] <- "" [18:41:20.062] } [18:41:20.062] NAMES <- toupper(removed) [18:41:20.062] for (kk in seq_along(NAMES)) { [18:41:20.062] name <- removed[[kk]] [18:41:20.062] NAME <- NAMES[[kk]] [18:41:20.062] if (name != NAME && is.element(NAME, old_names)) [18:41:20.062] next [18:41:20.062] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:20.062] } [18:41:20.062] if (length(args) > 0) [18:41:20.062] base::do.call(base::Sys.setenv, args = args) [18:41:20.062] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:20.062] } [18:41:20.062] else { [18:41:20.062] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:20.062] } [18:41:20.062] { [18:41:20.062] if (base::length(...future.futureOptionsAdded) > [18:41:20.062] 0L) { [18:41:20.062] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:20.062] base::names(opts) <- ...future.futureOptionsAdded [18:41:20.062] base::options(opts) [18:41:20.062] } [18:41:20.062] { [18:41:20.062] { [18:41:20.062] NULL [18:41:20.062] RNGkind("Mersenne-Twister") [18:41:20.062] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:20.062] inherits = FALSE) [18:41:20.062] } [18:41:20.062] options(future.plan = NULL) [18:41:20.062] if (is.na(NA_character_)) [18:41:20.062] Sys.unsetenv("R_FUTURE_PLAN") [18:41:20.062] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:20.062] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:20.062] .init = FALSE) [18:41:20.062] } [18:41:20.062] } [18:41:20.062] } [18:41:20.062] }) [18:41:20.062] if (TRUE) { [18:41:20.062] base::sink(type = "output", split = FALSE) [18:41:20.062] if (TRUE) { [18:41:20.062] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:20.062] } [18:41:20.062] else { [18:41:20.062] ...future.result["stdout"] <- base::list(NULL) [18:41:20.062] } [18:41:20.062] base::close(...future.stdout) [18:41:20.062] ...future.stdout <- NULL [18:41:20.062] } [18:41:20.062] ...future.result$conditions <- ...future.conditions [18:41:20.062] ...future.result$finished <- base::Sys.time() [18:41:20.062] ...future.result [18:41:20.062] } [18:41:20.066] assign_globals() ... [18:41:20.066] List of 5 [18:41:20.066] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:20.066] $ future.call.arguments :List of 1 [18:41:20.066] ..$ length: int 2 [18:41:20.066] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:20.066] $ ...future.elements_ii :List of 1 [18:41:20.066] ..$ a: chr "integer" [18:41:20.066] $ ...future.seeds_ii : NULL [18:41:20.066] $ ...future.globals.maxSize: NULL [18:41:20.066] - attr(*, "where")=List of 5 [18:41:20.066] ..$ ...future.FUN : [18:41:20.066] ..$ future.call.arguments : [18:41:20.066] ..$ ...future.elements_ii : [18:41:20.066] ..$ ...future.seeds_ii : [18:41:20.066] ..$ ...future.globals.maxSize: [18:41:20.066] - attr(*, "resolved")= logi FALSE [18:41:20.066] - attr(*, "total_size")= num 4324 [18:41:20.066] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:20.066] - attr(*, "already-done")= logi TRUE [18:41:20.074] - copied '...future.FUN' to environment [18:41:20.075] - copied 'future.call.arguments' to environment [18:41:20.075] - copied '...future.elements_ii' to environment [18:41:20.075] - copied '...future.seeds_ii' to environment [18:41:20.075] - copied '...future.globals.maxSize' to environment [18:41:20.075] assign_globals() ... done [18:41:20.076] plan(): Setting new future strategy stack: [18:41:20.076] List of future strategies: [18:41:20.076] 1. sequential: [18:41:20.076] - args: function (..., envir = parent.frame(), workers = "") [18:41:20.076] - tweaked: FALSE [18:41:20.076] - call: NULL [18:41:20.076] plan(): nbrOfWorkers() = 1 [18:41:20.078] plan(): Setting new future strategy stack: [18:41:20.078] List of future strategies: [18:41:20.078] 1. sequential: [18:41:20.078] - args: function (..., envir = parent.frame(), workers = "") [18:41:20.078] - tweaked: FALSE [18:41:20.078] - call: plan(strategy) [18:41:20.078] plan(): nbrOfWorkers() = 1 [18:41:20.079] SequentialFuture started (and completed) [18:41:20.079] - Launch lazy future ... done [18:41:20.079] run() for 'SequentialFuture' ... done [18:41:20.079] Created future: [18:41:20.079] SequentialFuture: [18:41:20.079] Label: 'future_lapply-1' [18:41:20.079] Expression: [18:41:20.079] { [18:41:20.079] do.call(function(...) { [18:41:20.079] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.079] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:20.079] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.079] on.exit(options(oopts), add = TRUE) [18:41:20.079] } [18:41:20.079] { [18:41:20.079] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:20.079] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.079] ...future.FUN(...future.X_jj, ...) [18:41:20.079] }) [18:41:20.079] } [18:41:20.079] }, args = future.call.arguments) [18:41:20.079] } [18:41:20.079] Lazy evaluation: FALSE [18:41:20.079] Asynchronous evaluation: FALSE [18:41:20.079] Local evaluation: TRUE [18:41:20.079] Environment: R_GlobalEnv [18:41:20.079] Capture standard output: TRUE [18:41:20.079] Capture condition classes: 'condition' (excluding 'nothing') [18:41:20.079] Globals: 5 objects totaling 758 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 96 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:20.079] Packages: [18:41:20.079] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:20.079] Resolved: TRUE [18:41:20.079] Value: 47 bytes of class 'list' [18:41:20.079] Early signaling: FALSE [18:41:20.079] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:20.079] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:20.081] Chunk #1 of 4 ... DONE [18:41:20.081] Chunk #2 of 4 ... [18:41:20.081] - Finding globals in 'X' for chunk #2 ... [18:41:20.081] getGlobalsAndPackages() ... [18:41:20.081] Searching for globals... [18:41:20.082] [18:41:20.082] Searching for globals ... DONE [18:41:20.082] - globals: [0] [18:41:20.082] getGlobalsAndPackages() ... DONE [18:41:20.082] + additional globals found: [n=0] [18:41:20.082] + additional namespaces needed: [n=0] [18:41:20.083] - Finding globals in 'X' for chunk #2 ... DONE [18:41:20.083] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:20.083] - seeds: [18:41:20.083] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.083] getGlobalsAndPackages() ... [18:41:20.083] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.084] Resolving globals: FALSE [18:41:20.084] Tweak future expression to call with '...' arguments ... [18:41:20.084] { [18:41:20.084] do.call(function(...) { [18:41:20.084] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.084] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:20.084] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.084] on.exit(options(oopts), add = TRUE) [18:41:20.084] } [18:41:20.084] { [18:41:20.084] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:20.084] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.084] ...future.FUN(...future.X_jj, ...) [18:41:20.084] }) [18:41:20.084] } [18:41:20.084] }, args = future.call.arguments) [18:41:20.084] } [18:41:20.084] Tweak future expression to call with '...' arguments ... DONE [18:41:20.085] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.085] [18:41:20.085] getGlobalsAndPackages() ... DONE [18:41:20.086] run() for 'Future' ... [18:41:20.086] - state: 'created' [18:41:20.086] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:20.086] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:20.087] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:20.087] - Field: 'label' [18:41:20.087] - Field: 'local' [18:41:20.087] - Field: 'owner' [18:41:20.087] - Field: 'envir' [18:41:20.087] - Field: 'packages' [18:41:20.088] - Field: 'gc' [18:41:20.088] - Field: 'conditions' [18:41:20.088] - Field: 'expr' [18:41:20.088] - Field: 'uuid' [18:41:20.088] - Field: 'seed' [18:41:20.088] - Field: 'version' [18:41:20.089] - Field: 'result' [18:41:20.089] - Field: 'asynchronous' [18:41:20.089] - Field: 'calls' [18:41:20.089] - Field: 'globals' [18:41:20.089] - Field: 'stdout' [18:41:20.090] - Field: 'earlySignal' [18:41:20.090] - Field: 'lazy' [18:41:20.090] - Field: 'state' [18:41:20.090] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:20.090] - Launch lazy future ... [18:41:20.090] Packages needed by the future expression (n = 0): [18:41:20.091] Packages needed by future strategies (n = 0): [18:41:20.091] { [18:41:20.091] { [18:41:20.091] { [18:41:20.091] ...future.startTime <- base::Sys.time() [18:41:20.091] { [18:41:20.091] { [18:41:20.091] { [18:41:20.091] base::local({ [18:41:20.091] has_future <- base::requireNamespace("future", [18:41:20.091] quietly = TRUE) [18:41:20.091] if (has_future) { [18:41:20.091] ns <- base::getNamespace("future") [18:41:20.091] version <- ns[[".package"]][["version"]] [18:41:20.091] if (is.null(version)) [18:41:20.091] version <- utils::packageVersion("future") [18:41:20.091] } [18:41:20.091] else { [18:41:20.091] version <- NULL [18:41:20.091] } [18:41:20.091] if (!has_future || version < "1.8.0") { [18:41:20.091] info <- base::c(r_version = base::gsub("R version ", [18:41:20.091] "", base::R.version$version.string), [18:41:20.091] platform = base::sprintf("%s (%s-bit)", [18:41:20.091] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:20.091] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:20.091] "release", "version")], collapse = " "), [18:41:20.091] hostname = base::Sys.info()[["nodename"]]) [18:41:20.091] info <- base::sprintf("%s: %s", base::names(info), [18:41:20.091] info) [18:41:20.091] info <- base::paste(info, collapse = "; ") [18:41:20.091] if (!has_future) { [18:41:20.091] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:20.091] info) [18:41:20.091] } [18:41:20.091] else { [18:41:20.091] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:20.091] info, version) [18:41:20.091] } [18:41:20.091] base::stop(msg) [18:41:20.091] } [18:41:20.091] }) [18:41:20.091] } [18:41:20.091] ...future.strategy.old <- future::plan("list") [18:41:20.091] options(future.plan = NULL) [18:41:20.091] Sys.unsetenv("R_FUTURE_PLAN") [18:41:20.091] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:20.091] } [18:41:20.091] ...future.workdir <- getwd() [18:41:20.091] } [18:41:20.091] ...future.oldOptions <- base::as.list(base::.Options) [18:41:20.091] ...future.oldEnvVars <- base::Sys.getenv() [18:41:20.091] } [18:41:20.091] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:20.091] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:20.091] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:20.091] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:20.091] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:20.091] future.stdout.windows.reencode = NULL, width = 80L) [18:41:20.091] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:20.091] base::names(...future.oldOptions)) [18:41:20.091] } [18:41:20.091] if (FALSE) { [18:41:20.091] } [18:41:20.091] else { [18:41:20.091] if (TRUE) { [18:41:20.091] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:20.091] open = "w") [18:41:20.091] } [18:41:20.091] else { [18:41:20.091] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:20.091] windows = "NUL", "/dev/null"), open = "w") [18:41:20.091] } [18:41:20.091] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:20.091] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:20.091] base::sink(type = "output", split = FALSE) [18:41:20.091] base::close(...future.stdout) [18:41:20.091] }, add = TRUE) [18:41:20.091] } [18:41:20.091] ...future.frame <- base::sys.nframe() [18:41:20.091] ...future.conditions <- base::list() [18:41:20.091] ...future.rng <- base::globalenv()$.Random.seed [18:41:20.091] if (FALSE) { [18:41:20.091] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:20.091] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:20.091] } [18:41:20.091] ...future.result <- base::tryCatch({ [18:41:20.091] base::withCallingHandlers({ [18:41:20.091] ...future.value <- base::withVisible(base::local({ [18:41:20.091] do.call(function(...) { [18:41:20.091] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.091] if (!identical(...future.globals.maxSize.org, [18:41:20.091] ...future.globals.maxSize)) { [18:41:20.091] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.091] on.exit(options(oopts), add = TRUE) [18:41:20.091] } [18:41:20.091] { [18:41:20.091] lapply(seq_along(...future.elements_ii), [18:41:20.091] FUN = function(jj) { [18:41:20.091] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.091] ...future.FUN(...future.X_jj, ...) [18:41:20.091] }) [18:41:20.091] } [18:41:20.091] }, args = future.call.arguments) [18:41:20.091] })) [18:41:20.091] future::FutureResult(value = ...future.value$value, [18:41:20.091] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:20.091] ...future.rng), globalenv = if (FALSE) [18:41:20.091] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:20.091] ...future.globalenv.names)) [18:41:20.091] else NULL, started = ...future.startTime, version = "1.8") [18:41:20.091] }, condition = base::local({ [18:41:20.091] c <- base::c [18:41:20.091] inherits <- base::inherits [18:41:20.091] invokeRestart <- base::invokeRestart [18:41:20.091] length <- base::length [18:41:20.091] list <- base::list [18:41:20.091] seq.int <- base::seq.int [18:41:20.091] signalCondition <- base::signalCondition [18:41:20.091] sys.calls <- base::sys.calls [18:41:20.091] `[[` <- base::`[[` [18:41:20.091] `+` <- base::`+` [18:41:20.091] `<<-` <- base::`<<-` [18:41:20.091] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:20.091] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:20.091] 3L)] [18:41:20.091] } [18:41:20.091] function(cond) { [18:41:20.091] is_error <- inherits(cond, "error") [18:41:20.091] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:20.091] NULL) [18:41:20.091] if (is_error) { [18:41:20.091] sessionInformation <- function() { [18:41:20.091] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:20.091] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:20.091] search = base::search(), system = base::Sys.info()) [18:41:20.091] } [18:41:20.091] ...future.conditions[[length(...future.conditions) + [18:41:20.091] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:20.091] cond$call), session = sessionInformation(), [18:41:20.091] timestamp = base::Sys.time(), signaled = 0L) [18:41:20.091] signalCondition(cond) [18:41:20.091] } [18:41:20.091] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:20.091] "immediateCondition"))) { [18:41:20.091] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:20.091] ...future.conditions[[length(...future.conditions) + [18:41:20.091] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:20.091] if (TRUE && !signal) { [18:41:20.091] muffleCondition <- function (cond, pattern = "^muffle") [18:41:20.091] { [18:41:20.091] inherits <- base::inherits [18:41:20.091] invokeRestart <- base::invokeRestart [18:41:20.091] is.null <- base::is.null [18:41:20.091] muffled <- FALSE [18:41:20.091] if (inherits(cond, "message")) { [18:41:20.091] muffled <- grepl(pattern, "muffleMessage") [18:41:20.091] if (muffled) [18:41:20.091] invokeRestart("muffleMessage") [18:41:20.091] } [18:41:20.091] else if (inherits(cond, "warning")) { [18:41:20.091] muffled <- grepl(pattern, "muffleWarning") [18:41:20.091] if (muffled) [18:41:20.091] invokeRestart("muffleWarning") [18:41:20.091] } [18:41:20.091] else if (inherits(cond, "condition")) { [18:41:20.091] if (!is.null(pattern)) { [18:41:20.091] computeRestarts <- base::computeRestarts [18:41:20.091] grepl <- base::grepl [18:41:20.091] restarts <- computeRestarts(cond) [18:41:20.091] for (restart in restarts) { [18:41:20.091] name <- restart$name [18:41:20.091] if (is.null(name)) [18:41:20.091] next [18:41:20.091] if (!grepl(pattern, name)) [18:41:20.091] next [18:41:20.091] invokeRestart(restart) [18:41:20.091] muffled <- TRUE [18:41:20.091] break [18:41:20.091] } [18:41:20.091] } [18:41:20.091] } [18:41:20.091] invisible(muffled) [18:41:20.091] } [18:41:20.091] muffleCondition(cond, pattern = "^muffle") [18:41:20.091] } [18:41:20.091] } [18:41:20.091] else { [18:41:20.091] if (TRUE) { [18:41:20.091] muffleCondition <- function (cond, pattern = "^muffle") [18:41:20.091] { [18:41:20.091] inherits <- base::inherits [18:41:20.091] invokeRestart <- base::invokeRestart [18:41:20.091] is.null <- base::is.null [18:41:20.091] muffled <- FALSE [18:41:20.091] if (inherits(cond, "message")) { [18:41:20.091] muffled <- grepl(pattern, "muffleMessage") [18:41:20.091] if (muffled) [18:41:20.091] invokeRestart("muffleMessage") [18:41:20.091] } [18:41:20.091] else if (inherits(cond, "warning")) { [18:41:20.091] muffled <- grepl(pattern, "muffleWarning") [18:41:20.091] if (muffled) [18:41:20.091] invokeRestart("muffleWarning") [18:41:20.091] } [18:41:20.091] else if (inherits(cond, "condition")) { [18:41:20.091] if (!is.null(pattern)) { [18:41:20.091] computeRestarts <- base::computeRestarts [18:41:20.091] grepl <- base::grepl [18:41:20.091] restarts <- computeRestarts(cond) [18:41:20.091] for (restart in restarts) { [18:41:20.091] name <- restart$name [18:41:20.091] if (is.null(name)) [18:41:20.091] next [18:41:20.091] if (!grepl(pattern, name)) [18:41:20.091] next [18:41:20.091] invokeRestart(restart) [18:41:20.091] muffled <- TRUE [18:41:20.091] break [18:41:20.091] } [18:41:20.091] } [18:41:20.091] } [18:41:20.091] invisible(muffled) [18:41:20.091] } [18:41:20.091] muffleCondition(cond, pattern = "^muffle") [18:41:20.091] } [18:41:20.091] } [18:41:20.091] } [18:41:20.091] })) [18:41:20.091] }, error = function(ex) { [18:41:20.091] base::structure(base::list(value = NULL, visible = NULL, [18:41:20.091] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:20.091] ...future.rng), started = ...future.startTime, [18:41:20.091] finished = Sys.time(), session_uuid = NA_character_, [18:41:20.091] version = "1.8"), class = "FutureResult") [18:41:20.091] }, finally = { [18:41:20.091] if (!identical(...future.workdir, getwd())) [18:41:20.091] setwd(...future.workdir) [18:41:20.091] { [18:41:20.091] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:20.091] ...future.oldOptions$nwarnings <- NULL [18:41:20.091] } [18:41:20.091] base::options(...future.oldOptions) [18:41:20.091] if (.Platform$OS.type == "windows") { [18:41:20.091] old_names <- names(...future.oldEnvVars) [18:41:20.091] envs <- base::Sys.getenv() [18:41:20.091] names <- names(envs) [18:41:20.091] common <- intersect(names, old_names) [18:41:20.091] added <- setdiff(names, old_names) [18:41:20.091] removed <- setdiff(old_names, names) [18:41:20.091] changed <- common[...future.oldEnvVars[common] != [18:41:20.091] envs[common]] [18:41:20.091] NAMES <- toupper(changed) [18:41:20.091] args <- list() [18:41:20.091] for (kk in seq_along(NAMES)) { [18:41:20.091] name <- changed[[kk]] [18:41:20.091] NAME <- NAMES[[kk]] [18:41:20.091] if (name != NAME && is.element(NAME, old_names)) [18:41:20.091] next [18:41:20.091] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:20.091] } [18:41:20.091] NAMES <- toupper(added) [18:41:20.091] for (kk in seq_along(NAMES)) { [18:41:20.091] name <- added[[kk]] [18:41:20.091] NAME <- NAMES[[kk]] [18:41:20.091] if (name != NAME && is.element(NAME, old_names)) [18:41:20.091] next [18:41:20.091] args[[name]] <- "" [18:41:20.091] } [18:41:20.091] NAMES <- toupper(removed) [18:41:20.091] for (kk in seq_along(NAMES)) { [18:41:20.091] name <- removed[[kk]] [18:41:20.091] NAME <- NAMES[[kk]] [18:41:20.091] if (name != NAME && is.element(NAME, old_names)) [18:41:20.091] next [18:41:20.091] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:20.091] } [18:41:20.091] if (length(args) > 0) [18:41:20.091] base::do.call(base::Sys.setenv, args = args) [18:41:20.091] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:20.091] } [18:41:20.091] else { [18:41:20.091] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:20.091] } [18:41:20.091] { [18:41:20.091] if (base::length(...future.futureOptionsAdded) > [18:41:20.091] 0L) { [18:41:20.091] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:20.091] base::names(opts) <- ...future.futureOptionsAdded [18:41:20.091] base::options(opts) [18:41:20.091] } [18:41:20.091] { [18:41:20.091] { [18:41:20.091] NULL [18:41:20.091] RNGkind("Mersenne-Twister") [18:41:20.091] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:20.091] inherits = FALSE) [18:41:20.091] } [18:41:20.091] options(future.plan = NULL) [18:41:20.091] if (is.na(NA_character_)) [18:41:20.091] Sys.unsetenv("R_FUTURE_PLAN") [18:41:20.091] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:20.091] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:20.091] .init = FALSE) [18:41:20.091] } [18:41:20.091] } [18:41:20.091] } [18:41:20.091] }) [18:41:20.091] if (TRUE) { [18:41:20.091] base::sink(type = "output", split = FALSE) [18:41:20.091] if (TRUE) { [18:41:20.091] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:20.091] } [18:41:20.091] else { [18:41:20.091] ...future.result["stdout"] <- base::list(NULL) [18:41:20.091] } [18:41:20.091] base::close(...future.stdout) [18:41:20.091] ...future.stdout <- NULL [18:41:20.091] } [18:41:20.091] ...future.result$conditions <- ...future.conditions [18:41:20.091] ...future.result$finished <- base::Sys.time() [18:41:20.091] ...future.result [18:41:20.091] } [18:41:20.095] assign_globals() ... [18:41:20.095] List of 5 [18:41:20.095] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:20.095] $ future.call.arguments :List of 1 [18:41:20.095] ..$ length: int 2 [18:41:20.095] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:20.095] $ ...future.elements_ii :List of 1 [18:41:20.095] ..$ b: chr "numeric" [18:41:20.095] $ ...future.seeds_ii : NULL [18:41:20.095] $ ...future.globals.maxSize: NULL [18:41:20.095] - attr(*, "where")=List of 5 [18:41:20.095] ..$ ...future.FUN : [18:41:20.095] ..$ future.call.arguments : [18:41:20.095] ..$ ...future.elements_ii : [18:41:20.095] ..$ ...future.seeds_ii : [18:41:20.095] ..$ ...future.globals.maxSize: [18:41:20.095] - attr(*, "resolved")= logi FALSE [18:41:20.095] - attr(*, "total_size")= num 4324 [18:41:20.095] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:20.095] - attr(*, "already-done")= logi TRUE [18:41:20.102] - copied '...future.FUN' to environment [18:41:20.102] - copied 'future.call.arguments' to environment [18:41:20.102] - copied '...future.elements_ii' to environment [18:41:20.102] - copied '...future.seeds_ii' to environment [18:41:20.102] - copied '...future.globals.maxSize' to environment [18:41:20.102] assign_globals() ... done [18:41:20.103] plan(): Setting new future strategy stack: [18:41:20.103] List of future strategies: [18:41:20.103] 1. sequential: [18:41:20.103] - args: function (..., envir = parent.frame(), workers = "") [18:41:20.103] - tweaked: FALSE [18:41:20.103] - call: NULL [18:41:20.104] plan(): nbrOfWorkers() = 1 [18:41:20.105] plan(): Setting new future strategy stack: [18:41:20.105] List of future strategies: [18:41:20.105] 1. sequential: [18:41:20.105] - args: function (..., envir = parent.frame(), workers = "") [18:41:20.105] - tweaked: FALSE [18:41:20.105] - call: plan(strategy) [18:41:20.106] plan(): nbrOfWorkers() = 1 [18:41:20.106] SequentialFuture started (and completed) [18:41:20.106] - Launch lazy future ... done [18:41:20.106] run() for 'SequentialFuture' ... done [18:41:20.106] Created future: [18:41:20.107] SequentialFuture: [18:41:20.107] Label: 'future_lapply-2' [18:41:20.107] Expression: [18:41:20.107] { [18:41:20.107] do.call(function(...) { [18:41:20.107] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.107] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:20.107] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.107] on.exit(options(oopts), add = TRUE) [18:41:20.107] } [18:41:20.107] { [18:41:20.107] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:20.107] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.107] ...future.FUN(...future.X_jj, ...) [18:41:20.107] }) [18:41:20.107] } [18:41:20.107] }, args = future.call.arguments) [18:41:20.107] } [18:41:20.107] Lazy evaluation: FALSE [18:41:20.107] Asynchronous evaluation: FALSE [18:41:20.107] Local evaluation: TRUE [18:41:20.107] Environment: R_GlobalEnv [18:41:20.107] Capture standard output: TRUE [18:41:20.107] Capture condition classes: 'condition' (excluding 'nothing') [18:41:20.107] Globals: 5 objects totaling 758 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 96 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:20.107] Packages: [18:41:20.107] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:20.107] Resolved: TRUE [18:41:20.107] Value: 55 bytes of class 'list' [18:41:20.107] Early signaling: FALSE [18:41:20.107] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:20.107] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:20.108] Chunk #2 of 4 ... DONE [18:41:20.108] Chunk #3 of 4 ... [18:41:20.108] - Finding globals in 'X' for chunk #3 ... [18:41:20.108] getGlobalsAndPackages() ... [18:41:20.108] Searching for globals... [18:41:20.109] [18:41:20.109] Searching for globals ... DONE [18:41:20.109] - globals: [0] [18:41:20.109] getGlobalsAndPackages() ... DONE [18:41:20.109] + additional globals found: [n=0] [18:41:20.109] + additional namespaces needed: [n=0] [18:41:20.110] - Finding globals in 'X' for chunk #3 ... DONE [18:41:20.110] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:20.110] - seeds: [18:41:20.110] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.110] getGlobalsAndPackages() ... [18:41:20.110] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.111] Resolving globals: FALSE [18:41:20.111] Tweak future expression to call with '...' arguments ... [18:41:20.111] { [18:41:20.111] do.call(function(...) { [18:41:20.111] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.111] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:20.111] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.111] on.exit(options(oopts), add = TRUE) [18:41:20.111] } [18:41:20.111] { [18:41:20.111] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:20.111] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.111] ...future.FUN(...future.X_jj, ...) [18:41:20.111] }) [18:41:20.111] } [18:41:20.111] }, args = future.call.arguments) [18:41:20.111] } [18:41:20.111] Tweak future expression to call with '...' arguments ... DONE [18:41:20.112] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.112] [18:41:20.112] getGlobalsAndPackages() ... DONE [18:41:20.113] run() for 'Future' ... [18:41:20.113] - state: 'created' [18:41:20.113] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:20.113] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:20.114] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:20.114] - Field: 'label' [18:41:20.114] - Field: 'local' [18:41:20.114] - Field: 'owner' [18:41:20.114] - Field: 'envir' [18:41:20.114] - Field: 'packages' [18:41:20.115] - Field: 'gc' [18:41:20.115] - Field: 'conditions' [18:41:20.115] - Field: 'expr' [18:41:20.115] - Field: 'uuid' [18:41:20.115] - Field: 'seed' [18:41:20.115] - Field: 'version' [18:41:20.116] - Field: 'result' [18:41:20.116] - Field: 'asynchronous' [18:41:20.116] - Field: 'calls' [18:41:20.116] - Field: 'globals' [18:41:20.116] - Field: 'stdout' [18:41:20.117] - Field: 'earlySignal' [18:41:20.117] - Field: 'lazy' [18:41:20.117] - Field: 'state' [18:41:20.117] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:20.117] - Launch lazy future ... [18:41:20.117] Packages needed by the future expression (n = 0): [18:41:20.118] Packages needed by future strategies (n = 0): [18:41:20.118] { [18:41:20.118] { [18:41:20.118] { [18:41:20.118] ...future.startTime <- base::Sys.time() [18:41:20.118] { [18:41:20.118] { [18:41:20.118] { [18:41:20.118] base::local({ [18:41:20.118] has_future <- base::requireNamespace("future", [18:41:20.118] quietly = TRUE) [18:41:20.118] if (has_future) { [18:41:20.118] ns <- base::getNamespace("future") [18:41:20.118] version <- ns[[".package"]][["version"]] [18:41:20.118] if (is.null(version)) [18:41:20.118] version <- utils::packageVersion("future") [18:41:20.118] } [18:41:20.118] else { [18:41:20.118] version <- NULL [18:41:20.118] } [18:41:20.118] if (!has_future || version < "1.8.0") { [18:41:20.118] info <- base::c(r_version = base::gsub("R version ", [18:41:20.118] "", base::R.version$version.string), [18:41:20.118] platform = base::sprintf("%s (%s-bit)", [18:41:20.118] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:20.118] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:20.118] "release", "version")], collapse = " "), [18:41:20.118] hostname = base::Sys.info()[["nodename"]]) [18:41:20.118] info <- base::sprintf("%s: %s", base::names(info), [18:41:20.118] info) [18:41:20.118] info <- base::paste(info, collapse = "; ") [18:41:20.118] if (!has_future) { [18:41:20.118] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:20.118] info) [18:41:20.118] } [18:41:20.118] else { [18:41:20.118] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:20.118] info, version) [18:41:20.118] } [18:41:20.118] base::stop(msg) [18:41:20.118] } [18:41:20.118] }) [18:41:20.118] } [18:41:20.118] ...future.strategy.old <- future::plan("list") [18:41:20.118] options(future.plan = NULL) [18:41:20.118] Sys.unsetenv("R_FUTURE_PLAN") [18:41:20.118] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:20.118] } [18:41:20.118] ...future.workdir <- getwd() [18:41:20.118] } [18:41:20.118] ...future.oldOptions <- base::as.list(base::.Options) [18:41:20.118] ...future.oldEnvVars <- base::Sys.getenv() [18:41:20.118] } [18:41:20.118] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:20.118] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:20.118] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:20.118] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:20.118] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:20.118] future.stdout.windows.reencode = NULL, width = 80L) [18:41:20.118] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:20.118] base::names(...future.oldOptions)) [18:41:20.118] } [18:41:20.118] if (FALSE) { [18:41:20.118] } [18:41:20.118] else { [18:41:20.118] if (TRUE) { [18:41:20.118] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:20.118] open = "w") [18:41:20.118] } [18:41:20.118] else { [18:41:20.118] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:20.118] windows = "NUL", "/dev/null"), open = "w") [18:41:20.118] } [18:41:20.118] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:20.118] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:20.118] base::sink(type = "output", split = FALSE) [18:41:20.118] base::close(...future.stdout) [18:41:20.118] }, add = TRUE) [18:41:20.118] } [18:41:20.118] ...future.frame <- base::sys.nframe() [18:41:20.118] ...future.conditions <- base::list() [18:41:20.118] ...future.rng <- base::globalenv()$.Random.seed [18:41:20.118] if (FALSE) { [18:41:20.118] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:20.118] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:20.118] } [18:41:20.118] ...future.result <- base::tryCatch({ [18:41:20.118] base::withCallingHandlers({ [18:41:20.118] ...future.value <- base::withVisible(base::local({ [18:41:20.118] do.call(function(...) { [18:41:20.118] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.118] if (!identical(...future.globals.maxSize.org, [18:41:20.118] ...future.globals.maxSize)) { [18:41:20.118] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.118] on.exit(options(oopts), add = TRUE) [18:41:20.118] } [18:41:20.118] { [18:41:20.118] lapply(seq_along(...future.elements_ii), [18:41:20.118] FUN = function(jj) { [18:41:20.118] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.118] ...future.FUN(...future.X_jj, ...) [18:41:20.118] }) [18:41:20.118] } [18:41:20.118] }, args = future.call.arguments) [18:41:20.118] })) [18:41:20.118] future::FutureResult(value = ...future.value$value, [18:41:20.118] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:20.118] ...future.rng), globalenv = if (FALSE) [18:41:20.118] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:20.118] ...future.globalenv.names)) [18:41:20.118] else NULL, started = ...future.startTime, version = "1.8") [18:41:20.118] }, condition = base::local({ [18:41:20.118] c <- base::c [18:41:20.118] inherits <- base::inherits [18:41:20.118] invokeRestart <- base::invokeRestart [18:41:20.118] length <- base::length [18:41:20.118] list <- base::list [18:41:20.118] seq.int <- base::seq.int [18:41:20.118] signalCondition <- base::signalCondition [18:41:20.118] sys.calls <- base::sys.calls [18:41:20.118] `[[` <- base::`[[` [18:41:20.118] `+` <- base::`+` [18:41:20.118] `<<-` <- base::`<<-` [18:41:20.118] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:20.118] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:20.118] 3L)] [18:41:20.118] } [18:41:20.118] function(cond) { [18:41:20.118] is_error <- inherits(cond, "error") [18:41:20.118] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:20.118] NULL) [18:41:20.118] if (is_error) { [18:41:20.118] sessionInformation <- function() { [18:41:20.118] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:20.118] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:20.118] search = base::search(), system = base::Sys.info()) [18:41:20.118] } [18:41:20.118] ...future.conditions[[length(...future.conditions) + [18:41:20.118] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:20.118] cond$call), session = sessionInformation(), [18:41:20.118] timestamp = base::Sys.time(), signaled = 0L) [18:41:20.118] signalCondition(cond) [18:41:20.118] } [18:41:20.118] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:20.118] "immediateCondition"))) { [18:41:20.118] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:20.118] ...future.conditions[[length(...future.conditions) + [18:41:20.118] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:20.118] if (TRUE && !signal) { [18:41:20.118] muffleCondition <- function (cond, pattern = "^muffle") [18:41:20.118] { [18:41:20.118] inherits <- base::inherits [18:41:20.118] invokeRestart <- base::invokeRestart [18:41:20.118] is.null <- base::is.null [18:41:20.118] muffled <- FALSE [18:41:20.118] if (inherits(cond, "message")) { [18:41:20.118] muffled <- grepl(pattern, "muffleMessage") [18:41:20.118] if (muffled) [18:41:20.118] invokeRestart("muffleMessage") [18:41:20.118] } [18:41:20.118] else if (inherits(cond, "warning")) { [18:41:20.118] muffled <- grepl(pattern, "muffleWarning") [18:41:20.118] if (muffled) [18:41:20.118] invokeRestart("muffleWarning") [18:41:20.118] } [18:41:20.118] else if (inherits(cond, "condition")) { [18:41:20.118] if (!is.null(pattern)) { [18:41:20.118] computeRestarts <- base::computeRestarts [18:41:20.118] grepl <- base::grepl [18:41:20.118] restarts <- computeRestarts(cond) [18:41:20.118] for (restart in restarts) { [18:41:20.118] name <- restart$name [18:41:20.118] if (is.null(name)) [18:41:20.118] next [18:41:20.118] if (!grepl(pattern, name)) [18:41:20.118] next [18:41:20.118] invokeRestart(restart) [18:41:20.118] muffled <- TRUE [18:41:20.118] break [18:41:20.118] } [18:41:20.118] } [18:41:20.118] } [18:41:20.118] invisible(muffled) [18:41:20.118] } [18:41:20.118] muffleCondition(cond, pattern = "^muffle") [18:41:20.118] } [18:41:20.118] } [18:41:20.118] else { [18:41:20.118] if (TRUE) { [18:41:20.118] muffleCondition <- function (cond, pattern = "^muffle") [18:41:20.118] { [18:41:20.118] inherits <- base::inherits [18:41:20.118] invokeRestart <- base::invokeRestart [18:41:20.118] is.null <- base::is.null [18:41:20.118] muffled <- FALSE [18:41:20.118] if (inherits(cond, "message")) { [18:41:20.118] muffled <- grepl(pattern, "muffleMessage") [18:41:20.118] if (muffled) [18:41:20.118] invokeRestart("muffleMessage") [18:41:20.118] } [18:41:20.118] else if (inherits(cond, "warning")) { [18:41:20.118] muffled <- grepl(pattern, "muffleWarning") [18:41:20.118] if (muffled) [18:41:20.118] invokeRestart("muffleWarning") [18:41:20.118] } [18:41:20.118] else if (inherits(cond, "condition")) { [18:41:20.118] if (!is.null(pattern)) { [18:41:20.118] computeRestarts <- base::computeRestarts [18:41:20.118] grepl <- base::grepl [18:41:20.118] restarts <- computeRestarts(cond) [18:41:20.118] for (restart in restarts) { [18:41:20.118] name <- restart$name [18:41:20.118] if (is.null(name)) [18:41:20.118] next [18:41:20.118] if (!grepl(pattern, name)) [18:41:20.118] next [18:41:20.118] invokeRestart(restart) [18:41:20.118] muffled <- TRUE [18:41:20.118] break [18:41:20.118] } [18:41:20.118] } [18:41:20.118] } [18:41:20.118] invisible(muffled) [18:41:20.118] } [18:41:20.118] muffleCondition(cond, pattern = "^muffle") [18:41:20.118] } [18:41:20.118] } [18:41:20.118] } [18:41:20.118] })) [18:41:20.118] }, error = function(ex) { [18:41:20.118] base::structure(base::list(value = NULL, visible = NULL, [18:41:20.118] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:20.118] ...future.rng), started = ...future.startTime, [18:41:20.118] finished = Sys.time(), session_uuid = NA_character_, [18:41:20.118] version = "1.8"), class = "FutureResult") [18:41:20.118] }, finally = { [18:41:20.118] if (!identical(...future.workdir, getwd())) [18:41:20.118] setwd(...future.workdir) [18:41:20.118] { [18:41:20.118] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:20.118] ...future.oldOptions$nwarnings <- NULL [18:41:20.118] } [18:41:20.118] base::options(...future.oldOptions) [18:41:20.118] if (.Platform$OS.type == "windows") { [18:41:20.118] old_names <- names(...future.oldEnvVars) [18:41:20.118] envs <- base::Sys.getenv() [18:41:20.118] names <- names(envs) [18:41:20.118] common <- intersect(names, old_names) [18:41:20.118] added <- setdiff(names, old_names) [18:41:20.118] removed <- setdiff(old_names, names) [18:41:20.118] changed <- common[...future.oldEnvVars[common] != [18:41:20.118] envs[common]] [18:41:20.118] NAMES <- toupper(changed) [18:41:20.118] args <- list() [18:41:20.118] for (kk in seq_along(NAMES)) { [18:41:20.118] name <- changed[[kk]] [18:41:20.118] NAME <- NAMES[[kk]] [18:41:20.118] if (name != NAME && is.element(NAME, old_names)) [18:41:20.118] next [18:41:20.118] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:20.118] } [18:41:20.118] NAMES <- toupper(added) [18:41:20.118] for (kk in seq_along(NAMES)) { [18:41:20.118] name <- added[[kk]] [18:41:20.118] NAME <- NAMES[[kk]] [18:41:20.118] if (name != NAME && is.element(NAME, old_names)) [18:41:20.118] next [18:41:20.118] args[[name]] <- "" [18:41:20.118] } [18:41:20.118] NAMES <- toupper(removed) [18:41:20.118] for (kk in seq_along(NAMES)) { [18:41:20.118] name <- removed[[kk]] [18:41:20.118] NAME <- NAMES[[kk]] [18:41:20.118] if (name != NAME && is.element(NAME, old_names)) [18:41:20.118] next [18:41:20.118] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:20.118] } [18:41:20.118] if (length(args) > 0) [18:41:20.118] base::do.call(base::Sys.setenv, args = args) [18:41:20.118] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:20.118] } [18:41:20.118] else { [18:41:20.118] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:20.118] } [18:41:20.118] { [18:41:20.118] if (base::length(...future.futureOptionsAdded) > [18:41:20.118] 0L) { [18:41:20.118] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:20.118] base::names(opts) <- ...future.futureOptionsAdded [18:41:20.118] base::options(opts) [18:41:20.118] } [18:41:20.118] { [18:41:20.118] { [18:41:20.118] NULL [18:41:20.118] RNGkind("Mersenne-Twister") [18:41:20.118] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:20.118] inherits = FALSE) [18:41:20.118] } [18:41:20.118] options(future.plan = NULL) [18:41:20.118] if (is.na(NA_character_)) [18:41:20.118] Sys.unsetenv("R_FUTURE_PLAN") [18:41:20.118] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:20.118] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:20.118] .init = FALSE) [18:41:20.118] } [18:41:20.118] } [18:41:20.118] } [18:41:20.118] }) [18:41:20.118] if (TRUE) { [18:41:20.118] base::sink(type = "output", split = FALSE) [18:41:20.118] if (TRUE) { [18:41:20.118] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:20.118] } [18:41:20.118] else { [18:41:20.118] ...future.result["stdout"] <- base::list(NULL) [18:41:20.118] } [18:41:20.118] base::close(...future.stdout) [18:41:20.118] ...future.stdout <- NULL [18:41:20.118] } [18:41:20.118] ...future.result$conditions <- ...future.conditions [18:41:20.118] ...future.result$finished <- base::Sys.time() [18:41:20.118] ...future.result [18:41:20.118] } [18:41:20.122] assign_globals() ... [18:41:20.122] List of 5 [18:41:20.122] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:20.122] $ future.call.arguments :List of 1 [18:41:20.122] ..$ length: int 2 [18:41:20.122] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:20.122] $ ...future.elements_ii :List of 1 [18:41:20.122] ..$ c: chr "character" [18:41:20.122] $ ...future.seeds_ii : NULL [18:41:20.122] $ ...future.globals.maxSize: NULL [18:41:20.122] - attr(*, "where")=List of 5 [18:41:20.122] ..$ ...future.FUN : [18:41:20.122] ..$ future.call.arguments : [18:41:20.122] ..$ ...future.elements_ii : [18:41:20.122] ..$ ...future.seeds_ii : [18:41:20.122] ..$ ...future.globals.maxSize: [18:41:20.122] - attr(*, "resolved")= logi FALSE [18:41:20.122] - attr(*, "total_size")= num 4324 [18:41:20.122] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:20.122] - attr(*, "already-done")= logi TRUE [18:41:20.128] - copied '...future.FUN' to environment [18:41:20.129] - copied 'future.call.arguments' to environment [18:41:20.129] - copied '...future.elements_ii' to environment [18:41:20.129] - copied '...future.seeds_ii' to environment [18:41:20.129] - copied '...future.globals.maxSize' to environment [18:41:20.129] assign_globals() ... done [18:41:20.130] plan(): Setting new future strategy stack: [18:41:20.130] List of future strategies: [18:41:20.130] 1. sequential: [18:41:20.130] - args: function (..., envir = parent.frame(), workers = "") [18:41:20.130] - tweaked: FALSE [18:41:20.130] - call: NULL [18:41:20.130] plan(): nbrOfWorkers() = 1 [18:41:20.132] plan(): Setting new future strategy stack: [18:41:20.132] List of future strategies: [18:41:20.132] 1. sequential: [18:41:20.132] - args: function (..., envir = parent.frame(), workers = "") [18:41:20.132] - tweaked: FALSE [18:41:20.132] - call: plan(strategy) [18:41:20.132] plan(): nbrOfWorkers() = 1 [18:41:20.133] SequentialFuture started (and completed) [18:41:20.133] - Launch lazy future ... done [18:41:20.133] run() for 'SequentialFuture' ... done [18:41:20.133] Created future: [18:41:20.133] SequentialFuture: [18:41:20.133] Label: 'future_lapply-3' [18:41:20.133] Expression: [18:41:20.133] { [18:41:20.133] do.call(function(...) { [18:41:20.133] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.133] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:20.133] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.133] on.exit(options(oopts), add = TRUE) [18:41:20.133] } [18:41:20.133] { [18:41:20.133] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:20.133] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.133] ...future.FUN(...future.X_jj, ...) [18:41:20.133] }) [18:41:20.133] } [18:41:20.133] }, args = future.call.arguments) [18:41:20.133] } [18:41:20.133] Lazy evaluation: FALSE [18:41:20.133] Asynchronous evaluation: FALSE [18:41:20.133] Local evaluation: TRUE [18:41:20.133] Environment: R_GlobalEnv [18:41:20.133] Capture standard output: TRUE [18:41:20.133] Capture condition classes: 'condition' (excluding 'nothing') [18:41:20.133] Globals: 5 objects totaling 760 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 98 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:20.133] Packages: [18:41:20.133] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:20.133] Resolved: TRUE [18:41:20.133] Value: 55 bytes of class 'list' [18:41:20.133] Early signaling: FALSE [18:41:20.133] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:20.133] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:20.134] Chunk #3 of 4 ... DONE [18:41:20.135] Chunk #4 of 4 ... [18:41:20.135] - Finding globals in 'X' for chunk #4 ... [18:41:20.135] getGlobalsAndPackages() ... [18:41:20.135] Searching for globals... [18:41:20.135] [18:41:20.136] Searching for globals ... DONE [18:41:20.136] - globals: [0] [18:41:20.136] getGlobalsAndPackages() ... DONE [18:41:20.136] + additional globals found: [n=0] [18:41:20.136] + additional namespaces needed: [n=0] [18:41:20.136] - Finding globals in 'X' for chunk #4 ... DONE [18:41:20.137] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:20.137] - seeds: [18:41:20.137] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.137] getGlobalsAndPackages() ... [18:41:20.137] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.137] Resolving globals: FALSE [18:41:20.138] Tweak future expression to call with '...' arguments ... [18:41:20.138] { [18:41:20.138] do.call(function(...) { [18:41:20.138] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.138] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:20.138] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.138] on.exit(options(oopts), add = TRUE) [18:41:20.138] } [18:41:20.138] { [18:41:20.138] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:20.138] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.138] ...future.FUN(...future.X_jj, ...) [18:41:20.138] }) [18:41:20.138] } [18:41:20.138] }, args = future.call.arguments) [18:41:20.138] } [18:41:20.138] Tweak future expression to call with '...' arguments ... DONE [18:41:20.139] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.139] [18:41:20.139] getGlobalsAndPackages() ... DONE [18:41:20.139] run() for 'Future' ... [18:41:20.139] - state: 'created' [18:41:20.140] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:20.140] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:20.140] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:20.140] - Field: 'label' [18:41:20.141] - Field: 'local' [18:41:20.141] - Field: 'owner' [18:41:20.141] - Field: 'envir' [18:41:20.141] - Field: 'packages' [18:41:20.141] - Field: 'gc' [18:41:20.141] - Field: 'conditions' [18:41:20.142] - Field: 'expr' [18:41:20.142] - Field: 'uuid' [18:41:20.142] - Field: 'seed' [18:41:20.142] - Field: 'version' [18:41:20.143] - Field: 'result' [18:41:20.143] - Field: 'asynchronous' [18:41:20.143] - Field: 'calls' [18:41:20.143] - Field: 'globals' [18:41:20.143] - Field: 'stdout' [18:41:20.143] - Field: 'earlySignal' [18:41:20.144] - Field: 'lazy' [18:41:20.144] - Field: 'state' [18:41:20.144] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:20.144] - Launch lazy future ... [18:41:20.144] Packages needed by the future expression (n = 0): [18:41:20.144] Packages needed by future strategies (n = 0): [18:41:20.145] { [18:41:20.145] { [18:41:20.145] { [18:41:20.145] ...future.startTime <- base::Sys.time() [18:41:20.145] { [18:41:20.145] { [18:41:20.145] { [18:41:20.145] base::local({ [18:41:20.145] has_future <- base::requireNamespace("future", [18:41:20.145] quietly = TRUE) [18:41:20.145] if (has_future) { [18:41:20.145] ns <- base::getNamespace("future") [18:41:20.145] version <- ns[[".package"]][["version"]] [18:41:20.145] if (is.null(version)) [18:41:20.145] version <- utils::packageVersion("future") [18:41:20.145] } [18:41:20.145] else { [18:41:20.145] version <- NULL [18:41:20.145] } [18:41:20.145] if (!has_future || version < "1.8.0") { [18:41:20.145] info <- base::c(r_version = base::gsub("R version ", [18:41:20.145] "", base::R.version$version.string), [18:41:20.145] platform = base::sprintf("%s (%s-bit)", [18:41:20.145] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:20.145] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:20.145] "release", "version")], collapse = " "), [18:41:20.145] hostname = base::Sys.info()[["nodename"]]) [18:41:20.145] info <- base::sprintf("%s: %s", base::names(info), [18:41:20.145] info) [18:41:20.145] info <- base::paste(info, collapse = "; ") [18:41:20.145] if (!has_future) { [18:41:20.145] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:20.145] info) [18:41:20.145] } [18:41:20.145] else { [18:41:20.145] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:20.145] info, version) [18:41:20.145] } [18:41:20.145] base::stop(msg) [18:41:20.145] } [18:41:20.145] }) [18:41:20.145] } [18:41:20.145] ...future.strategy.old <- future::plan("list") [18:41:20.145] options(future.plan = NULL) [18:41:20.145] Sys.unsetenv("R_FUTURE_PLAN") [18:41:20.145] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:20.145] } [18:41:20.145] ...future.workdir <- getwd() [18:41:20.145] } [18:41:20.145] ...future.oldOptions <- base::as.list(base::.Options) [18:41:20.145] ...future.oldEnvVars <- base::Sys.getenv() [18:41:20.145] } [18:41:20.145] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:20.145] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:20.145] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:20.145] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:20.145] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:20.145] future.stdout.windows.reencode = NULL, width = 80L) [18:41:20.145] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:20.145] base::names(...future.oldOptions)) [18:41:20.145] } [18:41:20.145] if (FALSE) { [18:41:20.145] } [18:41:20.145] else { [18:41:20.145] if (TRUE) { [18:41:20.145] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:20.145] open = "w") [18:41:20.145] } [18:41:20.145] else { [18:41:20.145] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:20.145] windows = "NUL", "/dev/null"), open = "w") [18:41:20.145] } [18:41:20.145] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:20.145] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:20.145] base::sink(type = "output", split = FALSE) [18:41:20.145] base::close(...future.stdout) [18:41:20.145] }, add = TRUE) [18:41:20.145] } [18:41:20.145] ...future.frame <- base::sys.nframe() [18:41:20.145] ...future.conditions <- base::list() [18:41:20.145] ...future.rng <- base::globalenv()$.Random.seed [18:41:20.145] if (FALSE) { [18:41:20.145] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:20.145] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:20.145] } [18:41:20.145] ...future.result <- base::tryCatch({ [18:41:20.145] base::withCallingHandlers({ [18:41:20.145] ...future.value <- base::withVisible(base::local({ [18:41:20.145] do.call(function(...) { [18:41:20.145] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.145] if (!identical(...future.globals.maxSize.org, [18:41:20.145] ...future.globals.maxSize)) { [18:41:20.145] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.145] on.exit(options(oopts), add = TRUE) [18:41:20.145] } [18:41:20.145] { [18:41:20.145] lapply(seq_along(...future.elements_ii), [18:41:20.145] FUN = function(jj) { [18:41:20.145] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.145] ...future.FUN(...future.X_jj, ...) [18:41:20.145] }) [18:41:20.145] } [18:41:20.145] }, args = future.call.arguments) [18:41:20.145] })) [18:41:20.145] future::FutureResult(value = ...future.value$value, [18:41:20.145] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:20.145] ...future.rng), globalenv = if (FALSE) [18:41:20.145] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:20.145] ...future.globalenv.names)) [18:41:20.145] else NULL, started = ...future.startTime, version = "1.8") [18:41:20.145] }, condition = base::local({ [18:41:20.145] c <- base::c [18:41:20.145] inherits <- base::inherits [18:41:20.145] invokeRestart <- base::invokeRestart [18:41:20.145] length <- base::length [18:41:20.145] list <- base::list [18:41:20.145] seq.int <- base::seq.int [18:41:20.145] signalCondition <- base::signalCondition [18:41:20.145] sys.calls <- base::sys.calls [18:41:20.145] `[[` <- base::`[[` [18:41:20.145] `+` <- base::`+` [18:41:20.145] `<<-` <- base::`<<-` [18:41:20.145] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:20.145] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:20.145] 3L)] [18:41:20.145] } [18:41:20.145] function(cond) { [18:41:20.145] is_error <- inherits(cond, "error") [18:41:20.145] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:20.145] NULL) [18:41:20.145] if (is_error) { [18:41:20.145] sessionInformation <- function() { [18:41:20.145] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:20.145] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:20.145] search = base::search(), system = base::Sys.info()) [18:41:20.145] } [18:41:20.145] ...future.conditions[[length(...future.conditions) + [18:41:20.145] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:20.145] cond$call), session = sessionInformation(), [18:41:20.145] timestamp = base::Sys.time(), signaled = 0L) [18:41:20.145] signalCondition(cond) [18:41:20.145] } [18:41:20.145] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:20.145] "immediateCondition"))) { [18:41:20.145] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:20.145] ...future.conditions[[length(...future.conditions) + [18:41:20.145] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:20.145] if (TRUE && !signal) { [18:41:20.145] muffleCondition <- function (cond, pattern = "^muffle") [18:41:20.145] { [18:41:20.145] inherits <- base::inherits [18:41:20.145] invokeRestart <- base::invokeRestart [18:41:20.145] is.null <- base::is.null [18:41:20.145] muffled <- FALSE [18:41:20.145] if (inherits(cond, "message")) { [18:41:20.145] muffled <- grepl(pattern, "muffleMessage") [18:41:20.145] if (muffled) [18:41:20.145] invokeRestart("muffleMessage") [18:41:20.145] } [18:41:20.145] else if (inherits(cond, "warning")) { [18:41:20.145] muffled <- grepl(pattern, "muffleWarning") [18:41:20.145] if (muffled) [18:41:20.145] invokeRestart("muffleWarning") [18:41:20.145] } [18:41:20.145] else if (inherits(cond, "condition")) { [18:41:20.145] if (!is.null(pattern)) { [18:41:20.145] computeRestarts <- base::computeRestarts [18:41:20.145] grepl <- base::grepl [18:41:20.145] restarts <- computeRestarts(cond) [18:41:20.145] for (restart in restarts) { [18:41:20.145] name <- restart$name [18:41:20.145] if (is.null(name)) [18:41:20.145] next [18:41:20.145] if (!grepl(pattern, name)) [18:41:20.145] next [18:41:20.145] invokeRestart(restart) [18:41:20.145] muffled <- TRUE [18:41:20.145] break [18:41:20.145] } [18:41:20.145] } [18:41:20.145] } [18:41:20.145] invisible(muffled) [18:41:20.145] } [18:41:20.145] muffleCondition(cond, pattern = "^muffle") [18:41:20.145] } [18:41:20.145] } [18:41:20.145] else { [18:41:20.145] if (TRUE) { [18:41:20.145] muffleCondition <- function (cond, pattern = "^muffle") [18:41:20.145] { [18:41:20.145] inherits <- base::inherits [18:41:20.145] invokeRestart <- base::invokeRestart [18:41:20.145] is.null <- base::is.null [18:41:20.145] muffled <- FALSE [18:41:20.145] if (inherits(cond, "message")) { [18:41:20.145] muffled <- grepl(pattern, "muffleMessage") [18:41:20.145] if (muffled) [18:41:20.145] invokeRestart("muffleMessage") [18:41:20.145] } [18:41:20.145] else if (inherits(cond, "warning")) { [18:41:20.145] muffled <- grepl(pattern, "muffleWarning") [18:41:20.145] if (muffled) [18:41:20.145] invokeRestart("muffleWarning") [18:41:20.145] } [18:41:20.145] else if (inherits(cond, "condition")) { [18:41:20.145] if (!is.null(pattern)) { [18:41:20.145] computeRestarts <- base::computeRestarts [18:41:20.145] grepl <- base::grepl [18:41:20.145] restarts <- computeRestarts(cond) [18:41:20.145] for (restart in restarts) { [18:41:20.145] name <- restart$name [18:41:20.145] if (is.null(name)) [18:41:20.145] next [18:41:20.145] if (!grepl(pattern, name)) [18:41:20.145] next [18:41:20.145] invokeRestart(restart) [18:41:20.145] muffled <- TRUE [18:41:20.145] break [18:41:20.145] } [18:41:20.145] } [18:41:20.145] } [18:41:20.145] invisible(muffled) [18:41:20.145] } [18:41:20.145] muffleCondition(cond, pattern = "^muffle") [18:41:20.145] } [18:41:20.145] } [18:41:20.145] } [18:41:20.145] })) [18:41:20.145] }, error = function(ex) { [18:41:20.145] base::structure(base::list(value = NULL, visible = NULL, [18:41:20.145] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:20.145] ...future.rng), started = ...future.startTime, [18:41:20.145] finished = Sys.time(), session_uuid = NA_character_, [18:41:20.145] version = "1.8"), class = "FutureResult") [18:41:20.145] }, finally = { [18:41:20.145] if (!identical(...future.workdir, getwd())) [18:41:20.145] setwd(...future.workdir) [18:41:20.145] { [18:41:20.145] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:20.145] ...future.oldOptions$nwarnings <- NULL [18:41:20.145] } [18:41:20.145] base::options(...future.oldOptions) [18:41:20.145] if (.Platform$OS.type == "windows") { [18:41:20.145] old_names <- names(...future.oldEnvVars) [18:41:20.145] envs <- base::Sys.getenv() [18:41:20.145] names <- names(envs) [18:41:20.145] common <- intersect(names, old_names) [18:41:20.145] added <- setdiff(names, old_names) [18:41:20.145] removed <- setdiff(old_names, names) [18:41:20.145] changed <- common[...future.oldEnvVars[common] != [18:41:20.145] envs[common]] [18:41:20.145] NAMES <- toupper(changed) [18:41:20.145] args <- list() [18:41:20.145] for (kk in seq_along(NAMES)) { [18:41:20.145] name <- changed[[kk]] [18:41:20.145] NAME <- NAMES[[kk]] [18:41:20.145] if (name != NAME && is.element(NAME, old_names)) [18:41:20.145] next [18:41:20.145] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:20.145] } [18:41:20.145] NAMES <- toupper(added) [18:41:20.145] for (kk in seq_along(NAMES)) { [18:41:20.145] name <- added[[kk]] [18:41:20.145] NAME <- NAMES[[kk]] [18:41:20.145] if (name != NAME && is.element(NAME, old_names)) [18:41:20.145] next [18:41:20.145] args[[name]] <- "" [18:41:20.145] } [18:41:20.145] NAMES <- toupper(removed) [18:41:20.145] for (kk in seq_along(NAMES)) { [18:41:20.145] name <- removed[[kk]] [18:41:20.145] NAME <- NAMES[[kk]] [18:41:20.145] if (name != NAME && is.element(NAME, old_names)) [18:41:20.145] next [18:41:20.145] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:20.145] } [18:41:20.145] if (length(args) > 0) [18:41:20.145] base::do.call(base::Sys.setenv, args = args) [18:41:20.145] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:20.145] } [18:41:20.145] else { [18:41:20.145] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:20.145] } [18:41:20.145] { [18:41:20.145] if (base::length(...future.futureOptionsAdded) > [18:41:20.145] 0L) { [18:41:20.145] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:20.145] base::names(opts) <- ...future.futureOptionsAdded [18:41:20.145] base::options(opts) [18:41:20.145] } [18:41:20.145] { [18:41:20.145] { [18:41:20.145] NULL [18:41:20.145] RNGkind("Mersenne-Twister") [18:41:20.145] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:20.145] inherits = FALSE) [18:41:20.145] } [18:41:20.145] options(future.plan = NULL) [18:41:20.145] if (is.na(NA_character_)) [18:41:20.145] Sys.unsetenv("R_FUTURE_PLAN") [18:41:20.145] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:20.145] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:20.145] .init = FALSE) [18:41:20.145] } [18:41:20.145] } [18:41:20.145] } [18:41:20.145] }) [18:41:20.145] if (TRUE) { [18:41:20.145] base::sink(type = "output", split = FALSE) [18:41:20.145] if (TRUE) { [18:41:20.145] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:20.145] } [18:41:20.145] else { [18:41:20.145] ...future.result["stdout"] <- base::list(NULL) [18:41:20.145] } [18:41:20.145] base::close(...future.stdout) [18:41:20.145] ...future.stdout <- NULL [18:41:20.145] } [18:41:20.145] ...future.result$conditions <- ...future.conditions [18:41:20.145] ...future.result$finished <- base::Sys.time() [18:41:20.145] ...future.result [18:41:20.145] } [18:41:20.149] assign_globals() ... [18:41:20.149] List of 5 [18:41:20.149] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:20.149] $ future.call.arguments :List of 1 [18:41:20.149] ..$ length: int 2 [18:41:20.149] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:20.149] $ ...future.elements_ii :List of 1 [18:41:20.149] ..$ c: chr "list" [18:41:20.149] $ ...future.seeds_ii : NULL [18:41:20.149] $ ...future.globals.maxSize: NULL [18:41:20.149] - attr(*, "where")=List of 5 [18:41:20.149] ..$ ...future.FUN : [18:41:20.149] ..$ future.call.arguments : [18:41:20.149] ..$ ...future.elements_ii : [18:41:20.149] ..$ ...future.seeds_ii : [18:41:20.149] ..$ ...future.globals.maxSize: [18:41:20.149] - attr(*, "resolved")= logi FALSE [18:41:20.149] - attr(*, "total_size")= num 4324 [18:41:20.149] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:20.149] - attr(*, "already-done")= logi TRUE [18:41:20.155] - copied '...future.FUN' to environment [18:41:20.155] - copied 'future.call.arguments' to environment [18:41:20.155] - copied '...future.elements_ii' to environment [18:41:20.156] - copied '...future.seeds_ii' to environment [18:41:20.156] - copied '...future.globals.maxSize' to environment [18:41:20.156] assign_globals() ... done [18:41:20.156] plan(): Setting new future strategy stack: [18:41:20.157] List of future strategies: [18:41:20.157] 1. sequential: [18:41:20.157] - args: function (..., envir = parent.frame(), workers = "") [18:41:20.157] - tweaked: FALSE [18:41:20.157] - call: NULL [18:41:20.157] plan(): nbrOfWorkers() = 1 [18:41:20.158] plan(): Setting new future strategy stack: [18:41:20.159] List of future strategies: [18:41:20.159] 1. sequential: [18:41:20.159] - args: function (..., envir = parent.frame(), workers = "") [18:41:20.159] - tweaked: FALSE [18:41:20.159] - call: plan(strategy) [18:41:20.159] plan(): nbrOfWorkers() = 1 [18:41:20.159] SequentialFuture started (and completed) [18:41:20.160] - Launch lazy future ... done [18:41:20.160] run() for 'SequentialFuture' ... done [18:41:20.160] Created future: [18:41:20.160] SequentialFuture: [18:41:20.160] Label: 'future_lapply-4' [18:41:20.160] Expression: [18:41:20.160] { [18:41:20.160] do.call(function(...) { [18:41:20.160] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.160] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:20.160] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.160] on.exit(options(oopts), add = TRUE) [18:41:20.160] } [18:41:20.160] { [18:41:20.160] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:20.160] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.160] ...future.FUN(...future.X_jj, ...) [18:41:20.160] }) [18:41:20.160] } [18:41:20.160] }, args = future.call.arguments) [18:41:20.160] } [18:41:20.160] Lazy evaluation: FALSE [18:41:20.160] Asynchronous evaluation: FALSE [18:41:20.160] Local evaluation: TRUE [18:41:20.160] Environment: R_GlobalEnv [18:41:20.160] Capture standard output: TRUE [18:41:20.160] Capture condition classes: 'condition' (excluding 'nothing') [18:41:20.160] Globals: 5 objects totaling 755 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 93 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:20.160] Packages: [18:41:20.160] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:20.160] Resolved: TRUE [18:41:20.160] Value: 47 bytes of class 'list' [18:41:20.160] Early signaling: FALSE [18:41:20.160] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:20.160] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:20.161] Chunk #4 of 4 ... DONE [18:41:20.161] Launching 4 futures (chunks) ... DONE [18:41:20.162] Resolving 4 futures (chunks) ... [18:41:20.162] resolve() on list ... [18:41:20.162] recursive: 0 [18:41:20.162] length: 4 [18:41:20.162] [18:41:20.162] resolved() for 'SequentialFuture' ... [18:41:20.163] - state: 'finished' [18:41:20.163] - run: TRUE [18:41:20.163] - result: 'FutureResult' [18:41:20.163] resolved() for 'SequentialFuture' ... done [18:41:20.163] Future #1 [18:41:20.164] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:20.164] - nx: 4 [18:41:20.164] - relay: TRUE [18:41:20.164] - stdout: TRUE [18:41:20.164] - signal: TRUE [18:41:20.164] - resignal: FALSE [18:41:20.164] - force: TRUE [18:41:20.165] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [18:41:20.165] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:41:20.165] - until=1 [18:41:20.165] - relaying element #1 [18:41:20.165] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:20.166] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:20.166] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:20.166] length: 3 (resolved future 1) [18:41:20.166] resolved() for 'SequentialFuture' ... [18:41:20.166] - state: 'finished' [18:41:20.166] - run: TRUE [18:41:20.167] - result: 'FutureResult' [18:41:20.167] resolved() for 'SequentialFuture' ... done [18:41:20.167] Future #2 [18:41:20.167] signalConditionsASAP(SequentialFuture, pos=2) ... [18:41:20.167] - nx: 4 [18:41:20.168] - relay: TRUE [18:41:20.168] - stdout: TRUE [18:41:20.168] - signal: TRUE [18:41:20.168] - resignal: FALSE [18:41:20.168] - force: TRUE [18:41:20.168] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:20.168] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:20.169] - until=2 [18:41:20.169] - relaying element #2 [18:41:20.169] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:20.169] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:20.169] signalConditionsASAP(SequentialFuture, pos=2) ... done [18:41:20.170] length: 2 (resolved future 2) [18:41:20.170] resolved() for 'SequentialFuture' ... [18:41:20.170] - state: 'finished' [18:41:20.170] - run: TRUE [18:41:20.170] - result: 'FutureResult' [18:41:20.170] resolved() for 'SequentialFuture' ... done [18:41:20.171] Future #3 [18:41:20.171] signalConditionsASAP(SequentialFuture, pos=3) ... [18:41:20.171] - nx: 4 [18:41:20.171] - relay: TRUE [18:41:20.171] - stdout: TRUE [18:41:20.171] - signal: TRUE [18:41:20.172] - resignal: FALSE [18:41:20.172] - force: TRUE [18:41:20.172] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:20.172] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:20.172] - until=3 [18:41:20.172] - relaying element #3 [18:41:20.173] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:20.173] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:20.173] signalConditionsASAP(SequentialFuture, pos=3) ... done [18:41:20.173] length: 1 (resolved future 3) [18:41:20.173] resolved() for 'SequentialFuture' ... [18:41:20.174] - state: 'finished' [18:41:20.174] - run: TRUE [18:41:20.174] - result: 'FutureResult' [18:41:20.174] resolved() for 'SequentialFuture' ... done [18:41:20.174] Future #4 [18:41:20.175] signalConditionsASAP(SequentialFuture, pos=4) ... [18:41:20.175] - nx: 4 [18:41:20.175] - relay: TRUE [18:41:20.175] - stdout: TRUE [18:41:20.175] - signal: TRUE [18:41:20.175] - resignal: FALSE [18:41:20.175] - force: TRUE [18:41:20.176] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:20.176] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:20.176] - until=4 [18:41:20.176] - relaying element #4 [18:41:20.176] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:20.176] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:20.177] signalConditionsASAP(SequentialFuture, pos=4) ... done [18:41:20.177] length: 0 (resolved future 4) [18:41:20.177] Relaying remaining futures [18:41:20.177] signalConditionsASAP(NULL, pos=0) ... [18:41:20.177] - nx: 4 [18:41:20.180] - relay: TRUE [18:41:20.180] - stdout: TRUE [18:41:20.180] - signal: TRUE [18:41:20.181] - resignal: FALSE [18:41:20.181] - force: TRUE [18:41:20.181] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:20.181] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [18:41:20.181] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:20.181] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:20.182] signalConditionsASAP(NULL, pos=0) ... done [18:41:20.182] resolve() on list ... DONE [18:41:20.182] - Number of value chunks collected: 4 [18:41:20.182] Resolving 4 futures (chunks) ... DONE [18:41:20.182] Reducing values from 4 chunks ... [18:41:20.183] - Number of values collected after concatenation: 4 [18:41:20.183] - Number of values expected: 4 [18:41:20.183] Reducing values from 4 chunks ... DONE [18:41:20.183] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL - future_lapply(x, FUN = base::vector, ...) ... [18:41:20.186] future_lapply() ... [18:41:20.187] Number of chunks: 4 [18:41:20.187] getGlobalsAndPackagesXApply() ... [18:41:20.187] - future.globals: TRUE [18:41:20.187] getGlobalsAndPackages() ... [18:41:20.187] Searching for globals... [18:41:20.189] - globals found: [2] 'FUN', '.Internal' [18:41:20.189] Searching for globals ... DONE [18:41:20.189] Resolving globals: FALSE [18:41:20.190] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:20.190] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:20.190] - globals: [1] 'FUN' [18:41:20.191] [18:41:20.191] getGlobalsAndPackages() ... DONE [18:41:20.191] - globals found/used: [n=1] 'FUN' [18:41:20.191] - needed namespaces: [n=0] [18:41:20.191] Finding globals ... DONE [18:41:20.191] - use_args: TRUE [18:41:20.192] - Getting '...' globals ... [18:41:20.192] resolve() on list ... [18:41:20.192] recursive: 0 [18:41:20.192] length: 1 [18:41:20.192] elements: '...' [18:41:20.193] length: 0 (resolved future 1) [18:41:20.193] resolve() on list ... DONE [18:41:20.193] - '...' content: [n=1] 'length' [18:41:20.193] List of 1 [18:41:20.193] $ ...:List of 1 [18:41:20.193] ..$ length: int 2 [18:41:20.193] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:20.193] - attr(*, "where")=List of 1 [18:41:20.193] ..$ ...: [18:41:20.193] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:20.193] - attr(*, "resolved")= logi TRUE [18:41:20.193] - attr(*, "total_size")= num NA [18:41:20.197] - Getting '...' globals ... DONE [18:41:20.197] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:20.197] List of 2 [18:41:20.197] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:20.197] $ ... :List of 1 [18:41:20.197] ..$ length: int 2 [18:41:20.197] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:20.197] - attr(*, "where")=List of 2 [18:41:20.197] ..$ ...future.FUN: [18:41:20.197] ..$ ... : [18:41:20.197] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:20.197] - attr(*, "resolved")= logi FALSE [18:41:20.197] - attr(*, "total_size")= int 4406 [18:41:20.201] Packages to be attached in all futures: [n=0] [18:41:20.201] getGlobalsAndPackagesXApply() ... DONE [18:41:20.201] Number of futures (= number of chunks): 4 [18:41:20.201] Launching 4 futures (chunks) ... [18:41:20.202] Chunk #1 of 4 ... [18:41:20.202] - Finding globals in 'X' for chunk #1 ... [18:41:20.202] getGlobalsAndPackages() ... [18:41:20.202] Searching for globals... [18:41:20.202] [18:41:20.203] Searching for globals ... DONE [18:41:20.203] - globals: [0] [18:41:20.203] getGlobalsAndPackages() ... DONE [18:41:20.203] + additional globals found: [n=0] [18:41:20.203] + additional namespaces needed: [n=0] [18:41:20.203] - Finding globals in 'X' for chunk #1 ... DONE [18:41:20.204] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:20.204] - seeds: [18:41:20.204] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.204] getGlobalsAndPackages() ... [18:41:20.204] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.204] Resolving globals: FALSE [18:41:20.205] Tweak future expression to call with '...' arguments ... [18:41:20.205] { [18:41:20.205] do.call(function(...) { [18:41:20.205] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.205] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:20.205] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.205] on.exit(options(oopts), add = TRUE) [18:41:20.205] } [18:41:20.205] { [18:41:20.205] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:20.205] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.205] ...future.FUN(...future.X_jj, ...) [18:41:20.205] }) [18:41:20.205] } [18:41:20.205] }, args = future.call.arguments) [18:41:20.205] } [18:41:20.205] Tweak future expression to call with '...' arguments ... DONE [18:41:20.206] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.206] [18:41:20.206] getGlobalsAndPackages() ... DONE [18:41:20.206] run() for 'Future' ... [18:41:20.207] - state: 'created' [18:41:20.207] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:20.207] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:20.207] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:20.208] - Field: 'label' [18:41:20.208] - Field: 'local' [18:41:20.208] - Field: 'owner' [18:41:20.208] - Field: 'envir' [18:41:20.208] - Field: 'packages' [18:41:20.208] - Field: 'gc' [18:41:20.209] - Field: 'conditions' [18:41:20.209] - Field: 'expr' [18:41:20.209] - Field: 'uuid' [18:41:20.209] - Field: 'seed' [18:41:20.209] - Field: 'version' [18:41:20.209] - Field: 'result' [18:41:20.210] - Field: 'asynchronous' [18:41:20.210] - Field: 'calls' [18:41:20.210] - Field: 'globals' [18:41:20.210] - Field: 'stdout' [18:41:20.210] - Field: 'earlySignal' [18:41:20.210] - Field: 'lazy' [18:41:20.211] - Field: 'state' [18:41:20.211] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:20.211] - Launch lazy future ... [18:41:20.211] Packages needed by the future expression (n = 0): [18:41:20.211] Packages needed by future strategies (n = 0): [18:41:20.212] { [18:41:20.212] { [18:41:20.212] { [18:41:20.212] ...future.startTime <- base::Sys.time() [18:41:20.212] { [18:41:20.212] { [18:41:20.212] { [18:41:20.212] base::local({ [18:41:20.212] has_future <- base::requireNamespace("future", [18:41:20.212] quietly = TRUE) [18:41:20.212] if (has_future) { [18:41:20.212] ns <- base::getNamespace("future") [18:41:20.212] version <- ns[[".package"]][["version"]] [18:41:20.212] if (is.null(version)) [18:41:20.212] version <- utils::packageVersion("future") [18:41:20.212] } [18:41:20.212] else { [18:41:20.212] version <- NULL [18:41:20.212] } [18:41:20.212] if (!has_future || version < "1.8.0") { [18:41:20.212] info <- base::c(r_version = base::gsub("R version ", [18:41:20.212] "", base::R.version$version.string), [18:41:20.212] platform = base::sprintf("%s (%s-bit)", [18:41:20.212] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:20.212] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:20.212] "release", "version")], collapse = " "), [18:41:20.212] hostname = base::Sys.info()[["nodename"]]) [18:41:20.212] info <- base::sprintf("%s: %s", base::names(info), [18:41:20.212] info) [18:41:20.212] info <- base::paste(info, collapse = "; ") [18:41:20.212] if (!has_future) { [18:41:20.212] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:20.212] info) [18:41:20.212] } [18:41:20.212] else { [18:41:20.212] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:20.212] info, version) [18:41:20.212] } [18:41:20.212] base::stop(msg) [18:41:20.212] } [18:41:20.212] }) [18:41:20.212] } [18:41:20.212] ...future.strategy.old <- future::plan("list") [18:41:20.212] options(future.plan = NULL) [18:41:20.212] Sys.unsetenv("R_FUTURE_PLAN") [18:41:20.212] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:20.212] } [18:41:20.212] ...future.workdir <- getwd() [18:41:20.212] } [18:41:20.212] ...future.oldOptions <- base::as.list(base::.Options) [18:41:20.212] ...future.oldEnvVars <- base::Sys.getenv() [18:41:20.212] } [18:41:20.212] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:20.212] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:20.212] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:20.212] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:20.212] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:20.212] future.stdout.windows.reencode = NULL, width = 80L) [18:41:20.212] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:20.212] base::names(...future.oldOptions)) [18:41:20.212] } [18:41:20.212] if (FALSE) { [18:41:20.212] } [18:41:20.212] else { [18:41:20.212] if (TRUE) { [18:41:20.212] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:20.212] open = "w") [18:41:20.212] } [18:41:20.212] else { [18:41:20.212] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:20.212] windows = "NUL", "/dev/null"), open = "w") [18:41:20.212] } [18:41:20.212] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:20.212] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:20.212] base::sink(type = "output", split = FALSE) [18:41:20.212] base::close(...future.stdout) [18:41:20.212] }, add = TRUE) [18:41:20.212] } [18:41:20.212] ...future.frame <- base::sys.nframe() [18:41:20.212] ...future.conditions <- base::list() [18:41:20.212] ...future.rng <- base::globalenv()$.Random.seed [18:41:20.212] if (FALSE) { [18:41:20.212] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:20.212] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:20.212] } [18:41:20.212] ...future.result <- base::tryCatch({ [18:41:20.212] base::withCallingHandlers({ [18:41:20.212] ...future.value <- base::withVisible(base::local({ [18:41:20.212] do.call(function(...) { [18:41:20.212] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.212] if (!identical(...future.globals.maxSize.org, [18:41:20.212] ...future.globals.maxSize)) { [18:41:20.212] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.212] on.exit(options(oopts), add = TRUE) [18:41:20.212] } [18:41:20.212] { [18:41:20.212] lapply(seq_along(...future.elements_ii), [18:41:20.212] FUN = function(jj) { [18:41:20.212] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.212] ...future.FUN(...future.X_jj, ...) [18:41:20.212] }) [18:41:20.212] } [18:41:20.212] }, args = future.call.arguments) [18:41:20.212] })) [18:41:20.212] future::FutureResult(value = ...future.value$value, [18:41:20.212] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:20.212] ...future.rng), globalenv = if (FALSE) [18:41:20.212] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:20.212] ...future.globalenv.names)) [18:41:20.212] else NULL, started = ...future.startTime, version = "1.8") [18:41:20.212] }, condition = base::local({ [18:41:20.212] c <- base::c [18:41:20.212] inherits <- base::inherits [18:41:20.212] invokeRestart <- base::invokeRestart [18:41:20.212] length <- base::length [18:41:20.212] list <- base::list [18:41:20.212] seq.int <- base::seq.int [18:41:20.212] signalCondition <- base::signalCondition [18:41:20.212] sys.calls <- base::sys.calls [18:41:20.212] `[[` <- base::`[[` [18:41:20.212] `+` <- base::`+` [18:41:20.212] `<<-` <- base::`<<-` [18:41:20.212] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:20.212] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:20.212] 3L)] [18:41:20.212] } [18:41:20.212] function(cond) { [18:41:20.212] is_error <- inherits(cond, "error") [18:41:20.212] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:20.212] NULL) [18:41:20.212] if (is_error) { [18:41:20.212] sessionInformation <- function() { [18:41:20.212] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:20.212] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:20.212] search = base::search(), system = base::Sys.info()) [18:41:20.212] } [18:41:20.212] ...future.conditions[[length(...future.conditions) + [18:41:20.212] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:20.212] cond$call), session = sessionInformation(), [18:41:20.212] timestamp = base::Sys.time(), signaled = 0L) [18:41:20.212] signalCondition(cond) [18:41:20.212] } [18:41:20.212] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:20.212] "immediateCondition"))) { [18:41:20.212] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:20.212] ...future.conditions[[length(...future.conditions) + [18:41:20.212] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:20.212] if (TRUE && !signal) { [18:41:20.212] muffleCondition <- function (cond, pattern = "^muffle") [18:41:20.212] { [18:41:20.212] inherits <- base::inherits [18:41:20.212] invokeRestart <- base::invokeRestart [18:41:20.212] is.null <- base::is.null [18:41:20.212] muffled <- FALSE [18:41:20.212] if (inherits(cond, "message")) { [18:41:20.212] muffled <- grepl(pattern, "muffleMessage") [18:41:20.212] if (muffled) [18:41:20.212] invokeRestart("muffleMessage") [18:41:20.212] } [18:41:20.212] else if (inherits(cond, "warning")) { [18:41:20.212] muffled <- grepl(pattern, "muffleWarning") [18:41:20.212] if (muffled) [18:41:20.212] invokeRestart("muffleWarning") [18:41:20.212] } [18:41:20.212] else if (inherits(cond, "condition")) { [18:41:20.212] if (!is.null(pattern)) { [18:41:20.212] computeRestarts <- base::computeRestarts [18:41:20.212] grepl <- base::grepl [18:41:20.212] restarts <- computeRestarts(cond) [18:41:20.212] for (restart in restarts) { [18:41:20.212] name <- restart$name [18:41:20.212] if (is.null(name)) [18:41:20.212] next [18:41:20.212] if (!grepl(pattern, name)) [18:41:20.212] next [18:41:20.212] invokeRestart(restart) [18:41:20.212] muffled <- TRUE [18:41:20.212] break [18:41:20.212] } [18:41:20.212] } [18:41:20.212] } [18:41:20.212] invisible(muffled) [18:41:20.212] } [18:41:20.212] muffleCondition(cond, pattern = "^muffle") [18:41:20.212] } [18:41:20.212] } [18:41:20.212] else { [18:41:20.212] if (TRUE) { [18:41:20.212] muffleCondition <- function (cond, pattern = "^muffle") [18:41:20.212] { [18:41:20.212] inherits <- base::inherits [18:41:20.212] invokeRestart <- base::invokeRestart [18:41:20.212] is.null <- base::is.null [18:41:20.212] muffled <- FALSE [18:41:20.212] if (inherits(cond, "message")) { [18:41:20.212] muffled <- grepl(pattern, "muffleMessage") [18:41:20.212] if (muffled) [18:41:20.212] invokeRestart("muffleMessage") [18:41:20.212] } [18:41:20.212] else if (inherits(cond, "warning")) { [18:41:20.212] muffled <- grepl(pattern, "muffleWarning") [18:41:20.212] if (muffled) [18:41:20.212] invokeRestart("muffleWarning") [18:41:20.212] } [18:41:20.212] else if (inherits(cond, "condition")) { [18:41:20.212] if (!is.null(pattern)) { [18:41:20.212] computeRestarts <- base::computeRestarts [18:41:20.212] grepl <- base::grepl [18:41:20.212] restarts <- computeRestarts(cond) [18:41:20.212] for (restart in restarts) { [18:41:20.212] name <- restart$name [18:41:20.212] if (is.null(name)) [18:41:20.212] next [18:41:20.212] if (!grepl(pattern, name)) [18:41:20.212] next [18:41:20.212] invokeRestart(restart) [18:41:20.212] muffled <- TRUE [18:41:20.212] break [18:41:20.212] } [18:41:20.212] } [18:41:20.212] } [18:41:20.212] invisible(muffled) [18:41:20.212] } [18:41:20.212] muffleCondition(cond, pattern = "^muffle") [18:41:20.212] } [18:41:20.212] } [18:41:20.212] } [18:41:20.212] })) [18:41:20.212] }, error = function(ex) { [18:41:20.212] base::structure(base::list(value = NULL, visible = NULL, [18:41:20.212] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:20.212] ...future.rng), started = ...future.startTime, [18:41:20.212] finished = Sys.time(), session_uuid = NA_character_, [18:41:20.212] version = "1.8"), class = "FutureResult") [18:41:20.212] }, finally = { [18:41:20.212] if (!identical(...future.workdir, getwd())) [18:41:20.212] setwd(...future.workdir) [18:41:20.212] { [18:41:20.212] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:20.212] ...future.oldOptions$nwarnings <- NULL [18:41:20.212] } [18:41:20.212] base::options(...future.oldOptions) [18:41:20.212] if (.Platform$OS.type == "windows") { [18:41:20.212] old_names <- names(...future.oldEnvVars) [18:41:20.212] envs <- base::Sys.getenv() [18:41:20.212] names <- names(envs) [18:41:20.212] common <- intersect(names, old_names) [18:41:20.212] added <- setdiff(names, old_names) [18:41:20.212] removed <- setdiff(old_names, names) [18:41:20.212] changed <- common[...future.oldEnvVars[common] != [18:41:20.212] envs[common]] [18:41:20.212] NAMES <- toupper(changed) [18:41:20.212] args <- list() [18:41:20.212] for (kk in seq_along(NAMES)) { [18:41:20.212] name <- changed[[kk]] [18:41:20.212] NAME <- NAMES[[kk]] [18:41:20.212] if (name != NAME && is.element(NAME, old_names)) [18:41:20.212] next [18:41:20.212] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:20.212] } [18:41:20.212] NAMES <- toupper(added) [18:41:20.212] for (kk in seq_along(NAMES)) { [18:41:20.212] name <- added[[kk]] [18:41:20.212] NAME <- NAMES[[kk]] [18:41:20.212] if (name != NAME && is.element(NAME, old_names)) [18:41:20.212] next [18:41:20.212] args[[name]] <- "" [18:41:20.212] } [18:41:20.212] NAMES <- toupper(removed) [18:41:20.212] for (kk in seq_along(NAMES)) { [18:41:20.212] name <- removed[[kk]] [18:41:20.212] NAME <- NAMES[[kk]] [18:41:20.212] if (name != NAME && is.element(NAME, old_names)) [18:41:20.212] next [18:41:20.212] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:20.212] } [18:41:20.212] if (length(args) > 0) [18:41:20.212] base::do.call(base::Sys.setenv, args = args) [18:41:20.212] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:20.212] } [18:41:20.212] else { [18:41:20.212] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:20.212] } [18:41:20.212] { [18:41:20.212] if (base::length(...future.futureOptionsAdded) > [18:41:20.212] 0L) { [18:41:20.212] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:20.212] base::names(opts) <- ...future.futureOptionsAdded [18:41:20.212] base::options(opts) [18:41:20.212] } [18:41:20.212] { [18:41:20.212] { [18:41:20.212] NULL [18:41:20.212] RNGkind("Mersenne-Twister") [18:41:20.212] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:20.212] inherits = FALSE) [18:41:20.212] } [18:41:20.212] options(future.plan = NULL) [18:41:20.212] if (is.na(NA_character_)) [18:41:20.212] Sys.unsetenv("R_FUTURE_PLAN") [18:41:20.212] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:20.212] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:20.212] .init = FALSE) [18:41:20.212] } [18:41:20.212] } [18:41:20.212] } [18:41:20.212] }) [18:41:20.212] if (TRUE) { [18:41:20.212] base::sink(type = "output", split = FALSE) [18:41:20.212] if (TRUE) { [18:41:20.212] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:20.212] } [18:41:20.212] else { [18:41:20.212] ...future.result["stdout"] <- base::list(NULL) [18:41:20.212] } [18:41:20.212] base::close(...future.stdout) [18:41:20.212] ...future.stdout <- NULL [18:41:20.212] } [18:41:20.212] ...future.result$conditions <- ...future.conditions [18:41:20.212] ...future.result$finished <- base::Sys.time() [18:41:20.212] ...future.result [18:41:20.212] } [18:41:20.216] assign_globals() ... [18:41:20.216] List of 5 [18:41:20.216] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:20.216] $ future.call.arguments :List of 1 [18:41:20.216] ..$ length: int 2 [18:41:20.216] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:20.216] $ ...future.elements_ii :List of 1 [18:41:20.216] ..$ a: chr "integer" [18:41:20.216] $ ...future.seeds_ii : NULL [18:41:20.216] $ ...future.globals.maxSize: NULL [18:41:20.216] - attr(*, "where")=List of 5 [18:41:20.216] ..$ ...future.FUN : [18:41:20.216] ..$ future.call.arguments : [18:41:20.216] ..$ ...future.elements_ii : [18:41:20.216] ..$ ...future.seeds_ii : [18:41:20.216] ..$ ...future.globals.maxSize: [18:41:20.216] - attr(*, "resolved")= logi FALSE [18:41:20.216] - attr(*, "total_size")= num 4406 [18:41:20.216] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:20.216] - attr(*, "already-done")= logi TRUE [18:41:20.222] - copied '...future.FUN' to environment [18:41:20.222] - copied 'future.call.arguments' to environment [18:41:20.222] - copied '...future.elements_ii' to environment [18:41:20.223] - copied '...future.seeds_ii' to environment [18:41:20.223] - copied '...future.globals.maxSize' to environment [18:41:20.223] assign_globals() ... done [18:41:20.223] plan(): Setting new future strategy stack: [18:41:20.223] List of future strategies: [18:41:20.223] 1. sequential: [18:41:20.223] - args: function (..., envir = parent.frame(), workers = "") [18:41:20.223] - tweaked: FALSE [18:41:20.223] - call: NULL [18:41:20.224] plan(): nbrOfWorkers() = 1 [18:41:20.225] plan(): Setting new future strategy stack: [18:41:20.225] List of future strategies: [18:41:20.225] 1. sequential: [18:41:20.225] - args: function (..., envir = parent.frame(), workers = "") [18:41:20.225] - tweaked: FALSE [18:41:20.225] - call: plan(strategy) [18:41:20.226] plan(): nbrOfWorkers() = 1 [18:41:20.226] SequentialFuture started (and completed) [18:41:20.227] - Launch lazy future ... done [18:41:20.227] run() for 'SequentialFuture' ... done [18:41:20.227] Created future: [18:41:20.227] SequentialFuture: [18:41:20.227] Label: 'future_lapply-1' [18:41:20.227] Expression: [18:41:20.227] { [18:41:20.227] do.call(function(...) { [18:41:20.227] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.227] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:20.227] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.227] on.exit(options(oopts), add = TRUE) [18:41:20.227] } [18:41:20.227] { [18:41:20.227] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:20.227] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.227] ...future.FUN(...future.X_jj, ...) [18:41:20.227] }) [18:41:20.227] } [18:41:20.227] }, args = future.call.arguments) [18:41:20.227] } [18:41:20.227] Lazy evaluation: FALSE [18:41:20.227] Asynchronous evaluation: FALSE [18:41:20.227] Local evaluation: TRUE [18:41:20.227] Environment: R_GlobalEnv [18:41:20.227] Capture standard output: TRUE [18:41:20.227] Capture condition classes: 'condition' (excluding 'nothing') [18:41:20.227] Globals: 5 objects totaling 758 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 96 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:20.227] Packages: [18:41:20.227] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:20.227] Resolved: TRUE [18:41:20.227] Value: 47 bytes of class 'list' [18:41:20.227] Early signaling: FALSE [18:41:20.227] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:20.227] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:20.228] Chunk #1 of 4 ... DONE [18:41:20.228] Chunk #2 of 4 ... [18:41:20.229] - Finding globals in 'X' for chunk #2 ... [18:41:20.229] getGlobalsAndPackages() ... [18:41:20.229] Searching for globals... [18:41:20.229] [18:41:20.229] Searching for globals ... DONE [18:41:20.229] - globals: [0] [18:41:20.230] getGlobalsAndPackages() ... DONE [18:41:20.230] + additional globals found: [n=0] [18:41:20.230] + additional namespaces needed: [n=0] [18:41:20.230] - Finding globals in 'X' for chunk #2 ... DONE [18:41:20.230] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:20.230] - seeds: [18:41:20.231] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.231] getGlobalsAndPackages() ... [18:41:20.231] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.231] Resolving globals: FALSE [18:41:20.231] Tweak future expression to call with '...' arguments ... [18:41:20.231] { [18:41:20.231] do.call(function(...) { [18:41:20.231] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.231] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:20.231] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.231] on.exit(options(oopts), add = TRUE) [18:41:20.231] } [18:41:20.231] { [18:41:20.231] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:20.231] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.231] ...future.FUN(...future.X_jj, ...) [18:41:20.231] }) [18:41:20.231] } [18:41:20.231] }, args = future.call.arguments) [18:41:20.231] } [18:41:20.232] Tweak future expression to call with '...' arguments ... DONE [18:41:20.232] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.233] [18:41:20.233] getGlobalsAndPackages() ... DONE [18:41:20.233] run() for 'Future' ... [18:41:20.233] - state: 'created' [18:41:20.233] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:20.234] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:20.234] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:20.234] - Field: 'label' [18:41:20.234] - Field: 'local' [18:41:20.235] - Field: 'owner' [18:41:20.235] - Field: 'envir' [18:41:20.235] - Field: 'packages' [18:41:20.235] - Field: 'gc' [18:41:20.235] - Field: 'conditions' [18:41:20.235] - Field: 'expr' [18:41:20.236] - Field: 'uuid' [18:41:20.236] - Field: 'seed' [18:41:20.236] - Field: 'version' [18:41:20.236] - Field: 'result' [18:41:20.236] - Field: 'asynchronous' [18:41:20.237] - Field: 'calls' [18:41:20.237] - Field: 'globals' [18:41:20.237] - Field: 'stdout' [18:41:20.237] - Field: 'earlySignal' [18:41:20.237] - Field: 'lazy' [18:41:20.237] - Field: 'state' [18:41:20.238] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:20.238] - Launch lazy future ... [18:41:20.238] Packages needed by the future expression (n = 0): [18:41:20.238] Packages needed by future strategies (n = 0): [18:41:20.239] { [18:41:20.239] { [18:41:20.239] { [18:41:20.239] ...future.startTime <- base::Sys.time() [18:41:20.239] { [18:41:20.239] { [18:41:20.239] { [18:41:20.239] base::local({ [18:41:20.239] has_future <- base::requireNamespace("future", [18:41:20.239] quietly = TRUE) [18:41:20.239] if (has_future) { [18:41:20.239] ns <- base::getNamespace("future") [18:41:20.239] version <- ns[[".package"]][["version"]] [18:41:20.239] if (is.null(version)) [18:41:20.239] version <- utils::packageVersion("future") [18:41:20.239] } [18:41:20.239] else { [18:41:20.239] version <- NULL [18:41:20.239] } [18:41:20.239] if (!has_future || version < "1.8.0") { [18:41:20.239] info <- base::c(r_version = base::gsub("R version ", [18:41:20.239] "", base::R.version$version.string), [18:41:20.239] platform = base::sprintf("%s (%s-bit)", [18:41:20.239] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:20.239] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:20.239] "release", "version")], collapse = " "), [18:41:20.239] hostname = base::Sys.info()[["nodename"]]) [18:41:20.239] info <- base::sprintf("%s: %s", base::names(info), [18:41:20.239] info) [18:41:20.239] info <- base::paste(info, collapse = "; ") [18:41:20.239] if (!has_future) { [18:41:20.239] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:20.239] info) [18:41:20.239] } [18:41:20.239] else { [18:41:20.239] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:20.239] info, version) [18:41:20.239] } [18:41:20.239] base::stop(msg) [18:41:20.239] } [18:41:20.239] }) [18:41:20.239] } [18:41:20.239] ...future.strategy.old <- future::plan("list") [18:41:20.239] options(future.plan = NULL) [18:41:20.239] Sys.unsetenv("R_FUTURE_PLAN") [18:41:20.239] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:20.239] } [18:41:20.239] ...future.workdir <- getwd() [18:41:20.239] } [18:41:20.239] ...future.oldOptions <- base::as.list(base::.Options) [18:41:20.239] ...future.oldEnvVars <- base::Sys.getenv() [18:41:20.239] } [18:41:20.239] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:20.239] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:20.239] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:20.239] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:20.239] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:20.239] future.stdout.windows.reencode = NULL, width = 80L) [18:41:20.239] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:20.239] base::names(...future.oldOptions)) [18:41:20.239] } [18:41:20.239] if (FALSE) { [18:41:20.239] } [18:41:20.239] else { [18:41:20.239] if (TRUE) { [18:41:20.239] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:20.239] open = "w") [18:41:20.239] } [18:41:20.239] else { [18:41:20.239] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:20.239] windows = "NUL", "/dev/null"), open = "w") [18:41:20.239] } [18:41:20.239] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:20.239] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:20.239] base::sink(type = "output", split = FALSE) [18:41:20.239] base::close(...future.stdout) [18:41:20.239] }, add = TRUE) [18:41:20.239] } [18:41:20.239] ...future.frame <- base::sys.nframe() [18:41:20.239] ...future.conditions <- base::list() [18:41:20.239] ...future.rng <- base::globalenv()$.Random.seed [18:41:20.239] if (FALSE) { [18:41:20.239] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:20.239] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:20.239] } [18:41:20.239] ...future.result <- base::tryCatch({ [18:41:20.239] base::withCallingHandlers({ [18:41:20.239] ...future.value <- base::withVisible(base::local({ [18:41:20.239] do.call(function(...) { [18:41:20.239] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.239] if (!identical(...future.globals.maxSize.org, [18:41:20.239] ...future.globals.maxSize)) { [18:41:20.239] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.239] on.exit(options(oopts), add = TRUE) [18:41:20.239] } [18:41:20.239] { [18:41:20.239] lapply(seq_along(...future.elements_ii), [18:41:20.239] FUN = function(jj) { [18:41:20.239] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.239] ...future.FUN(...future.X_jj, ...) [18:41:20.239] }) [18:41:20.239] } [18:41:20.239] }, args = future.call.arguments) [18:41:20.239] })) [18:41:20.239] future::FutureResult(value = ...future.value$value, [18:41:20.239] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:20.239] ...future.rng), globalenv = if (FALSE) [18:41:20.239] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:20.239] ...future.globalenv.names)) [18:41:20.239] else NULL, started = ...future.startTime, version = "1.8") [18:41:20.239] }, condition = base::local({ [18:41:20.239] c <- base::c [18:41:20.239] inherits <- base::inherits [18:41:20.239] invokeRestart <- base::invokeRestart [18:41:20.239] length <- base::length [18:41:20.239] list <- base::list [18:41:20.239] seq.int <- base::seq.int [18:41:20.239] signalCondition <- base::signalCondition [18:41:20.239] sys.calls <- base::sys.calls [18:41:20.239] `[[` <- base::`[[` [18:41:20.239] `+` <- base::`+` [18:41:20.239] `<<-` <- base::`<<-` [18:41:20.239] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:20.239] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:20.239] 3L)] [18:41:20.239] } [18:41:20.239] function(cond) { [18:41:20.239] is_error <- inherits(cond, "error") [18:41:20.239] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:20.239] NULL) [18:41:20.239] if (is_error) { [18:41:20.239] sessionInformation <- function() { [18:41:20.239] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:20.239] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:20.239] search = base::search(), system = base::Sys.info()) [18:41:20.239] } [18:41:20.239] ...future.conditions[[length(...future.conditions) + [18:41:20.239] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:20.239] cond$call), session = sessionInformation(), [18:41:20.239] timestamp = base::Sys.time(), signaled = 0L) [18:41:20.239] signalCondition(cond) [18:41:20.239] } [18:41:20.239] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:20.239] "immediateCondition"))) { [18:41:20.239] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:20.239] ...future.conditions[[length(...future.conditions) + [18:41:20.239] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:20.239] if (TRUE && !signal) { [18:41:20.239] muffleCondition <- function (cond, pattern = "^muffle") [18:41:20.239] { [18:41:20.239] inherits <- base::inherits [18:41:20.239] invokeRestart <- base::invokeRestart [18:41:20.239] is.null <- base::is.null [18:41:20.239] muffled <- FALSE [18:41:20.239] if (inherits(cond, "message")) { [18:41:20.239] muffled <- grepl(pattern, "muffleMessage") [18:41:20.239] if (muffled) [18:41:20.239] invokeRestart("muffleMessage") [18:41:20.239] } [18:41:20.239] else if (inherits(cond, "warning")) { [18:41:20.239] muffled <- grepl(pattern, "muffleWarning") [18:41:20.239] if (muffled) [18:41:20.239] invokeRestart("muffleWarning") [18:41:20.239] } [18:41:20.239] else if (inherits(cond, "condition")) { [18:41:20.239] if (!is.null(pattern)) { [18:41:20.239] computeRestarts <- base::computeRestarts [18:41:20.239] grepl <- base::grepl [18:41:20.239] restarts <- computeRestarts(cond) [18:41:20.239] for (restart in restarts) { [18:41:20.239] name <- restart$name [18:41:20.239] if (is.null(name)) [18:41:20.239] next [18:41:20.239] if (!grepl(pattern, name)) [18:41:20.239] next [18:41:20.239] invokeRestart(restart) [18:41:20.239] muffled <- TRUE [18:41:20.239] break [18:41:20.239] } [18:41:20.239] } [18:41:20.239] } [18:41:20.239] invisible(muffled) [18:41:20.239] } [18:41:20.239] muffleCondition(cond, pattern = "^muffle") [18:41:20.239] } [18:41:20.239] } [18:41:20.239] else { [18:41:20.239] if (TRUE) { [18:41:20.239] muffleCondition <- function (cond, pattern = "^muffle") [18:41:20.239] { [18:41:20.239] inherits <- base::inherits [18:41:20.239] invokeRestart <- base::invokeRestart [18:41:20.239] is.null <- base::is.null [18:41:20.239] muffled <- FALSE [18:41:20.239] if (inherits(cond, "message")) { [18:41:20.239] muffled <- grepl(pattern, "muffleMessage") [18:41:20.239] if (muffled) [18:41:20.239] invokeRestart("muffleMessage") [18:41:20.239] } [18:41:20.239] else if (inherits(cond, "warning")) { [18:41:20.239] muffled <- grepl(pattern, "muffleWarning") [18:41:20.239] if (muffled) [18:41:20.239] invokeRestart("muffleWarning") [18:41:20.239] } [18:41:20.239] else if (inherits(cond, "condition")) { [18:41:20.239] if (!is.null(pattern)) { [18:41:20.239] computeRestarts <- base::computeRestarts [18:41:20.239] grepl <- base::grepl [18:41:20.239] restarts <- computeRestarts(cond) [18:41:20.239] for (restart in restarts) { [18:41:20.239] name <- restart$name [18:41:20.239] if (is.null(name)) [18:41:20.239] next [18:41:20.239] if (!grepl(pattern, name)) [18:41:20.239] next [18:41:20.239] invokeRestart(restart) [18:41:20.239] muffled <- TRUE [18:41:20.239] break [18:41:20.239] } [18:41:20.239] } [18:41:20.239] } [18:41:20.239] invisible(muffled) [18:41:20.239] } [18:41:20.239] muffleCondition(cond, pattern = "^muffle") [18:41:20.239] } [18:41:20.239] } [18:41:20.239] } [18:41:20.239] })) [18:41:20.239] }, error = function(ex) { [18:41:20.239] base::structure(base::list(value = NULL, visible = NULL, [18:41:20.239] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:20.239] ...future.rng), started = ...future.startTime, [18:41:20.239] finished = Sys.time(), session_uuid = NA_character_, [18:41:20.239] version = "1.8"), class = "FutureResult") [18:41:20.239] }, finally = { [18:41:20.239] if (!identical(...future.workdir, getwd())) [18:41:20.239] setwd(...future.workdir) [18:41:20.239] { [18:41:20.239] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:20.239] ...future.oldOptions$nwarnings <- NULL [18:41:20.239] } [18:41:20.239] base::options(...future.oldOptions) [18:41:20.239] if (.Platform$OS.type == "windows") { [18:41:20.239] old_names <- names(...future.oldEnvVars) [18:41:20.239] envs <- base::Sys.getenv() [18:41:20.239] names <- names(envs) [18:41:20.239] common <- intersect(names, old_names) [18:41:20.239] added <- setdiff(names, old_names) [18:41:20.239] removed <- setdiff(old_names, names) [18:41:20.239] changed <- common[...future.oldEnvVars[common] != [18:41:20.239] envs[common]] [18:41:20.239] NAMES <- toupper(changed) [18:41:20.239] args <- list() [18:41:20.239] for (kk in seq_along(NAMES)) { [18:41:20.239] name <- changed[[kk]] [18:41:20.239] NAME <- NAMES[[kk]] [18:41:20.239] if (name != NAME && is.element(NAME, old_names)) [18:41:20.239] next [18:41:20.239] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:20.239] } [18:41:20.239] NAMES <- toupper(added) [18:41:20.239] for (kk in seq_along(NAMES)) { [18:41:20.239] name <- added[[kk]] [18:41:20.239] NAME <- NAMES[[kk]] [18:41:20.239] if (name != NAME && is.element(NAME, old_names)) [18:41:20.239] next [18:41:20.239] args[[name]] <- "" [18:41:20.239] } [18:41:20.239] NAMES <- toupper(removed) [18:41:20.239] for (kk in seq_along(NAMES)) { [18:41:20.239] name <- removed[[kk]] [18:41:20.239] NAME <- NAMES[[kk]] [18:41:20.239] if (name != NAME && is.element(NAME, old_names)) [18:41:20.239] next [18:41:20.239] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:20.239] } [18:41:20.239] if (length(args) > 0) [18:41:20.239] base::do.call(base::Sys.setenv, args = args) [18:41:20.239] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:20.239] } [18:41:20.239] else { [18:41:20.239] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:20.239] } [18:41:20.239] { [18:41:20.239] if (base::length(...future.futureOptionsAdded) > [18:41:20.239] 0L) { [18:41:20.239] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:20.239] base::names(opts) <- ...future.futureOptionsAdded [18:41:20.239] base::options(opts) [18:41:20.239] } [18:41:20.239] { [18:41:20.239] { [18:41:20.239] NULL [18:41:20.239] RNGkind("Mersenne-Twister") [18:41:20.239] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:20.239] inherits = FALSE) [18:41:20.239] } [18:41:20.239] options(future.plan = NULL) [18:41:20.239] if (is.na(NA_character_)) [18:41:20.239] Sys.unsetenv("R_FUTURE_PLAN") [18:41:20.239] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:20.239] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:20.239] .init = FALSE) [18:41:20.239] } [18:41:20.239] } [18:41:20.239] } [18:41:20.239] }) [18:41:20.239] if (TRUE) { [18:41:20.239] base::sink(type = "output", split = FALSE) [18:41:20.239] if (TRUE) { [18:41:20.239] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:20.239] } [18:41:20.239] else { [18:41:20.239] ...future.result["stdout"] <- base::list(NULL) [18:41:20.239] } [18:41:20.239] base::close(...future.stdout) [18:41:20.239] ...future.stdout <- NULL [18:41:20.239] } [18:41:20.239] ...future.result$conditions <- ...future.conditions [18:41:20.239] ...future.result$finished <- base::Sys.time() [18:41:20.239] ...future.result [18:41:20.239] } [18:41:20.243] assign_globals() ... [18:41:20.243] List of 5 [18:41:20.243] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:20.243] $ future.call.arguments :List of 1 [18:41:20.243] ..$ length: int 2 [18:41:20.243] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:20.243] $ ...future.elements_ii :List of 1 [18:41:20.243] ..$ b: chr "numeric" [18:41:20.243] $ ...future.seeds_ii : NULL [18:41:20.243] $ ...future.globals.maxSize: NULL [18:41:20.243] - attr(*, "where")=List of 5 [18:41:20.243] ..$ ...future.FUN : [18:41:20.243] ..$ future.call.arguments : [18:41:20.243] ..$ ...future.elements_ii : [18:41:20.243] ..$ ...future.seeds_ii : [18:41:20.243] ..$ ...future.globals.maxSize: [18:41:20.243] - attr(*, "resolved")= logi FALSE [18:41:20.243] - attr(*, "total_size")= num 4406 [18:41:20.243] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:20.243] - attr(*, "already-done")= logi TRUE [18:41:20.249] - copied '...future.FUN' to environment [18:41:20.249] - copied 'future.call.arguments' to environment [18:41:20.249] - copied '...future.elements_ii' to environment [18:41:20.249] - copied '...future.seeds_ii' to environment [18:41:20.249] - copied '...future.globals.maxSize' to environment [18:41:20.250] assign_globals() ... done [18:41:20.250] plan(): Setting new future strategy stack: [18:41:20.250] List of future strategies: [18:41:20.250] 1. sequential: [18:41:20.250] - args: function (..., envir = parent.frame(), workers = "") [18:41:20.250] - tweaked: FALSE [18:41:20.250] - call: NULL [18:41:20.251] plan(): nbrOfWorkers() = 1 [18:41:20.252] plan(): Setting new future strategy stack: [18:41:20.252] List of future strategies: [18:41:20.252] 1. sequential: [18:41:20.252] - args: function (..., envir = parent.frame(), workers = "") [18:41:20.252] - tweaked: FALSE [18:41:20.252] - call: plan(strategy) [18:41:20.253] plan(): nbrOfWorkers() = 1 [18:41:20.253] SequentialFuture started (and completed) [18:41:20.253] - Launch lazy future ... done [18:41:20.253] run() for 'SequentialFuture' ... done [18:41:20.254] Created future: [18:41:20.254] SequentialFuture: [18:41:20.254] Label: 'future_lapply-2' [18:41:20.254] Expression: [18:41:20.254] { [18:41:20.254] do.call(function(...) { [18:41:20.254] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.254] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:20.254] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.254] on.exit(options(oopts), add = TRUE) [18:41:20.254] } [18:41:20.254] { [18:41:20.254] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:20.254] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.254] ...future.FUN(...future.X_jj, ...) [18:41:20.254] }) [18:41:20.254] } [18:41:20.254] }, args = future.call.arguments) [18:41:20.254] } [18:41:20.254] Lazy evaluation: FALSE [18:41:20.254] Asynchronous evaluation: FALSE [18:41:20.254] Local evaluation: TRUE [18:41:20.254] Environment: R_GlobalEnv [18:41:20.254] Capture standard output: TRUE [18:41:20.254] Capture condition classes: 'condition' (excluding 'nothing') [18:41:20.254] Globals: 5 objects totaling 758 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 96 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:20.254] Packages: [18:41:20.254] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:20.254] Resolved: TRUE [18:41:20.254] Value: 55 bytes of class 'list' [18:41:20.254] Early signaling: FALSE [18:41:20.254] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:20.254] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:20.255] Chunk #2 of 4 ... DONE [18:41:20.255] Chunk #3 of 4 ... [18:41:20.255] - Finding globals in 'X' for chunk #3 ... [18:41:20.255] getGlobalsAndPackages() ... [18:41:20.256] Searching for globals... [18:41:20.256] [18:41:20.256] Searching for globals ... DONE [18:41:20.256] - globals: [0] [18:41:20.256] getGlobalsAndPackages() ... DONE [18:41:20.257] + additional globals found: [n=0] [18:41:20.257] + additional namespaces needed: [n=0] [18:41:20.257] - Finding globals in 'X' for chunk #3 ... DONE [18:41:20.257] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:20.257] - seeds: [18:41:20.257] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.258] getGlobalsAndPackages() ... [18:41:20.258] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.258] Resolving globals: FALSE [18:41:20.258] Tweak future expression to call with '...' arguments ... [18:41:20.258] { [18:41:20.258] do.call(function(...) { [18:41:20.258] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.258] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:20.258] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.258] on.exit(options(oopts), add = TRUE) [18:41:20.258] } [18:41:20.258] { [18:41:20.258] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:20.258] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.258] ...future.FUN(...future.X_jj, ...) [18:41:20.258] }) [18:41:20.258] } [18:41:20.258] }, args = future.call.arguments) [18:41:20.258] } [18:41:20.259] Tweak future expression to call with '...' arguments ... DONE [18:41:20.259] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.259] [18:41:20.259] getGlobalsAndPackages() ... DONE [18:41:20.260] run() for 'Future' ... [18:41:20.260] - state: 'created' [18:41:20.260] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:20.261] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:20.261] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:20.261] - Field: 'label' [18:41:20.261] - Field: 'local' [18:41:20.261] - Field: 'owner' [18:41:20.261] - Field: 'envir' [18:41:20.262] - Field: 'packages' [18:41:20.262] - Field: 'gc' [18:41:20.262] - Field: 'conditions' [18:41:20.262] - Field: 'expr' [18:41:20.262] - Field: 'uuid' [18:41:20.263] - Field: 'seed' [18:41:20.263] - Field: 'version' [18:41:20.263] - Field: 'result' [18:41:20.263] - Field: 'asynchronous' [18:41:20.263] - Field: 'calls' [18:41:20.263] - Field: 'globals' [18:41:20.264] - Field: 'stdout' [18:41:20.264] - Field: 'earlySignal' [18:41:20.264] - Field: 'lazy' [18:41:20.264] - Field: 'state' [18:41:20.264] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:20.264] - Launch lazy future ... [18:41:20.265] Packages needed by the future expression (n = 0): [18:41:20.265] Packages needed by future strategies (n = 0): [18:41:20.265] { [18:41:20.265] { [18:41:20.265] { [18:41:20.265] ...future.startTime <- base::Sys.time() [18:41:20.265] { [18:41:20.265] { [18:41:20.265] { [18:41:20.265] base::local({ [18:41:20.265] has_future <- base::requireNamespace("future", [18:41:20.265] quietly = TRUE) [18:41:20.265] if (has_future) { [18:41:20.265] ns <- base::getNamespace("future") [18:41:20.265] version <- ns[[".package"]][["version"]] [18:41:20.265] if (is.null(version)) [18:41:20.265] version <- utils::packageVersion("future") [18:41:20.265] } [18:41:20.265] else { [18:41:20.265] version <- NULL [18:41:20.265] } [18:41:20.265] if (!has_future || version < "1.8.0") { [18:41:20.265] info <- base::c(r_version = base::gsub("R version ", [18:41:20.265] "", base::R.version$version.string), [18:41:20.265] platform = base::sprintf("%s (%s-bit)", [18:41:20.265] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:20.265] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:20.265] "release", "version")], collapse = " "), [18:41:20.265] hostname = base::Sys.info()[["nodename"]]) [18:41:20.265] info <- base::sprintf("%s: %s", base::names(info), [18:41:20.265] info) [18:41:20.265] info <- base::paste(info, collapse = "; ") [18:41:20.265] if (!has_future) { [18:41:20.265] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:20.265] info) [18:41:20.265] } [18:41:20.265] else { [18:41:20.265] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:20.265] info, version) [18:41:20.265] } [18:41:20.265] base::stop(msg) [18:41:20.265] } [18:41:20.265] }) [18:41:20.265] } [18:41:20.265] ...future.strategy.old <- future::plan("list") [18:41:20.265] options(future.plan = NULL) [18:41:20.265] Sys.unsetenv("R_FUTURE_PLAN") [18:41:20.265] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:20.265] } [18:41:20.265] ...future.workdir <- getwd() [18:41:20.265] } [18:41:20.265] ...future.oldOptions <- base::as.list(base::.Options) [18:41:20.265] ...future.oldEnvVars <- base::Sys.getenv() [18:41:20.265] } [18:41:20.265] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:20.265] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:20.265] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:20.265] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:20.265] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:20.265] future.stdout.windows.reencode = NULL, width = 80L) [18:41:20.265] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:20.265] base::names(...future.oldOptions)) [18:41:20.265] } [18:41:20.265] if (FALSE) { [18:41:20.265] } [18:41:20.265] else { [18:41:20.265] if (TRUE) { [18:41:20.265] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:20.265] open = "w") [18:41:20.265] } [18:41:20.265] else { [18:41:20.265] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:20.265] windows = "NUL", "/dev/null"), open = "w") [18:41:20.265] } [18:41:20.265] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:20.265] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:20.265] base::sink(type = "output", split = FALSE) [18:41:20.265] base::close(...future.stdout) [18:41:20.265] }, add = TRUE) [18:41:20.265] } [18:41:20.265] ...future.frame <- base::sys.nframe() [18:41:20.265] ...future.conditions <- base::list() [18:41:20.265] ...future.rng <- base::globalenv()$.Random.seed [18:41:20.265] if (FALSE) { [18:41:20.265] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:20.265] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:20.265] } [18:41:20.265] ...future.result <- base::tryCatch({ [18:41:20.265] base::withCallingHandlers({ [18:41:20.265] ...future.value <- base::withVisible(base::local({ [18:41:20.265] do.call(function(...) { [18:41:20.265] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.265] if (!identical(...future.globals.maxSize.org, [18:41:20.265] ...future.globals.maxSize)) { [18:41:20.265] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.265] on.exit(options(oopts), add = TRUE) [18:41:20.265] } [18:41:20.265] { [18:41:20.265] lapply(seq_along(...future.elements_ii), [18:41:20.265] FUN = function(jj) { [18:41:20.265] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.265] ...future.FUN(...future.X_jj, ...) [18:41:20.265] }) [18:41:20.265] } [18:41:20.265] }, args = future.call.arguments) [18:41:20.265] })) [18:41:20.265] future::FutureResult(value = ...future.value$value, [18:41:20.265] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:20.265] ...future.rng), globalenv = if (FALSE) [18:41:20.265] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:20.265] ...future.globalenv.names)) [18:41:20.265] else NULL, started = ...future.startTime, version = "1.8") [18:41:20.265] }, condition = base::local({ [18:41:20.265] c <- base::c [18:41:20.265] inherits <- base::inherits [18:41:20.265] invokeRestart <- base::invokeRestart [18:41:20.265] length <- base::length [18:41:20.265] list <- base::list [18:41:20.265] seq.int <- base::seq.int [18:41:20.265] signalCondition <- base::signalCondition [18:41:20.265] sys.calls <- base::sys.calls [18:41:20.265] `[[` <- base::`[[` [18:41:20.265] `+` <- base::`+` [18:41:20.265] `<<-` <- base::`<<-` [18:41:20.265] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:20.265] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:20.265] 3L)] [18:41:20.265] } [18:41:20.265] function(cond) { [18:41:20.265] is_error <- inherits(cond, "error") [18:41:20.265] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:20.265] NULL) [18:41:20.265] if (is_error) { [18:41:20.265] sessionInformation <- function() { [18:41:20.265] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:20.265] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:20.265] search = base::search(), system = base::Sys.info()) [18:41:20.265] } [18:41:20.265] ...future.conditions[[length(...future.conditions) + [18:41:20.265] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:20.265] cond$call), session = sessionInformation(), [18:41:20.265] timestamp = base::Sys.time(), signaled = 0L) [18:41:20.265] signalCondition(cond) [18:41:20.265] } [18:41:20.265] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:20.265] "immediateCondition"))) { [18:41:20.265] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:20.265] ...future.conditions[[length(...future.conditions) + [18:41:20.265] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:20.265] if (TRUE && !signal) { [18:41:20.265] muffleCondition <- function (cond, pattern = "^muffle") [18:41:20.265] { [18:41:20.265] inherits <- base::inherits [18:41:20.265] invokeRestart <- base::invokeRestart [18:41:20.265] is.null <- base::is.null [18:41:20.265] muffled <- FALSE [18:41:20.265] if (inherits(cond, "message")) { [18:41:20.265] muffled <- grepl(pattern, "muffleMessage") [18:41:20.265] if (muffled) [18:41:20.265] invokeRestart("muffleMessage") [18:41:20.265] } [18:41:20.265] else if (inherits(cond, "warning")) { [18:41:20.265] muffled <- grepl(pattern, "muffleWarning") [18:41:20.265] if (muffled) [18:41:20.265] invokeRestart("muffleWarning") [18:41:20.265] } [18:41:20.265] else if (inherits(cond, "condition")) { [18:41:20.265] if (!is.null(pattern)) { [18:41:20.265] computeRestarts <- base::computeRestarts [18:41:20.265] grepl <- base::grepl [18:41:20.265] restarts <- computeRestarts(cond) [18:41:20.265] for (restart in restarts) { [18:41:20.265] name <- restart$name [18:41:20.265] if (is.null(name)) [18:41:20.265] next [18:41:20.265] if (!grepl(pattern, name)) [18:41:20.265] next [18:41:20.265] invokeRestart(restart) [18:41:20.265] muffled <- TRUE [18:41:20.265] break [18:41:20.265] } [18:41:20.265] } [18:41:20.265] } [18:41:20.265] invisible(muffled) [18:41:20.265] } [18:41:20.265] muffleCondition(cond, pattern = "^muffle") [18:41:20.265] } [18:41:20.265] } [18:41:20.265] else { [18:41:20.265] if (TRUE) { [18:41:20.265] muffleCondition <- function (cond, pattern = "^muffle") [18:41:20.265] { [18:41:20.265] inherits <- base::inherits [18:41:20.265] invokeRestart <- base::invokeRestart [18:41:20.265] is.null <- base::is.null [18:41:20.265] muffled <- FALSE [18:41:20.265] if (inherits(cond, "message")) { [18:41:20.265] muffled <- grepl(pattern, "muffleMessage") [18:41:20.265] if (muffled) [18:41:20.265] invokeRestart("muffleMessage") [18:41:20.265] } [18:41:20.265] else if (inherits(cond, "warning")) { [18:41:20.265] muffled <- grepl(pattern, "muffleWarning") [18:41:20.265] if (muffled) [18:41:20.265] invokeRestart("muffleWarning") [18:41:20.265] } [18:41:20.265] else if (inherits(cond, "condition")) { [18:41:20.265] if (!is.null(pattern)) { [18:41:20.265] computeRestarts <- base::computeRestarts [18:41:20.265] grepl <- base::grepl [18:41:20.265] restarts <- computeRestarts(cond) [18:41:20.265] for (restart in restarts) { [18:41:20.265] name <- restart$name [18:41:20.265] if (is.null(name)) [18:41:20.265] next [18:41:20.265] if (!grepl(pattern, name)) [18:41:20.265] next [18:41:20.265] invokeRestart(restart) [18:41:20.265] muffled <- TRUE [18:41:20.265] break [18:41:20.265] } [18:41:20.265] } [18:41:20.265] } [18:41:20.265] invisible(muffled) [18:41:20.265] } [18:41:20.265] muffleCondition(cond, pattern = "^muffle") [18:41:20.265] } [18:41:20.265] } [18:41:20.265] } [18:41:20.265] })) [18:41:20.265] }, error = function(ex) { [18:41:20.265] base::structure(base::list(value = NULL, visible = NULL, [18:41:20.265] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:20.265] ...future.rng), started = ...future.startTime, [18:41:20.265] finished = Sys.time(), session_uuid = NA_character_, [18:41:20.265] version = "1.8"), class = "FutureResult") [18:41:20.265] }, finally = { [18:41:20.265] if (!identical(...future.workdir, getwd())) [18:41:20.265] setwd(...future.workdir) [18:41:20.265] { [18:41:20.265] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:20.265] ...future.oldOptions$nwarnings <- NULL [18:41:20.265] } [18:41:20.265] base::options(...future.oldOptions) [18:41:20.265] if (.Platform$OS.type == "windows") { [18:41:20.265] old_names <- names(...future.oldEnvVars) [18:41:20.265] envs <- base::Sys.getenv() [18:41:20.265] names <- names(envs) [18:41:20.265] common <- intersect(names, old_names) [18:41:20.265] added <- setdiff(names, old_names) [18:41:20.265] removed <- setdiff(old_names, names) [18:41:20.265] changed <- common[...future.oldEnvVars[common] != [18:41:20.265] envs[common]] [18:41:20.265] NAMES <- toupper(changed) [18:41:20.265] args <- list() [18:41:20.265] for (kk in seq_along(NAMES)) { [18:41:20.265] name <- changed[[kk]] [18:41:20.265] NAME <- NAMES[[kk]] [18:41:20.265] if (name != NAME && is.element(NAME, old_names)) [18:41:20.265] next [18:41:20.265] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:20.265] } [18:41:20.265] NAMES <- toupper(added) [18:41:20.265] for (kk in seq_along(NAMES)) { [18:41:20.265] name <- added[[kk]] [18:41:20.265] NAME <- NAMES[[kk]] [18:41:20.265] if (name != NAME && is.element(NAME, old_names)) [18:41:20.265] next [18:41:20.265] args[[name]] <- "" [18:41:20.265] } [18:41:20.265] NAMES <- toupper(removed) [18:41:20.265] for (kk in seq_along(NAMES)) { [18:41:20.265] name <- removed[[kk]] [18:41:20.265] NAME <- NAMES[[kk]] [18:41:20.265] if (name != NAME && is.element(NAME, old_names)) [18:41:20.265] next [18:41:20.265] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:20.265] } [18:41:20.265] if (length(args) > 0) [18:41:20.265] base::do.call(base::Sys.setenv, args = args) [18:41:20.265] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:20.265] } [18:41:20.265] else { [18:41:20.265] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:20.265] } [18:41:20.265] { [18:41:20.265] if (base::length(...future.futureOptionsAdded) > [18:41:20.265] 0L) { [18:41:20.265] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:20.265] base::names(opts) <- ...future.futureOptionsAdded [18:41:20.265] base::options(opts) [18:41:20.265] } [18:41:20.265] { [18:41:20.265] { [18:41:20.265] NULL [18:41:20.265] RNGkind("Mersenne-Twister") [18:41:20.265] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:20.265] inherits = FALSE) [18:41:20.265] } [18:41:20.265] options(future.plan = NULL) [18:41:20.265] if (is.na(NA_character_)) [18:41:20.265] Sys.unsetenv("R_FUTURE_PLAN") [18:41:20.265] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:20.265] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:20.265] .init = FALSE) [18:41:20.265] } [18:41:20.265] } [18:41:20.265] } [18:41:20.265] }) [18:41:20.265] if (TRUE) { [18:41:20.265] base::sink(type = "output", split = FALSE) [18:41:20.265] if (TRUE) { [18:41:20.265] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:20.265] } [18:41:20.265] else { [18:41:20.265] ...future.result["stdout"] <- base::list(NULL) [18:41:20.265] } [18:41:20.265] base::close(...future.stdout) [18:41:20.265] ...future.stdout <- NULL [18:41:20.265] } [18:41:20.265] ...future.result$conditions <- ...future.conditions [18:41:20.265] ...future.result$finished <- base::Sys.time() [18:41:20.265] ...future.result [18:41:20.265] } [18:41:20.269] assign_globals() ... [18:41:20.269] List of 5 [18:41:20.269] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:20.269] $ future.call.arguments :List of 1 [18:41:20.269] ..$ length: int 2 [18:41:20.269] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:20.269] $ ...future.elements_ii :List of 1 [18:41:20.269] ..$ c: chr "character" [18:41:20.269] $ ...future.seeds_ii : NULL [18:41:20.269] $ ...future.globals.maxSize: NULL [18:41:20.269] - attr(*, "where")=List of 5 [18:41:20.269] ..$ ...future.FUN : [18:41:20.269] ..$ future.call.arguments : [18:41:20.269] ..$ ...future.elements_ii : [18:41:20.269] ..$ ...future.seeds_ii : [18:41:20.269] ..$ ...future.globals.maxSize: [18:41:20.269] - attr(*, "resolved")= logi FALSE [18:41:20.269] - attr(*, "total_size")= num 4406 [18:41:20.269] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:20.269] - attr(*, "already-done")= logi TRUE [18:41:20.275] - copied '...future.FUN' to environment [18:41:20.276] - copied 'future.call.arguments' to environment [18:41:20.276] - copied '...future.elements_ii' to environment [18:41:20.276] - copied '...future.seeds_ii' to environment [18:41:20.276] - copied '...future.globals.maxSize' to environment [18:41:20.276] assign_globals() ... done [18:41:20.277] plan(): Setting new future strategy stack: [18:41:20.277] List of future strategies: [18:41:20.277] 1. sequential: [18:41:20.277] - args: function (..., envir = parent.frame(), workers = "") [18:41:20.277] - tweaked: FALSE [18:41:20.277] - call: NULL [18:41:20.277] plan(): nbrOfWorkers() = 1 [18:41:20.279] plan(): Setting new future strategy stack: [18:41:20.279] List of future strategies: [18:41:20.279] 1. sequential: [18:41:20.279] - args: function (..., envir = parent.frame(), workers = "") [18:41:20.279] - tweaked: FALSE [18:41:20.279] - call: plan(strategy) [18:41:20.280] plan(): nbrOfWorkers() = 1 [18:41:20.280] SequentialFuture started (and completed) [18:41:20.280] - Launch lazy future ... done [18:41:20.280] run() for 'SequentialFuture' ... done [18:41:20.280] Created future: [18:41:20.281] SequentialFuture: [18:41:20.281] Label: 'future_lapply-3' [18:41:20.281] Expression: [18:41:20.281] { [18:41:20.281] do.call(function(...) { [18:41:20.281] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.281] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:20.281] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.281] on.exit(options(oopts), add = TRUE) [18:41:20.281] } [18:41:20.281] { [18:41:20.281] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:20.281] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.281] ...future.FUN(...future.X_jj, ...) [18:41:20.281] }) [18:41:20.281] } [18:41:20.281] }, args = future.call.arguments) [18:41:20.281] } [18:41:20.281] Lazy evaluation: FALSE [18:41:20.281] Asynchronous evaluation: FALSE [18:41:20.281] Local evaluation: TRUE [18:41:20.281] Environment: R_GlobalEnv [18:41:20.281] Capture standard output: TRUE [18:41:20.281] Capture condition classes: 'condition' (excluding 'nothing') [18:41:20.281] Globals: 5 objects totaling 760 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 98 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:20.281] Packages: [18:41:20.281] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:20.281] Resolved: TRUE [18:41:20.281] Value: 55 bytes of class 'list' [18:41:20.281] Early signaling: FALSE [18:41:20.281] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:20.281] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:20.282] Chunk #3 of 4 ... DONE [18:41:20.282] Chunk #4 of 4 ... [18:41:20.282] - Finding globals in 'X' for chunk #4 ... [18:41:20.282] getGlobalsAndPackages() ... [18:41:20.282] Searching for globals... [18:41:20.283] [18:41:20.283] Searching for globals ... DONE [18:41:20.283] - globals: [0] [18:41:20.283] getGlobalsAndPackages() ... DONE [18:41:20.283] + additional globals found: [n=0] [18:41:20.283] + additional namespaces needed: [n=0] [18:41:20.284] - Finding globals in 'X' for chunk #4 ... DONE [18:41:20.286] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:20.287] - seeds: [18:41:20.287] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.287] getGlobalsAndPackages() ... [18:41:20.287] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.287] Resolving globals: FALSE [18:41:20.287] Tweak future expression to call with '...' arguments ... [18:41:20.288] { [18:41:20.288] do.call(function(...) { [18:41:20.288] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.288] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:20.288] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.288] on.exit(options(oopts), add = TRUE) [18:41:20.288] } [18:41:20.288] { [18:41:20.288] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:20.288] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.288] ...future.FUN(...future.X_jj, ...) [18:41:20.288] }) [18:41:20.288] } [18:41:20.288] }, args = future.call.arguments) [18:41:20.288] } [18:41:20.288] Tweak future expression to call with '...' arguments ... DONE [18:41:20.289] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.289] [18:41:20.289] getGlobalsAndPackages() ... DONE [18:41:20.289] run() for 'Future' ... [18:41:20.289] - state: 'created' [18:41:20.290] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:20.290] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:20.290] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:20.290] - Field: 'label' [18:41:20.291] - Field: 'local' [18:41:20.291] - Field: 'owner' [18:41:20.291] - Field: 'envir' [18:41:20.291] - Field: 'packages' [18:41:20.291] - Field: 'gc' [18:41:20.291] - Field: 'conditions' [18:41:20.292] - Field: 'expr' [18:41:20.292] - Field: 'uuid' [18:41:20.292] - Field: 'seed' [18:41:20.292] - Field: 'version' [18:41:20.292] - Field: 'result' [18:41:20.292] - Field: 'asynchronous' [18:41:20.293] - Field: 'calls' [18:41:20.293] - Field: 'globals' [18:41:20.293] - Field: 'stdout' [18:41:20.293] - Field: 'earlySignal' [18:41:20.293] - Field: 'lazy' [18:41:20.293] - Field: 'state' [18:41:20.294] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:20.294] - Launch lazy future ... [18:41:20.294] Packages needed by the future expression (n = 0): [18:41:20.294] Packages needed by future strategies (n = 0): [18:41:20.295] { [18:41:20.295] { [18:41:20.295] { [18:41:20.295] ...future.startTime <- base::Sys.time() [18:41:20.295] { [18:41:20.295] { [18:41:20.295] { [18:41:20.295] base::local({ [18:41:20.295] has_future <- base::requireNamespace("future", [18:41:20.295] quietly = TRUE) [18:41:20.295] if (has_future) { [18:41:20.295] ns <- base::getNamespace("future") [18:41:20.295] version <- ns[[".package"]][["version"]] [18:41:20.295] if (is.null(version)) [18:41:20.295] version <- utils::packageVersion("future") [18:41:20.295] } [18:41:20.295] else { [18:41:20.295] version <- NULL [18:41:20.295] } [18:41:20.295] if (!has_future || version < "1.8.0") { [18:41:20.295] info <- base::c(r_version = base::gsub("R version ", [18:41:20.295] "", base::R.version$version.string), [18:41:20.295] platform = base::sprintf("%s (%s-bit)", [18:41:20.295] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:20.295] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:20.295] "release", "version")], collapse = " "), [18:41:20.295] hostname = base::Sys.info()[["nodename"]]) [18:41:20.295] info <- base::sprintf("%s: %s", base::names(info), [18:41:20.295] info) [18:41:20.295] info <- base::paste(info, collapse = "; ") [18:41:20.295] if (!has_future) { [18:41:20.295] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:20.295] info) [18:41:20.295] } [18:41:20.295] else { [18:41:20.295] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:20.295] info, version) [18:41:20.295] } [18:41:20.295] base::stop(msg) [18:41:20.295] } [18:41:20.295] }) [18:41:20.295] } [18:41:20.295] ...future.strategy.old <- future::plan("list") [18:41:20.295] options(future.plan = NULL) [18:41:20.295] Sys.unsetenv("R_FUTURE_PLAN") [18:41:20.295] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:20.295] } [18:41:20.295] ...future.workdir <- getwd() [18:41:20.295] } [18:41:20.295] ...future.oldOptions <- base::as.list(base::.Options) [18:41:20.295] ...future.oldEnvVars <- base::Sys.getenv() [18:41:20.295] } [18:41:20.295] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:20.295] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:20.295] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:20.295] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:20.295] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:20.295] future.stdout.windows.reencode = NULL, width = 80L) [18:41:20.295] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:20.295] base::names(...future.oldOptions)) [18:41:20.295] } [18:41:20.295] if (FALSE) { [18:41:20.295] } [18:41:20.295] else { [18:41:20.295] if (TRUE) { [18:41:20.295] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:20.295] open = "w") [18:41:20.295] } [18:41:20.295] else { [18:41:20.295] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:20.295] windows = "NUL", "/dev/null"), open = "w") [18:41:20.295] } [18:41:20.295] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:20.295] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:20.295] base::sink(type = "output", split = FALSE) [18:41:20.295] base::close(...future.stdout) [18:41:20.295] }, add = TRUE) [18:41:20.295] } [18:41:20.295] ...future.frame <- base::sys.nframe() [18:41:20.295] ...future.conditions <- base::list() [18:41:20.295] ...future.rng <- base::globalenv()$.Random.seed [18:41:20.295] if (FALSE) { [18:41:20.295] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:20.295] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:20.295] } [18:41:20.295] ...future.result <- base::tryCatch({ [18:41:20.295] base::withCallingHandlers({ [18:41:20.295] ...future.value <- base::withVisible(base::local({ [18:41:20.295] do.call(function(...) { [18:41:20.295] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.295] if (!identical(...future.globals.maxSize.org, [18:41:20.295] ...future.globals.maxSize)) { [18:41:20.295] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.295] on.exit(options(oopts), add = TRUE) [18:41:20.295] } [18:41:20.295] { [18:41:20.295] lapply(seq_along(...future.elements_ii), [18:41:20.295] FUN = function(jj) { [18:41:20.295] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.295] ...future.FUN(...future.X_jj, ...) [18:41:20.295] }) [18:41:20.295] } [18:41:20.295] }, args = future.call.arguments) [18:41:20.295] })) [18:41:20.295] future::FutureResult(value = ...future.value$value, [18:41:20.295] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:20.295] ...future.rng), globalenv = if (FALSE) [18:41:20.295] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:20.295] ...future.globalenv.names)) [18:41:20.295] else NULL, started = ...future.startTime, version = "1.8") [18:41:20.295] }, condition = base::local({ [18:41:20.295] c <- base::c [18:41:20.295] inherits <- base::inherits [18:41:20.295] invokeRestart <- base::invokeRestart [18:41:20.295] length <- base::length [18:41:20.295] list <- base::list [18:41:20.295] seq.int <- base::seq.int [18:41:20.295] signalCondition <- base::signalCondition [18:41:20.295] sys.calls <- base::sys.calls [18:41:20.295] `[[` <- base::`[[` [18:41:20.295] `+` <- base::`+` [18:41:20.295] `<<-` <- base::`<<-` [18:41:20.295] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:20.295] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:20.295] 3L)] [18:41:20.295] } [18:41:20.295] function(cond) { [18:41:20.295] is_error <- inherits(cond, "error") [18:41:20.295] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:20.295] NULL) [18:41:20.295] if (is_error) { [18:41:20.295] sessionInformation <- function() { [18:41:20.295] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:20.295] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:20.295] search = base::search(), system = base::Sys.info()) [18:41:20.295] } [18:41:20.295] ...future.conditions[[length(...future.conditions) + [18:41:20.295] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:20.295] cond$call), session = sessionInformation(), [18:41:20.295] timestamp = base::Sys.time(), signaled = 0L) [18:41:20.295] signalCondition(cond) [18:41:20.295] } [18:41:20.295] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:20.295] "immediateCondition"))) { [18:41:20.295] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:20.295] ...future.conditions[[length(...future.conditions) + [18:41:20.295] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:20.295] if (TRUE && !signal) { [18:41:20.295] muffleCondition <- function (cond, pattern = "^muffle") [18:41:20.295] { [18:41:20.295] inherits <- base::inherits [18:41:20.295] invokeRestart <- base::invokeRestart [18:41:20.295] is.null <- base::is.null [18:41:20.295] muffled <- FALSE [18:41:20.295] if (inherits(cond, "message")) { [18:41:20.295] muffled <- grepl(pattern, "muffleMessage") [18:41:20.295] if (muffled) [18:41:20.295] invokeRestart("muffleMessage") [18:41:20.295] } [18:41:20.295] else if (inherits(cond, "warning")) { [18:41:20.295] muffled <- grepl(pattern, "muffleWarning") [18:41:20.295] if (muffled) [18:41:20.295] invokeRestart("muffleWarning") [18:41:20.295] } [18:41:20.295] else if (inherits(cond, "condition")) { [18:41:20.295] if (!is.null(pattern)) { [18:41:20.295] computeRestarts <- base::computeRestarts [18:41:20.295] grepl <- base::grepl [18:41:20.295] restarts <- computeRestarts(cond) [18:41:20.295] for (restart in restarts) { [18:41:20.295] name <- restart$name [18:41:20.295] if (is.null(name)) [18:41:20.295] next [18:41:20.295] if (!grepl(pattern, name)) [18:41:20.295] next [18:41:20.295] invokeRestart(restart) [18:41:20.295] muffled <- TRUE [18:41:20.295] break [18:41:20.295] } [18:41:20.295] } [18:41:20.295] } [18:41:20.295] invisible(muffled) [18:41:20.295] } [18:41:20.295] muffleCondition(cond, pattern = "^muffle") [18:41:20.295] } [18:41:20.295] } [18:41:20.295] else { [18:41:20.295] if (TRUE) { [18:41:20.295] muffleCondition <- function (cond, pattern = "^muffle") [18:41:20.295] { [18:41:20.295] inherits <- base::inherits [18:41:20.295] invokeRestart <- base::invokeRestart [18:41:20.295] is.null <- base::is.null [18:41:20.295] muffled <- FALSE [18:41:20.295] if (inherits(cond, "message")) { [18:41:20.295] muffled <- grepl(pattern, "muffleMessage") [18:41:20.295] if (muffled) [18:41:20.295] invokeRestart("muffleMessage") [18:41:20.295] } [18:41:20.295] else if (inherits(cond, "warning")) { [18:41:20.295] muffled <- grepl(pattern, "muffleWarning") [18:41:20.295] if (muffled) [18:41:20.295] invokeRestart("muffleWarning") [18:41:20.295] } [18:41:20.295] else if (inherits(cond, "condition")) { [18:41:20.295] if (!is.null(pattern)) { [18:41:20.295] computeRestarts <- base::computeRestarts [18:41:20.295] grepl <- base::grepl [18:41:20.295] restarts <- computeRestarts(cond) [18:41:20.295] for (restart in restarts) { [18:41:20.295] name <- restart$name [18:41:20.295] if (is.null(name)) [18:41:20.295] next [18:41:20.295] if (!grepl(pattern, name)) [18:41:20.295] next [18:41:20.295] invokeRestart(restart) [18:41:20.295] muffled <- TRUE [18:41:20.295] break [18:41:20.295] } [18:41:20.295] } [18:41:20.295] } [18:41:20.295] invisible(muffled) [18:41:20.295] } [18:41:20.295] muffleCondition(cond, pattern = "^muffle") [18:41:20.295] } [18:41:20.295] } [18:41:20.295] } [18:41:20.295] })) [18:41:20.295] }, error = function(ex) { [18:41:20.295] base::structure(base::list(value = NULL, visible = NULL, [18:41:20.295] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:20.295] ...future.rng), started = ...future.startTime, [18:41:20.295] finished = Sys.time(), session_uuid = NA_character_, [18:41:20.295] version = "1.8"), class = "FutureResult") [18:41:20.295] }, finally = { [18:41:20.295] if (!identical(...future.workdir, getwd())) [18:41:20.295] setwd(...future.workdir) [18:41:20.295] { [18:41:20.295] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:20.295] ...future.oldOptions$nwarnings <- NULL [18:41:20.295] } [18:41:20.295] base::options(...future.oldOptions) [18:41:20.295] if (.Platform$OS.type == "windows") { [18:41:20.295] old_names <- names(...future.oldEnvVars) [18:41:20.295] envs <- base::Sys.getenv() [18:41:20.295] names <- names(envs) [18:41:20.295] common <- intersect(names, old_names) [18:41:20.295] added <- setdiff(names, old_names) [18:41:20.295] removed <- setdiff(old_names, names) [18:41:20.295] changed <- common[...future.oldEnvVars[common] != [18:41:20.295] envs[common]] [18:41:20.295] NAMES <- toupper(changed) [18:41:20.295] args <- list() [18:41:20.295] for (kk in seq_along(NAMES)) { [18:41:20.295] name <- changed[[kk]] [18:41:20.295] NAME <- NAMES[[kk]] [18:41:20.295] if (name != NAME && is.element(NAME, old_names)) [18:41:20.295] next [18:41:20.295] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:20.295] } [18:41:20.295] NAMES <- toupper(added) [18:41:20.295] for (kk in seq_along(NAMES)) { [18:41:20.295] name <- added[[kk]] [18:41:20.295] NAME <- NAMES[[kk]] [18:41:20.295] if (name != NAME && is.element(NAME, old_names)) [18:41:20.295] next [18:41:20.295] args[[name]] <- "" [18:41:20.295] } [18:41:20.295] NAMES <- toupper(removed) [18:41:20.295] for (kk in seq_along(NAMES)) { [18:41:20.295] name <- removed[[kk]] [18:41:20.295] NAME <- NAMES[[kk]] [18:41:20.295] if (name != NAME && is.element(NAME, old_names)) [18:41:20.295] next [18:41:20.295] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:20.295] } [18:41:20.295] if (length(args) > 0) [18:41:20.295] base::do.call(base::Sys.setenv, args = args) [18:41:20.295] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:20.295] } [18:41:20.295] else { [18:41:20.295] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:20.295] } [18:41:20.295] { [18:41:20.295] if (base::length(...future.futureOptionsAdded) > [18:41:20.295] 0L) { [18:41:20.295] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:20.295] base::names(opts) <- ...future.futureOptionsAdded [18:41:20.295] base::options(opts) [18:41:20.295] } [18:41:20.295] { [18:41:20.295] { [18:41:20.295] NULL [18:41:20.295] RNGkind("Mersenne-Twister") [18:41:20.295] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:20.295] inherits = FALSE) [18:41:20.295] } [18:41:20.295] options(future.plan = NULL) [18:41:20.295] if (is.na(NA_character_)) [18:41:20.295] Sys.unsetenv("R_FUTURE_PLAN") [18:41:20.295] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:20.295] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:20.295] .init = FALSE) [18:41:20.295] } [18:41:20.295] } [18:41:20.295] } [18:41:20.295] }) [18:41:20.295] if (TRUE) { [18:41:20.295] base::sink(type = "output", split = FALSE) [18:41:20.295] if (TRUE) { [18:41:20.295] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:20.295] } [18:41:20.295] else { [18:41:20.295] ...future.result["stdout"] <- base::list(NULL) [18:41:20.295] } [18:41:20.295] base::close(...future.stdout) [18:41:20.295] ...future.stdout <- NULL [18:41:20.295] } [18:41:20.295] ...future.result$conditions <- ...future.conditions [18:41:20.295] ...future.result$finished <- base::Sys.time() [18:41:20.295] ...future.result [18:41:20.295] } [18:41:20.299] assign_globals() ... [18:41:20.299] List of 5 [18:41:20.299] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:20.299] $ future.call.arguments :List of 1 [18:41:20.299] ..$ length: int 2 [18:41:20.299] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:20.299] $ ...future.elements_ii :List of 1 [18:41:20.299] ..$ c: chr "list" [18:41:20.299] $ ...future.seeds_ii : NULL [18:41:20.299] $ ...future.globals.maxSize: NULL [18:41:20.299] - attr(*, "where")=List of 5 [18:41:20.299] ..$ ...future.FUN : [18:41:20.299] ..$ future.call.arguments : [18:41:20.299] ..$ ...future.elements_ii : [18:41:20.299] ..$ ...future.seeds_ii : [18:41:20.299] ..$ ...future.globals.maxSize: [18:41:20.299] - attr(*, "resolved")= logi FALSE [18:41:20.299] - attr(*, "total_size")= num 4406 [18:41:20.299] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:20.299] - attr(*, "already-done")= logi TRUE [18:41:20.305] - copied '...future.FUN' to environment [18:41:20.305] - copied 'future.call.arguments' to environment [18:41:20.305] - copied '...future.elements_ii' to environment [18:41:20.306] - copied '...future.seeds_ii' to environment [18:41:20.306] - copied '...future.globals.maxSize' to environment [18:41:20.306] assign_globals() ... done [18:41:20.306] plan(): Setting new future strategy stack: [18:41:20.306] List of future strategies: [18:41:20.306] 1. sequential: [18:41:20.306] - args: function (..., envir = parent.frame(), workers = "") [18:41:20.306] - tweaked: FALSE [18:41:20.306] - call: NULL [18:41:20.307] plan(): nbrOfWorkers() = 1 [18:41:20.308] plan(): Setting new future strategy stack: [18:41:20.308] List of future strategies: [18:41:20.308] 1. sequential: [18:41:20.308] - args: function (..., envir = parent.frame(), workers = "") [18:41:20.308] - tweaked: FALSE [18:41:20.308] - call: plan(strategy) [18:41:20.309] plan(): nbrOfWorkers() = 1 [18:41:20.309] SequentialFuture started (and completed) [18:41:20.310] - Launch lazy future ... done [18:41:20.310] run() for 'SequentialFuture' ... done [18:41:20.310] Created future: [18:41:20.310] SequentialFuture: [18:41:20.310] Label: 'future_lapply-4' [18:41:20.310] Expression: [18:41:20.310] { [18:41:20.310] do.call(function(...) { [18:41:20.310] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.310] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:20.310] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.310] on.exit(options(oopts), add = TRUE) [18:41:20.310] } [18:41:20.310] { [18:41:20.310] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:20.310] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.310] ...future.FUN(...future.X_jj, ...) [18:41:20.310] }) [18:41:20.310] } [18:41:20.310] }, args = future.call.arguments) [18:41:20.310] } [18:41:20.310] Lazy evaluation: FALSE [18:41:20.310] Asynchronous evaluation: FALSE [18:41:20.310] Local evaluation: TRUE [18:41:20.310] Environment: R_GlobalEnv [18:41:20.310] Capture standard output: TRUE [18:41:20.310] Capture condition classes: 'condition' (excluding 'nothing') [18:41:20.310] Globals: 5 objects totaling 755 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 93 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:20.310] Packages: [18:41:20.310] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:20.310] Resolved: TRUE [18:41:20.310] Value: 47 bytes of class 'list' [18:41:20.310] Early signaling: FALSE [18:41:20.310] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:20.310] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:20.311] Chunk #4 of 4 ... DONE [18:41:20.311] Launching 4 futures (chunks) ... DONE [18:41:20.312] Resolving 4 futures (chunks) ... [18:41:20.312] resolve() on list ... [18:41:20.312] recursive: 0 [18:41:20.312] length: 4 [18:41:20.312] [18:41:20.312] resolved() for 'SequentialFuture' ... [18:41:20.313] - state: 'finished' [18:41:20.313] - run: TRUE [18:41:20.313] - result: 'FutureResult' [18:41:20.313] resolved() for 'SequentialFuture' ... done [18:41:20.313] Future #1 [18:41:20.314] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:20.314] - nx: 4 [18:41:20.315] - relay: TRUE [18:41:20.315] - stdout: TRUE [18:41:20.316] - signal: TRUE [18:41:20.316] - resignal: FALSE [18:41:20.316] - force: TRUE [18:41:20.317] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [18:41:20.317] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:41:20.317] - until=1 [18:41:20.318] - relaying element #1 [18:41:20.318] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:20.319] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:20.319] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:20.320] length: 3 (resolved future 1) [18:41:20.320] resolved() for 'SequentialFuture' ... [18:41:20.320] - state: 'finished' [18:41:20.321] - run: TRUE [18:41:20.321] - result: 'FutureResult' [18:41:20.322] resolved() for 'SequentialFuture' ... done [18:41:20.322] Future #2 [18:41:20.323] signalConditionsASAP(SequentialFuture, pos=2) ... [18:41:20.323] - nx: 4 [18:41:20.323] - relay: TRUE [18:41:20.323] - stdout: TRUE [18:41:20.324] - signal: TRUE [18:41:20.324] - resignal: FALSE [18:41:20.324] - force: TRUE [18:41:20.325] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:20.325] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:20.325] - until=2 [18:41:20.326] - relaying element #2 [18:41:20.326] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:20.327] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:20.327] signalConditionsASAP(SequentialFuture, pos=2) ... done [18:41:20.327] length: 2 (resolved future 2) [18:41:20.328] resolved() for 'SequentialFuture' ... [18:41:20.328] - state: 'finished' [18:41:20.328] - run: TRUE [18:41:20.329] - result: 'FutureResult' [18:41:20.329] resolved() for 'SequentialFuture' ... done [18:41:20.329] Future #3 [18:41:20.330] signalConditionsASAP(SequentialFuture, pos=3) ... [18:41:20.330] - nx: 4 [18:41:20.331] - relay: TRUE [18:41:20.331] - stdout: TRUE [18:41:20.331] - signal: TRUE [18:41:20.331] - resignal: FALSE [18:41:20.332] - force: TRUE [18:41:20.332] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:20.332] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:20.333] - until=3 [18:41:20.333] - relaying element #3 [18:41:20.333] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:20.334] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:20.334] signalConditionsASAP(SequentialFuture, pos=3) ... done [18:41:20.334] length: 1 (resolved future 3) [18:41:20.335] resolved() for 'SequentialFuture' ... [18:41:20.335] - state: 'finished' [18:41:20.335] - run: TRUE [18:41:20.336] - result: 'FutureResult' [18:41:20.336] resolved() for 'SequentialFuture' ... done [18:41:20.337] Future #4 [18:41:20.337] signalConditionsASAP(SequentialFuture, pos=4) ... [18:41:20.337] - nx: 4 [18:41:20.338] - relay: TRUE [18:41:20.338] - stdout: TRUE [18:41:20.338] - signal: TRUE [18:41:20.338] - resignal: FALSE [18:41:20.339] - force: TRUE [18:41:20.339] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:20.339] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:20.340] - until=4 [18:41:20.340] - relaying element #4 [18:41:20.341] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:20.341] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:20.341] signalConditionsASAP(SequentialFuture, pos=4) ... done [18:41:20.342] length: 0 (resolved future 4) [18:41:20.342] Relaying remaining futures [18:41:20.342] signalConditionsASAP(NULL, pos=0) ... [18:41:20.342] - nx: 4 [18:41:20.343] - relay: TRUE [18:41:20.343] - stdout: TRUE [18:41:20.343] - signal: TRUE [18:41:20.344] - resignal: FALSE [18:41:20.344] - force: TRUE [18:41:20.344] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:20.344] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [18:41:20.345] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:20.345] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:20.346] signalConditionsASAP(NULL, pos=0) ... done [18:41:20.346] resolve() on list ... DONE [18:41:20.347] - Number of value chunks collected: 4 [18:41:20.347] Resolving 4 futures (chunks) ... DONE [18:41:20.348] Reducing values from 4 chunks ... [18:41:20.348] - Number of values collected after concatenation: 4 [18:41:20.348] - Number of values expected: 4 [18:41:20.348] Reducing values from 4 chunks ... DONE [18:41:20.349] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL - future_lapply(x, FUN = future:::hpaste, ...) ... [18:41:20.355] future_lapply() ... [18:41:20.372] Number of chunks: 1 [18:41:20.372] getGlobalsAndPackagesXApply() ... [18:41:20.373] - future.globals: TRUE [18:41:20.373] getGlobalsAndPackages() ... [18:41:20.373] Searching for globals... [18:41:20.393] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [18:41:20.394] Searching for globals ... DONE [18:41:20.394] Resolving globals: FALSE [18:41:20.397] The total size of the 1 globals is 7.17 KiB (7342 bytes) [18:41:20.398] The total size of the 1 globals exported for future expression ('FUN(collapse = "; ", maxHead = 3L)') is 7.17 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (7.17 KiB of class 'function') [18:41:20.398] - globals: [1] 'FUN' [18:41:20.399] - packages: [1] 'future' [18:41:20.399] getGlobalsAndPackages() ... DONE [18:41:20.399] - globals found/used: [n=1] 'FUN' [18:41:20.400] - needed namespaces: [n=1] 'future' [18:41:20.400] Finding globals ... DONE [18:41:20.400] - use_args: TRUE [18:41:20.401] - Getting '...' globals ... [18:41:20.402] resolve() on list ... [18:41:20.402] recursive: 0 [18:41:20.402] length: 1 [18:41:20.403] elements: '...' [18:41:20.403] length: 0 (resolved future 1) [18:41:20.403] resolve() on list ... DONE [18:41:20.404] - '...' content: [n=2] 'collapse', 'maxHead' [18:41:20.404] List of 1 [18:41:20.404] $ ...:List of 2 [18:41:20.404] ..$ collapse: chr "; " [18:41:20.404] ..$ maxHead : int 3 [18:41:20.404] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:20.404] - attr(*, "where")=List of 1 [18:41:20.404] ..$ ...: [18:41:20.404] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:20.404] - attr(*, "resolved")= logi TRUE [18:41:20.404] - attr(*, "total_size")= num NA [18:41:20.411] - Getting '...' globals ... DONE [18:41:20.412] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:20.412] List of 2 [18:41:20.412] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [18:41:20.412] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [18:41:20.412] $ ... :List of 2 [18:41:20.412] ..$ collapse: chr "; " [18:41:20.412] ..$ maxHead : int 3 [18:41:20.412] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:20.412] - attr(*, "where")=List of 2 [18:41:20.412] ..$ ...future.FUN: [18:41:20.412] ..$ ... : [18:41:20.412] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:20.412] - attr(*, "resolved")= logi FALSE [18:41:20.412] - attr(*, "total_size")= int 20301 [18:41:20.421] Packages to be attached in all futures: [n=1] 'future' [18:41:20.421] getGlobalsAndPackagesXApply() ... DONE [18:41:20.422] Number of futures (= number of chunks): 1 [18:41:20.422] Launching 1 futures (chunks) ... [18:41:20.422] Chunk #1 of 1 ... [18:41:20.423] - Finding globals in 'X' for chunk #1 ... [18:41:20.423] getGlobalsAndPackages() ... [18:41:20.423] Searching for globals... [18:41:20.424] [18:41:20.424] Searching for globals ... DONE [18:41:20.424] - globals: [0] [18:41:20.425] getGlobalsAndPackages() ... DONE [18:41:20.425] + additional globals found: [n=0] [18:41:20.425] + additional namespaces needed: [n=0] [18:41:20.426] - Finding globals in 'X' for chunk #1 ... DONE [18:41:20.426] - seeds: [18:41:20.426] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.427] getGlobalsAndPackages() ... [18:41:20.427] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.427] Resolving globals: FALSE [18:41:20.428] Tweak future expression to call with '...' arguments ... [18:41:20.428] { [18:41:20.428] do.call(function(...) { [18:41:20.428] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.428] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:20.428] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.428] on.exit(options(oopts), add = TRUE) [18:41:20.428] } [18:41:20.428] { [18:41:20.428] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:20.428] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.428] ...future.FUN(...future.X_jj, ...) [18:41:20.428] }) [18:41:20.428] } [18:41:20.428] }, args = future.call.arguments) [18:41:20.428] } [18:41:20.429] Tweak future expression to call with '...' arguments ... DONE [18:41:20.430] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.430] - packages: [1] 'future' [18:41:20.431] getGlobalsAndPackages() ... DONE [18:41:20.431] run() for 'Future' ... [18:41:20.432] - state: 'created' [18:41:20.432] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:20.433] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:20.433] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:20.434] - Field: 'label' [18:41:20.434] - Field: 'local' [18:41:20.434] - Field: 'owner' [18:41:20.435] - Field: 'envir' [18:41:20.435] - Field: 'packages' [18:41:20.435] - Field: 'gc' [18:41:20.436] - Field: 'conditions' [18:41:20.436] - Field: 'expr' [18:41:20.436] - Field: 'uuid' [18:41:20.437] - Field: 'seed' [18:41:20.437] - Field: 'version' [18:41:20.437] - Field: 'result' [18:41:20.438] - Field: 'asynchronous' [18:41:20.438] - Field: 'calls' [18:41:20.438] - Field: 'globals' [18:41:20.439] - Field: 'stdout' [18:41:20.439] - Field: 'earlySignal' [18:41:20.439] - Field: 'lazy' [18:41:20.440] - Field: 'state' [18:41:20.440] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:20.440] - Launch lazy future ... [18:41:20.441] Packages needed by the future expression (n = 1): 'future' [18:41:20.441] Packages needed by future strategies (n = 0): [18:41:20.443] { [18:41:20.443] { [18:41:20.443] { [18:41:20.443] ...future.startTime <- base::Sys.time() [18:41:20.443] { [18:41:20.443] { [18:41:20.443] { [18:41:20.443] { [18:41:20.443] base::local({ [18:41:20.443] has_future <- base::requireNamespace("future", [18:41:20.443] quietly = TRUE) [18:41:20.443] if (has_future) { [18:41:20.443] ns <- base::getNamespace("future") [18:41:20.443] version <- ns[[".package"]][["version"]] [18:41:20.443] if (is.null(version)) [18:41:20.443] version <- utils::packageVersion("future") [18:41:20.443] } [18:41:20.443] else { [18:41:20.443] version <- NULL [18:41:20.443] } [18:41:20.443] if (!has_future || version < "1.8.0") { [18:41:20.443] info <- base::c(r_version = base::gsub("R version ", [18:41:20.443] "", base::R.version$version.string), [18:41:20.443] platform = base::sprintf("%s (%s-bit)", [18:41:20.443] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:20.443] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:20.443] "release", "version")], collapse = " "), [18:41:20.443] hostname = base::Sys.info()[["nodename"]]) [18:41:20.443] info <- base::sprintf("%s: %s", base::names(info), [18:41:20.443] info) [18:41:20.443] info <- base::paste(info, collapse = "; ") [18:41:20.443] if (!has_future) { [18:41:20.443] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:20.443] info) [18:41:20.443] } [18:41:20.443] else { [18:41:20.443] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:20.443] info, version) [18:41:20.443] } [18:41:20.443] base::stop(msg) [18:41:20.443] } [18:41:20.443] }) [18:41:20.443] } [18:41:20.443] base::local({ [18:41:20.443] for (pkg in "future") { [18:41:20.443] base::loadNamespace(pkg) [18:41:20.443] base::library(pkg, character.only = TRUE) [18:41:20.443] } [18:41:20.443] }) [18:41:20.443] } [18:41:20.443] ...future.strategy.old <- future::plan("list") [18:41:20.443] options(future.plan = NULL) [18:41:20.443] Sys.unsetenv("R_FUTURE_PLAN") [18:41:20.443] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:20.443] } [18:41:20.443] ...future.workdir <- getwd() [18:41:20.443] } [18:41:20.443] ...future.oldOptions <- base::as.list(base::.Options) [18:41:20.443] ...future.oldEnvVars <- base::Sys.getenv() [18:41:20.443] } [18:41:20.443] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:20.443] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:20.443] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:20.443] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:20.443] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:20.443] future.stdout.windows.reencode = NULL, width = 80L) [18:41:20.443] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:20.443] base::names(...future.oldOptions)) [18:41:20.443] } [18:41:20.443] if (FALSE) { [18:41:20.443] } [18:41:20.443] else { [18:41:20.443] if (TRUE) { [18:41:20.443] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:20.443] open = "w") [18:41:20.443] } [18:41:20.443] else { [18:41:20.443] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:20.443] windows = "NUL", "/dev/null"), open = "w") [18:41:20.443] } [18:41:20.443] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:20.443] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:20.443] base::sink(type = "output", split = FALSE) [18:41:20.443] base::close(...future.stdout) [18:41:20.443] }, add = TRUE) [18:41:20.443] } [18:41:20.443] ...future.frame <- base::sys.nframe() [18:41:20.443] ...future.conditions <- base::list() [18:41:20.443] ...future.rng <- base::globalenv()$.Random.seed [18:41:20.443] if (FALSE) { [18:41:20.443] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:20.443] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:20.443] } [18:41:20.443] ...future.result <- base::tryCatch({ [18:41:20.443] base::withCallingHandlers({ [18:41:20.443] ...future.value <- base::withVisible(base::local({ [18:41:20.443] do.call(function(...) { [18:41:20.443] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.443] if (!identical(...future.globals.maxSize.org, [18:41:20.443] ...future.globals.maxSize)) { [18:41:20.443] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.443] on.exit(options(oopts), add = TRUE) [18:41:20.443] } [18:41:20.443] { [18:41:20.443] lapply(seq_along(...future.elements_ii), [18:41:20.443] FUN = function(jj) { [18:41:20.443] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.443] ...future.FUN(...future.X_jj, ...) [18:41:20.443] }) [18:41:20.443] } [18:41:20.443] }, args = future.call.arguments) [18:41:20.443] })) [18:41:20.443] future::FutureResult(value = ...future.value$value, [18:41:20.443] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:20.443] ...future.rng), globalenv = if (FALSE) [18:41:20.443] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:20.443] ...future.globalenv.names)) [18:41:20.443] else NULL, started = ...future.startTime, version = "1.8") [18:41:20.443] }, condition = base::local({ [18:41:20.443] c <- base::c [18:41:20.443] inherits <- base::inherits [18:41:20.443] invokeRestart <- base::invokeRestart [18:41:20.443] length <- base::length [18:41:20.443] list <- base::list [18:41:20.443] seq.int <- base::seq.int [18:41:20.443] signalCondition <- base::signalCondition [18:41:20.443] sys.calls <- base::sys.calls [18:41:20.443] `[[` <- base::`[[` [18:41:20.443] `+` <- base::`+` [18:41:20.443] `<<-` <- base::`<<-` [18:41:20.443] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:20.443] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:20.443] 3L)] [18:41:20.443] } [18:41:20.443] function(cond) { [18:41:20.443] is_error <- inherits(cond, "error") [18:41:20.443] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:20.443] NULL) [18:41:20.443] if (is_error) { [18:41:20.443] sessionInformation <- function() { [18:41:20.443] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:20.443] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:20.443] search = base::search(), system = base::Sys.info()) [18:41:20.443] } [18:41:20.443] ...future.conditions[[length(...future.conditions) + [18:41:20.443] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:20.443] cond$call), session = sessionInformation(), [18:41:20.443] timestamp = base::Sys.time(), signaled = 0L) [18:41:20.443] signalCondition(cond) [18:41:20.443] } [18:41:20.443] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:20.443] "immediateCondition"))) { [18:41:20.443] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:20.443] ...future.conditions[[length(...future.conditions) + [18:41:20.443] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:20.443] if (TRUE && !signal) { [18:41:20.443] muffleCondition <- function (cond, pattern = "^muffle") [18:41:20.443] { [18:41:20.443] inherits <- base::inherits [18:41:20.443] invokeRestart <- base::invokeRestart [18:41:20.443] is.null <- base::is.null [18:41:20.443] muffled <- FALSE [18:41:20.443] if (inherits(cond, "message")) { [18:41:20.443] muffled <- grepl(pattern, "muffleMessage") [18:41:20.443] if (muffled) [18:41:20.443] invokeRestart("muffleMessage") [18:41:20.443] } [18:41:20.443] else if (inherits(cond, "warning")) { [18:41:20.443] muffled <- grepl(pattern, "muffleWarning") [18:41:20.443] if (muffled) [18:41:20.443] invokeRestart("muffleWarning") [18:41:20.443] } [18:41:20.443] else if (inherits(cond, "condition")) { [18:41:20.443] if (!is.null(pattern)) { [18:41:20.443] computeRestarts <- base::computeRestarts [18:41:20.443] grepl <- base::grepl [18:41:20.443] restarts <- computeRestarts(cond) [18:41:20.443] for (restart in restarts) { [18:41:20.443] name <- restart$name [18:41:20.443] if (is.null(name)) [18:41:20.443] next [18:41:20.443] if (!grepl(pattern, name)) [18:41:20.443] next [18:41:20.443] invokeRestart(restart) [18:41:20.443] muffled <- TRUE [18:41:20.443] break [18:41:20.443] } [18:41:20.443] } [18:41:20.443] } [18:41:20.443] invisible(muffled) [18:41:20.443] } [18:41:20.443] muffleCondition(cond, pattern = "^muffle") [18:41:20.443] } [18:41:20.443] } [18:41:20.443] else { [18:41:20.443] if (TRUE) { [18:41:20.443] muffleCondition <- function (cond, pattern = "^muffle") [18:41:20.443] { [18:41:20.443] inherits <- base::inherits [18:41:20.443] invokeRestart <- base::invokeRestart [18:41:20.443] is.null <- base::is.null [18:41:20.443] muffled <- FALSE [18:41:20.443] if (inherits(cond, "message")) { [18:41:20.443] muffled <- grepl(pattern, "muffleMessage") [18:41:20.443] if (muffled) [18:41:20.443] invokeRestart("muffleMessage") [18:41:20.443] } [18:41:20.443] else if (inherits(cond, "warning")) { [18:41:20.443] muffled <- grepl(pattern, "muffleWarning") [18:41:20.443] if (muffled) [18:41:20.443] invokeRestart("muffleWarning") [18:41:20.443] } [18:41:20.443] else if (inherits(cond, "condition")) { [18:41:20.443] if (!is.null(pattern)) { [18:41:20.443] computeRestarts <- base::computeRestarts [18:41:20.443] grepl <- base::grepl [18:41:20.443] restarts <- computeRestarts(cond) [18:41:20.443] for (restart in restarts) { [18:41:20.443] name <- restart$name [18:41:20.443] if (is.null(name)) [18:41:20.443] next [18:41:20.443] if (!grepl(pattern, name)) [18:41:20.443] next [18:41:20.443] invokeRestart(restart) [18:41:20.443] muffled <- TRUE [18:41:20.443] break [18:41:20.443] } [18:41:20.443] } [18:41:20.443] } [18:41:20.443] invisible(muffled) [18:41:20.443] } [18:41:20.443] muffleCondition(cond, pattern = "^muffle") [18:41:20.443] } [18:41:20.443] } [18:41:20.443] } [18:41:20.443] })) [18:41:20.443] }, error = function(ex) { [18:41:20.443] base::structure(base::list(value = NULL, visible = NULL, [18:41:20.443] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:20.443] ...future.rng), started = ...future.startTime, [18:41:20.443] finished = Sys.time(), session_uuid = NA_character_, [18:41:20.443] version = "1.8"), class = "FutureResult") [18:41:20.443] }, finally = { [18:41:20.443] if (!identical(...future.workdir, getwd())) [18:41:20.443] setwd(...future.workdir) [18:41:20.443] { [18:41:20.443] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:20.443] ...future.oldOptions$nwarnings <- NULL [18:41:20.443] } [18:41:20.443] base::options(...future.oldOptions) [18:41:20.443] if (.Platform$OS.type == "windows") { [18:41:20.443] old_names <- names(...future.oldEnvVars) [18:41:20.443] envs <- base::Sys.getenv() [18:41:20.443] names <- names(envs) [18:41:20.443] common <- intersect(names, old_names) [18:41:20.443] added <- setdiff(names, old_names) [18:41:20.443] removed <- setdiff(old_names, names) [18:41:20.443] changed <- common[...future.oldEnvVars[common] != [18:41:20.443] envs[common]] [18:41:20.443] NAMES <- toupper(changed) [18:41:20.443] args <- list() [18:41:20.443] for (kk in seq_along(NAMES)) { [18:41:20.443] name <- changed[[kk]] [18:41:20.443] NAME <- NAMES[[kk]] [18:41:20.443] if (name != NAME && is.element(NAME, old_names)) [18:41:20.443] next [18:41:20.443] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:20.443] } [18:41:20.443] NAMES <- toupper(added) [18:41:20.443] for (kk in seq_along(NAMES)) { [18:41:20.443] name <- added[[kk]] [18:41:20.443] NAME <- NAMES[[kk]] [18:41:20.443] if (name != NAME && is.element(NAME, old_names)) [18:41:20.443] next [18:41:20.443] args[[name]] <- "" [18:41:20.443] } [18:41:20.443] NAMES <- toupper(removed) [18:41:20.443] for (kk in seq_along(NAMES)) { [18:41:20.443] name <- removed[[kk]] [18:41:20.443] NAME <- NAMES[[kk]] [18:41:20.443] if (name != NAME && is.element(NAME, old_names)) [18:41:20.443] next [18:41:20.443] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:20.443] } [18:41:20.443] if (length(args) > 0) [18:41:20.443] base::do.call(base::Sys.setenv, args = args) [18:41:20.443] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:20.443] } [18:41:20.443] else { [18:41:20.443] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:20.443] } [18:41:20.443] { [18:41:20.443] if (base::length(...future.futureOptionsAdded) > [18:41:20.443] 0L) { [18:41:20.443] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:20.443] base::names(opts) <- ...future.futureOptionsAdded [18:41:20.443] base::options(opts) [18:41:20.443] } [18:41:20.443] { [18:41:20.443] { [18:41:20.443] NULL [18:41:20.443] RNGkind("Mersenne-Twister") [18:41:20.443] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:20.443] inherits = FALSE) [18:41:20.443] } [18:41:20.443] options(future.plan = NULL) [18:41:20.443] if (is.na(NA_character_)) [18:41:20.443] Sys.unsetenv("R_FUTURE_PLAN") [18:41:20.443] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:20.443] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:20.443] .init = FALSE) [18:41:20.443] } [18:41:20.443] } [18:41:20.443] } [18:41:20.443] }) [18:41:20.443] if (TRUE) { [18:41:20.443] base::sink(type = "output", split = FALSE) [18:41:20.443] if (TRUE) { [18:41:20.443] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:20.443] } [18:41:20.443] else { [18:41:20.443] ...future.result["stdout"] <- base::list(NULL) [18:41:20.443] } [18:41:20.443] base::close(...future.stdout) [18:41:20.443] ...future.stdout <- NULL [18:41:20.443] } [18:41:20.443] ...future.result$conditions <- ...future.conditions [18:41:20.443] ...future.result$finished <- base::Sys.time() [18:41:20.443] ...future.result [18:41:20.443] } [18:41:20.451] assign_globals() ... [18:41:20.451] List of 5 [18:41:20.451] $ ...future.FUN :function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [18:41:20.451] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [18:41:20.451] $ future.call.arguments :List of 2 [18:41:20.451] ..$ collapse: chr "; " [18:41:20.451] ..$ maxHead : int 3 [18:41:20.451] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:20.451] $ ...future.elements_ii :List of 1 [18:41:20.451] ..$ a: Named chr [1:101] "hello" "1" "2" "3" ... [18:41:20.451] .. ..- attr(*, "names")= chr [1:101] "" "b1" "b2" "b3" ... [18:41:20.451] $ ...future.seeds_ii : NULL [18:41:20.451] $ ...future.globals.maxSize: NULL [18:41:20.451] - attr(*, "where")=List of 5 [18:41:20.451] ..$ ...future.FUN : [18:41:20.451] ..$ future.call.arguments : [18:41:20.451] ..$ ...future.elements_ii : [18:41:20.451] ..$ ...future.seeds_ii : [18:41:20.451] ..$ ...future.globals.maxSize: [18:41:20.451] - attr(*, "resolved")= logi FALSE [18:41:20.451] - attr(*, "total_size")= num 20301 [18:41:20.451] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:20.451] - attr(*, "already-done")= logi TRUE [18:41:20.476] - copied '...future.FUN' to environment [18:41:20.476] - copied 'future.call.arguments' to environment [18:41:20.476] - copied '...future.elements_ii' to environment [18:41:20.477] - copied '...future.seeds_ii' to environment [18:41:20.477] - copied '...future.globals.maxSize' to environment [18:41:20.477] assign_globals() ... done [18:41:20.478] plan(): Setting new future strategy stack: [18:41:20.479] List of future strategies: [18:41:20.479] 1. sequential: [18:41:20.479] - args: function (..., envir = parent.frame(), workers = "") [18:41:20.479] - tweaked: FALSE [18:41:20.479] - call: NULL [18:41:20.480] plan(): nbrOfWorkers() = 1 [18:41:20.483] plan(): Setting new future strategy stack: [18:41:20.483] List of future strategies: [18:41:20.483] 1. sequential: [18:41:20.483] - args: function (..., envir = parent.frame(), workers = "") [18:41:20.483] - tweaked: FALSE [18:41:20.483] - call: plan(strategy) [18:41:20.484] plan(): nbrOfWorkers() = 1 [18:41:20.484] SequentialFuture started (and completed) [18:41:20.485] - Launch lazy future ... done [18:41:20.485] run() for 'SequentialFuture' ... done [18:41:20.486] Created future: [18:41:20.486] SequentialFuture: [18:41:20.486] Label: 'future_lapply-1' [18:41:20.486] Expression: [18:41:20.486] { [18:41:20.486] do.call(function(...) { [18:41:20.486] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.486] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:20.486] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.486] on.exit(options(oopts), add = TRUE) [18:41:20.486] } [18:41:20.486] { [18:41:20.486] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:20.486] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.486] ...future.FUN(...future.X_jj, ...) [18:41:20.486] }) [18:41:20.486] } [18:41:20.486] }, args = future.call.arguments) [18:41:20.486] } [18:41:20.486] Lazy evaluation: FALSE [18:41:20.486] Asynchronous evaluation: FALSE [18:41:20.486] Local evaluation: TRUE [18:41:20.486] Environment: R_GlobalEnv [18:41:20.486] Capture standard output: TRUE [18:41:20.486] Capture condition classes: 'condition' (excluding 'nothing') [18:41:20.486] Globals: 5 objects totaling 9.56 KiB (function '...future.FUN' of 7.17 KiB, DotDotDotList 'future.call.arguments' of 187 bytes, list '...future.elements_ii' of 2.15 KiB, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:20.486] Packages: 1 packages ('future') [18:41:20.486] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:20.486] Resolved: TRUE [18:41:20.486] Value: 68 bytes of class 'list' [18:41:20.486] Early signaling: FALSE [18:41:20.486] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:20.486] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:20.488] Chunk #1 of 1 ... DONE [18:41:20.488] Launching 1 futures (chunks) ... DONE [18:41:20.489] Resolving 1 futures (chunks) ... [18:41:20.489] resolve() on list ... [18:41:20.489] recursive: 0 [18:41:20.490] length: 1 [18:41:20.490] [18:41:20.490] resolved() for 'SequentialFuture' ... [18:41:20.490] - state: 'finished' [18:41:20.491] - run: TRUE [18:41:20.491] - result: 'FutureResult' [18:41:20.491] resolved() for 'SequentialFuture' ... done [18:41:20.492] Future #1 [18:41:20.492] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:20.492] - nx: 1 [18:41:20.493] - relay: TRUE [18:41:20.493] - stdout: TRUE [18:41:20.493] - signal: TRUE [18:41:20.493] - resignal: FALSE [18:41:20.494] - force: TRUE [18:41:20.494] - relayed: [n=1] FALSE [18:41:20.494] - queued futures: [n=1] FALSE [18:41:20.495] - until=1 [18:41:20.495] - relaying element #1 [18:41:20.495] - relayed: [n=1] TRUE [18:41:20.496] - queued futures: [n=1] TRUE [18:41:20.496] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:20.496] length: 0 (resolved future 1) [18:41:20.497] Relaying remaining futures [18:41:20.497] signalConditionsASAP(NULL, pos=0) ... [18:41:20.497] - nx: 1 [18:41:20.497] - relay: TRUE [18:41:20.498] - stdout: TRUE [18:41:20.498] - signal: TRUE [18:41:20.498] - resignal: FALSE [18:41:20.499] - force: TRUE [18:41:20.499] - relayed: [n=1] TRUE [18:41:20.499] - queued futures: [n=1] TRUE - flush all [18:41:20.500] - relayed: [n=1] TRUE [18:41:20.500] - queued futures: [n=1] TRUE [18:41:20.500] signalConditionsASAP(NULL, pos=0) ... done [18:41:20.500] resolve() on list ... DONE [18:41:20.501] - Number of value chunks collected: 1 [18:41:20.501] Resolving 1 futures (chunks) ... DONE [18:41:20.502] Reducing values from 1 chunks ... [18:41:20.502] - Number of values collected after concatenation: 1 [18:41:20.502] - Number of values expected: 1 [18:41:20.502] Reducing values from 1 chunks ... DONE [18:41:20.502] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [18:41:20.504] future_lapply() ... [18:41:20.505] Number of chunks: 2 [18:41:20.506] getGlobalsAndPackagesXApply() ... [18:41:20.506] - future.globals: TRUE [18:41:20.506] getGlobalsAndPackages() ... [18:41:20.506] Searching for globals... [18:41:20.508] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [18:41:20.509] Searching for globals ... DONE [18:41:20.509] Resolving globals: FALSE [18:41:20.509] The total size of the 1 globals is 911 bytes (911 bytes) [18:41:20.510] The total size of the 1 globals exported for future expression ('FUN()') is 911 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (911 bytes of class 'function') [18:41:20.510] - globals: [1] 'FUN' [18:41:20.511] - packages: [1] 'listenv' [18:41:20.511] getGlobalsAndPackages() ... DONE [18:41:20.511] - globals found/used: [n=1] 'FUN' [18:41:20.511] - needed namespaces: [n=1] 'listenv' [18:41:20.512] Finding globals ... DONE [18:41:20.512] - use_args: TRUE [18:41:20.512] - Getting '...' globals ... [18:41:20.513] resolve() on list ... [18:41:20.513] recursive: 0 [18:41:20.513] length: 1 [18:41:20.513] elements: '...' [18:41:20.513] length: 0 (resolved future 1) [18:41:20.514] resolve() on list ... DONE [18:41:20.514] - '...' content: [n=0] [18:41:20.514] List of 1 [18:41:20.514] $ ...: list() [18:41:20.514] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:20.514] - attr(*, "where")=List of 1 [18:41:20.514] ..$ ...: [18:41:20.514] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:20.514] - attr(*, "resolved")= logi TRUE [18:41:20.514] - attr(*, "total_size")= num NA [18:41:20.518] - Getting '...' globals ... DONE [18:41:20.518] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:20.519] List of 2 [18:41:20.519] $ ...future.FUN:function (x, ...) [18:41:20.519] $ ... : list() [18:41:20.519] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:20.519] - attr(*, "where")=List of 2 [18:41:20.519] ..$ ...future.FUN: [18:41:20.519] ..$ ... : [18:41:20.519] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:20.519] - attr(*, "resolved")= logi FALSE [18:41:20.519] - attr(*, "total_size")= int 8145 [18:41:20.523] Packages to be attached in all futures: [n=1] 'listenv' [18:41:20.523] getGlobalsAndPackagesXApply() ... DONE [18:41:20.523] Number of futures (= number of chunks): 2 [18:41:20.524] Launching 2 futures (chunks) ... [18:41:20.524] Chunk #1 of 2 ... [18:41:20.524] - Finding globals in 'X' for chunk #1 ... [18:41:20.524] getGlobalsAndPackages() ... [18:41:20.525] Searching for globals... [18:41:20.525] [18:41:20.525] Searching for globals ... DONE [18:41:20.526] - globals: [0] [18:41:20.526] getGlobalsAndPackages() ... DONE [18:41:20.526] + additional globals found: [n=0] [18:41:20.526] + additional namespaces needed: [n=0] [18:41:20.526] - Finding globals in 'X' for chunk #1 ... DONE [18:41:20.526] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:20.527] - seeds: [18:41:20.527] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.527] getGlobalsAndPackages() ... [18:41:20.527] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.528] Resolving globals: FALSE [18:41:20.528] Tweak future expression to call with '...' arguments ... [18:41:20.528] { [18:41:20.528] do.call(function(...) { [18:41:20.528] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.528] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:20.528] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.528] on.exit(options(oopts), add = TRUE) [18:41:20.528] } [18:41:20.528] { [18:41:20.528] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:20.528] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.528] ...future.FUN(...future.X_jj, ...) [18:41:20.528] }) [18:41:20.528] } [18:41:20.528] }, args = future.call.arguments) [18:41:20.528] } [18:41:20.528] Tweak future expression to call with '...' arguments ... DONE [18:41:20.529] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.529] - packages: [1] 'listenv' [18:41:20.530] getGlobalsAndPackages() ... DONE [18:41:20.530] run() for 'Future' ... [18:41:20.530] - state: 'created' [18:41:20.530] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:20.531] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:20.531] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:20.531] - Field: 'label' [18:41:20.532] - Field: 'local' [18:41:20.532] - Field: 'owner' [18:41:20.532] - Field: 'envir' [18:41:20.532] - Field: 'packages' [18:41:20.532] - Field: 'gc' [18:41:20.533] - Field: 'conditions' [18:41:20.533] - Field: 'expr' [18:41:20.533] - Field: 'uuid' [18:41:20.533] - Field: 'seed' [18:41:20.533] - Field: 'version' [18:41:20.534] - Field: 'result' [18:41:20.534] - Field: 'asynchronous' [18:41:20.534] - Field: 'calls' [18:41:20.534] - Field: 'globals' [18:41:20.534] - Field: 'stdout' [18:41:20.535] - Field: 'earlySignal' [18:41:20.535] - Field: 'lazy' [18:41:20.535] - Field: 'state' [18:41:20.535] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:20.535] - Launch lazy future ... [18:41:20.536] Packages needed by the future expression (n = 1): 'listenv' [18:41:20.536] Packages needed by future strategies (n = 0): [18:41:20.537] { [18:41:20.537] { [18:41:20.537] { [18:41:20.537] ...future.startTime <- base::Sys.time() [18:41:20.537] { [18:41:20.537] { [18:41:20.537] { [18:41:20.537] { [18:41:20.537] base::local({ [18:41:20.537] has_future <- base::requireNamespace("future", [18:41:20.537] quietly = TRUE) [18:41:20.537] if (has_future) { [18:41:20.537] ns <- base::getNamespace("future") [18:41:20.537] version <- ns[[".package"]][["version"]] [18:41:20.537] if (is.null(version)) [18:41:20.537] version <- utils::packageVersion("future") [18:41:20.537] } [18:41:20.537] else { [18:41:20.537] version <- NULL [18:41:20.537] } [18:41:20.537] if (!has_future || version < "1.8.0") { [18:41:20.537] info <- base::c(r_version = base::gsub("R version ", [18:41:20.537] "", base::R.version$version.string), [18:41:20.537] platform = base::sprintf("%s (%s-bit)", [18:41:20.537] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:20.537] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:20.537] "release", "version")], collapse = " "), [18:41:20.537] hostname = base::Sys.info()[["nodename"]]) [18:41:20.537] info <- base::sprintf("%s: %s", base::names(info), [18:41:20.537] info) [18:41:20.537] info <- base::paste(info, collapse = "; ") [18:41:20.537] if (!has_future) { [18:41:20.537] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:20.537] info) [18:41:20.537] } [18:41:20.537] else { [18:41:20.537] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:20.537] info, version) [18:41:20.537] } [18:41:20.537] base::stop(msg) [18:41:20.537] } [18:41:20.537] }) [18:41:20.537] } [18:41:20.537] base::local({ [18:41:20.537] for (pkg in "listenv") { [18:41:20.537] base::loadNamespace(pkg) [18:41:20.537] base::library(pkg, character.only = TRUE) [18:41:20.537] } [18:41:20.537] }) [18:41:20.537] } [18:41:20.537] ...future.strategy.old <- future::plan("list") [18:41:20.537] options(future.plan = NULL) [18:41:20.537] Sys.unsetenv("R_FUTURE_PLAN") [18:41:20.537] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:20.537] } [18:41:20.537] ...future.workdir <- getwd() [18:41:20.537] } [18:41:20.537] ...future.oldOptions <- base::as.list(base::.Options) [18:41:20.537] ...future.oldEnvVars <- base::Sys.getenv() [18:41:20.537] } [18:41:20.537] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:20.537] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:20.537] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:20.537] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:20.537] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:20.537] future.stdout.windows.reencode = NULL, width = 80L) [18:41:20.537] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:20.537] base::names(...future.oldOptions)) [18:41:20.537] } [18:41:20.537] if (FALSE) { [18:41:20.537] } [18:41:20.537] else { [18:41:20.537] if (TRUE) { [18:41:20.537] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:20.537] open = "w") [18:41:20.537] } [18:41:20.537] else { [18:41:20.537] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:20.537] windows = "NUL", "/dev/null"), open = "w") [18:41:20.537] } [18:41:20.537] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:20.537] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:20.537] base::sink(type = "output", split = FALSE) [18:41:20.537] base::close(...future.stdout) [18:41:20.537] }, add = TRUE) [18:41:20.537] } [18:41:20.537] ...future.frame <- base::sys.nframe() [18:41:20.537] ...future.conditions <- base::list() [18:41:20.537] ...future.rng <- base::globalenv()$.Random.seed [18:41:20.537] if (FALSE) { [18:41:20.537] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:20.537] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:20.537] } [18:41:20.537] ...future.result <- base::tryCatch({ [18:41:20.537] base::withCallingHandlers({ [18:41:20.537] ...future.value <- base::withVisible(base::local({ [18:41:20.537] do.call(function(...) { [18:41:20.537] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.537] if (!identical(...future.globals.maxSize.org, [18:41:20.537] ...future.globals.maxSize)) { [18:41:20.537] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.537] on.exit(options(oopts), add = TRUE) [18:41:20.537] } [18:41:20.537] { [18:41:20.537] lapply(seq_along(...future.elements_ii), [18:41:20.537] FUN = function(jj) { [18:41:20.537] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.537] ...future.FUN(...future.X_jj, ...) [18:41:20.537] }) [18:41:20.537] } [18:41:20.537] }, args = future.call.arguments) [18:41:20.537] })) [18:41:20.537] future::FutureResult(value = ...future.value$value, [18:41:20.537] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:20.537] ...future.rng), globalenv = if (FALSE) [18:41:20.537] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:20.537] ...future.globalenv.names)) [18:41:20.537] else NULL, started = ...future.startTime, version = "1.8") [18:41:20.537] }, condition = base::local({ [18:41:20.537] c <- base::c [18:41:20.537] inherits <- base::inherits [18:41:20.537] invokeRestart <- base::invokeRestart [18:41:20.537] length <- base::length [18:41:20.537] list <- base::list [18:41:20.537] seq.int <- base::seq.int [18:41:20.537] signalCondition <- base::signalCondition [18:41:20.537] sys.calls <- base::sys.calls [18:41:20.537] `[[` <- base::`[[` [18:41:20.537] `+` <- base::`+` [18:41:20.537] `<<-` <- base::`<<-` [18:41:20.537] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:20.537] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:20.537] 3L)] [18:41:20.537] } [18:41:20.537] function(cond) { [18:41:20.537] is_error <- inherits(cond, "error") [18:41:20.537] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:20.537] NULL) [18:41:20.537] if (is_error) { [18:41:20.537] sessionInformation <- function() { [18:41:20.537] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:20.537] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:20.537] search = base::search(), system = base::Sys.info()) [18:41:20.537] } [18:41:20.537] ...future.conditions[[length(...future.conditions) + [18:41:20.537] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:20.537] cond$call), session = sessionInformation(), [18:41:20.537] timestamp = base::Sys.time(), signaled = 0L) [18:41:20.537] signalCondition(cond) [18:41:20.537] } [18:41:20.537] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:20.537] "immediateCondition"))) { [18:41:20.537] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:20.537] ...future.conditions[[length(...future.conditions) + [18:41:20.537] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:20.537] if (TRUE && !signal) { [18:41:20.537] muffleCondition <- function (cond, pattern = "^muffle") [18:41:20.537] { [18:41:20.537] inherits <- base::inherits [18:41:20.537] invokeRestart <- base::invokeRestart [18:41:20.537] is.null <- base::is.null [18:41:20.537] muffled <- FALSE [18:41:20.537] if (inherits(cond, "message")) { [18:41:20.537] muffled <- grepl(pattern, "muffleMessage") [18:41:20.537] if (muffled) [18:41:20.537] invokeRestart("muffleMessage") [18:41:20.537] } [18:41:20.537] else if (inherits(cond, "warning")) { [18:41:20.537] muffled <- grepl(pattern, "muffleWarning") [18:41:20.537] if (muffled) [18:41:20.537] invokeRestart("muffleWarning") [18:41:20.537] } [18:41:20.537] else if (inherits(cond, "condition")) { [18:41:20.537] if (!is.null(pattern)) { [18:41:20.537] computeRestarts <- base::computeRestarts [18:41:20.537] grepl <- base::grepl [18:41:20.537] restarts <- computeRestarts(cond) [18:41:20.537] for (restart in restarts) { [18:41:20.537] name <- restart$name [18:41:20.537] if (is.null(name)) [18:41:20.537] next [18:41:20.537] if (!grepl(pattern, name)) [18:41:20.537] next [18:41:20.537] invokeRestart(restart) [18:41:20.537] muffled <- TRUE [18:41:20.537] break [18:41:20.537] } [18:41:20.537] } [18:41:20.537] } [18:41:20.537] invisible(muffled) [18:41:20.537] } [18:41:20.537] muffleCondition(cond, pattern = "^muffle") [18:41:20.537] } [18:41:20.537] } [18:41:20.537] else { [18:41:20.537] if (TRUE) { [18:41:20.537] muffleCondition <- function (cond, pattern = "^muffle") [18:41:20.537] { [18:41:20.537] inherits <- base::inherits [18:41:20.537] invokeRestart <- base::invokeRestart [18:41:20.537] is.null <- base::is.null [18:41:20.537] muffled <- FALSE [18:41:20.537] if (inherits(cond, "message")) { [18:41:20.537] muffled <- grepl(pattern, "muffleMessage") [18:41:20.537] if (muffled) [18:41:20.537] invokeRestart("muffleMessage") [18:41:20.537] } [18:41:20.537] else if (inherits(cond, "warning")) { [18:41:20.537] muffled <- grepl(pattern, "muffleWarning") [18:41:20.537] if (muffled) [18:41:20.537] invokeRestart("muffleWarning") [18:41:20.537] } [18:41:20.537] else if (inherits(cond, "condition")) { [18:41:20.537] if (!is.null(pattern)) { [18:41:20.537] computeRestarts <- base::computeRestarts [18:41:20.537] grepl <- base::grepl [18:41:20.537] restarts <- computeRestarts(cond) [18:41:20.537] for (restart in restarts) { [18:41:20.537] name <- restart$name [18:41:20.537] if (is.null(name)) [18:41:20.537] next [18:41:20.537] if (!grepl(pattern, name)) [18:41:20.537] next [18:41:20.537] invokeRestart(restart) [18:41:20.537] muffled <- TRUE [18:41:20.537] break [18:41:20.537] } [18:41:20.537] } [18:41:20.537] } [18:41:20.537] invisible(muffled) [18:41:20.537] } [18:41:20.537] muffleCondition(cond, pattern = "^muffle") [18:41:20.537] } [18:41:20.537] } [18:41:20.537] } [18:41:20.537] })) [18:41:20.537] }, error = function(ex) { [18:41:20.537] base::structure(base::list(value = NULL, visible = NULL, [18:41:20.537] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:20.537] ...future.rng), started = ...future.startTime, [18:41:20.537] finished = Sys.time(), session_uuid = NA_character_, [18:41:20.537] version = "1.8"), class = "FutureResult") [18:41:20.537] }, finally = { [18:41:20.537] if (!identical(...future.workdir, getwd())) [18:41:20.537] setwd(...future.workdir) [18:41:20.537] { [18:41:20.537] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:20.537] ...future.oldOptions$nwarnings <- NULL [18:41:20.537] } [18:41:20.537] base::options(...future.oldOptions) [18:41:20.537] if (.Platform$OS.type == "windows") { [18:41:20.537] old_names <- names(...future.oldEnvVars) [18:41:20.537] envs <- base::Sys.getenv() [18:41:20.537] names <- names(envs) [18:41:20.537] common <- intersect(names, old_names) [18:41:20.537] added <- setdiff(names, old_names) [18:41:20.537] removed <- setdiff(old_names, names) [18:41:20.537] changed <- common[...future.oldEnvVars[common] != [18:41:20.537] envs[common]] [18:41:20.537] NAMES <- toupper(changed) [18:41:20.537] args <- list() [18:41:20.537] for (kk in seq_along(NAMES)) { [18:41:20.537] name <- changed[[kk]] [18:41:20.537] NAME <- NAMES[[kk]] [18:41:20.537] if (name != NAME && is.element(NAME, old_names)) [18:41:20.537] next [18:41:20.537] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:20.537] } [18:41:20.537] NAMES <- toupper(added) [18:41:20.537] for (kk in seq_along(NAMES)) { [18:41:20.537] name <- added[[kk]] [18:41:20.537] NAME <- NAMES[[kk]] [18:41:20.537] if (name != NAME && is.element(NAME, old_names)) [18:41:20.537] next [18:41:20.537] args[[name]] <- "" [18:41:20.537] } [18:41:20.537] NAMES <- toupper(removed) [18:41:20.537] for (kk in seq_along(NAMES)) { [18:41:20.537] name <- removed[[kk]] [18:41:20.537] NAME <- NAMES[[kk]] [18:41:20.537] if (name != NAME && is.element(NAME, old_names)) [18:41:20.537] next [18:41:20.537] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:20.537] } [18:41:20.537] if (length(args) > 0) [18:41:20.537] base::do.call(base::Sys.setenv, args = args) [18:41:20.537] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:20.537] } [18:41:20.537] else { [18:41:20.537] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:20.537] } [18:41:20.537] { [18:41:20.537] if (base::length(...future.futureOptionsAdded) > [18:41:20.537] 0L) { [18:41:20.537] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:20.537] base::names(opts) <- ...future.futureOptionsAdded [18:41:20.537] base::options(opts) [18:41:20.537] } [18:41:20.537] { [18:41:20.537] { [18:41:20.537] NULL [18:41:20.537] RNGkind("Mersenne-Twister") [18:41:20.537] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:20.537] inherits = FALSE) [18:41:20.537] } [18:41:20.537] options(future.plan = NULL) [18:41:20.537] if (is.na(NA_character_)) [18:41:20.537] Sys.unsetenv("R_FUTURE_PLAN") [18:41:20.537] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:20.537] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:20.537] .init = FALSE) [18:41:20.537] } [18:41:20.537] } [18:41:20.537] } [18:41:20.537] }) [18:41:20.537] if (TRUE) { [18:41:20.537] base::sink(type = "output", split = FALSE) [18:41:20.537] if (TRUE) { [18:41:20.537] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:20.537] } [18:41:20.537] else { [18:41:20.537] ...future.result["stdout"] <- base::list(NULL) [18:41:20.537] } [18:41:20.537] base::close(...future.stdout) [18:41:20.537] ...future.stdout <- NULL [18:41:20.537] } [18:41:20.537] ...future.result$conditions <- ...future.conditions [18:41:20.537] ...future.result$finished <- base::Sys.time() [18:41:20.537] ...future.result [18:41:20.537] } [18:41:20.541] assign_globals() ... [18:41:20.541] List of 5 [18:41:20.541] $ ...future.FUN :function (x, ...) [18:41:20.541] $ future.call.arguments : list() [18:41:20.541] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:20.541] $ ...future.elements_ii :List of 1 [18:41:20.541] ..$ a:Classes 'listenv', 'environment' [18:41:20.541] $ ...future.seeds_ii : NULL [18:41:20.541] $ ...future.globals.maxSize: NULL [18:41:20.541] - attr(*, "where")=List of 5 [18:41:20.541] ..$ ...future.FUN : [18:41:20.541] ..$ future.call.arguments : [18:41:20.541] ..$ ...future.elements_ii : [18:41:20.541] ..$ ...future.seeds_ii : [18:41:20.541] ..$ ...future.globals.maxSize: [18:41:20.541] - attr(*, "resolved")= logi FALSE [18:41:20.541] - attr(*, "total_size")= num 8145 [18:41:20.541] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:20.541] - attr(*, "already-done")= logi TRUE [18:41:20.548] - copied '...future.FUN' to environment [18:41:20.549] - copied 'future.call.arguments' to environment [18:41:20.549] - copied '...future.elements_ii' to environment [18:41:20.549] - copied '...future.seeds_ii' to environment [18:41:20.549] - copied '...future.globals.maxSize' to environment [18:41:20.549] assign_globals() ... done [18:41:20.550] plan(): Setting new future strategy stack: [18:41:20.550] List of future strategies: [18:41:20.550] 1. sequential: [18:41:20.550] - args: function (..., envir = parent.frame(), workers = "") [18:41:20.550] - tweaked: FALSE [18:41:20.550] - call: NULL [18:41:20.551] plan(): nbrOfWorkers() = 1 [18:41:20.553] plan(): Setting new future strategy stack: [18:41:20.553] List of future strategies: [18:41:20.553] 1. sequential: [18:41:20.553] - args: function (..., envir = parent.frame(), workers = "") [18:41:20.553] - tweaked: FALSE [18:41:20.553] - call: plan(strategy) [18:41:20.554] plan(): nbrOfWorkers() = 1 [18:41:20.554] SequentialFuture started (and completed) [18:41:20.554] - Launch lazy future ... done [18:41:20.555] run() for 'SequentialFuture' ... done [18:41:20.555] Created future: [18:41:20.555] SequentialFuture: [18:41:20.555] Label: 'future_lapply-1' [18:41:20.555] Expression: [18:41:20.555] { [18:41:20.555] do.call(function(...) { [18:41:20.555] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.555] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:20.555] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.555] on.exit(options(oopts), add = TRUE) [18:41:20.555] } [18:41:20.555] { [18:41:20.555] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:20.555] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.555] ...future.FUN(...future.X_jj, ...) [18:41:20.555] }) [18:41:20.555] } [18:41:20.555] }, args = future.call.arguments) [18:41:20.555] } [18:41:20.555] Lazy evaluation: FALSE [18:41:20.555] Asynchronous evaluation: FALSE [18:41:20.555] Local evaluation: TRUE [18:41:20.555] Environment: R_GlobalEnv [18:41:20.555] Capture standard output: TRUE [18:41:20.555] Capture condition classes: 'condition' (excluding 'nothing') [18:41:20.555] Globals: 5 objects totaling 1.59 KiB (function '...future.FUN' of 911 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 569 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:20.555] Packages: 1 packages ('listenv') [18:41:20.555] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:20.555] Resolved: TRUE [18:41:20.555] Value: 90 bytes of class 'list' [18:41:20.555] Early signaling: FALSE [18:41:20.555] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:20.555] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:20.556] Chunk #1 of 2 ... DONE [18:41:20.557] Chunk #2 of 2 ... [18:41:20.557] - Finding globals in 'X' for chunk #2 ... [18:41:20.557] getGlobalsAndPackages() ... [18:41:20.557] Searching for globals... [18:41:20.558] [18:41:20.558] Searching for globals ... DONE [18:41:20.558] - globals: [0] [18:41:20.558] getGlobalsAndPackages() ... DONE [18:41:20.559] + additional globals found: [n=0] [18:41:20.559] + additional namespaces needed: [n=0] [18:41:20.559] - Finding globals in 'X' for chunk #2 ... DONE [18:41:20.559] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:20.559] - seeds: [18:41:20.560] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.560] getGlobalsAndPackages() ... [18:41:20.560] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.560] Resolving globals: FALSE [18:41:20.560] Tweak future expression to call with '...' arguments ... [18:41:20.561] { [18:41:20.561] do.call(function(...) { [18:41:20.561] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.561] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:20.561] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.561] on.exit(options(oopts), add = TRUE) [18:41:20.561] } [18:41:20.561] { [18:41:20.561] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:20.561] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.561] ...future.FUN(...future.X_jj, ...) [18:41:20.561] }) [18:41:20.561] } [18:41:20.561] }, args = future.call.arguments) [18:41:20.561] } [18:41:20.561] Tweak future expression to call with '...' arguments ... DONE [18:41:20.562] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.562] - packages: [1] 'listenv' [18:41:20.562] getGlobalsAndPackages() ... DONE [18:41:20.563] run() for 'Future' ... [18:41:20.563] - state: 'created' [18:41:20.563] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:20.564] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:20.564] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:20.564] - Field: 'label' [18:41:20.564] - Field: 'local' [18:41:20.565] - Field: 'owner' [18:41:20.565] - Field: 'envir' [18:41:20.565] - Field: 'packages' [18:41:20.565] - Field: 'gc' [18:41:20.565] - Field: 'conditions' [18:41:20.566] - Field: 'expr' [18:41:20.566] - Field: 'uuid' [18:41:20.566] - Field: 'seed' [18:41:20.566] - Field: 'version' [18:41:20.566] - Field: 'result' [18:41:20.567] - Field: 'asynchronous' [18:41:20.567] - Field: 'calls' [18:41:20.567] - Field: 'globals' [18:41:20.567] - Field: 'stdout' [18:41:20.567] - Field: 'earlySignal' [18:41:20.568] - Field: 'lazy' [18:41:20.568] - Field: 'state' [18:41:20.568] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:20.568] - Launch lazy future ... [18:41:20.568] Packages needed by the future expression (n = 1): 'listenv' [18:41:20.569] Packages needed by future strategies (n = 0): [18:41:20.569] { [18:41:20.569] { [18:41:20.569] { [18:41:20.569] ...future.startTime <- base::Sys.time() [18:41:20.569] { [18:41:20.569] { [18:41:20.569] { [18:41:20.569] { [18:41:20.569] base::local({ [18:41:20.569] has_future <- base::requireNamespace("future", [18:41:20.569] quietly = TRUE) [18:41:20.569] if (has_future) { [18:41:20.569] ns <- base::getNamespace("future") [18:41:20.569] version <- ns[[".package"]][["version"]] [18:41:20.569] if (is.null(version)) [18:41:20.569] version <- utils::packageVersion("future") [18:41:20.569] } [18:41:20.569] else { [18:41:20.569] version <- NULL [18:41:20.569] } [18:41:20.569] if (!has_future || version < "1.8.0") { [18:41:20.569] info <- base::c(r_version = base::gsub("R version ", [18:41:20.569] "", base::R.version$version.string), [18:41:20.569] platform = base::sprintf("%s (%s-bit)", [18:41:20.569] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:20.569] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:20.569] "release", "version")], collapse = " "), [18:41:20.569] hostname = base::Sys.info()[["nodename"]]) [18:41:20.569] info <- base::sprintf("%s: %s", base::names(info), [18:41:20.569] info) [18:41:20.569] info <- base::paste(info, collapse = "; ") [18:41:20.569] if (!has_future) { [18:41:20.569] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:20.569] info) [18:41:20.569] } [18:41:20.569] else { [18:41:20.569] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:20.569] info, version) [18:41:20.569] } [18:41:20.569] base::stop(msg) [18:41:20.569] } [18:41:20.569] }) [18:41:20.569] } [18:41:20.569] base::local({ [18:41:20.569] for (pkg in "listenv") { [18:41:20.569] base::loadNamespace(pkg) [18:41:20.569] base::library(pkg, character.only = TRUE) [18:41:20.569] } [18:41:20.569] }) [18:41:20.569] } [18:41:20.569] ...future.strategy.old <- future::plan("list") [18:41:20.569] options(future.plan = NULL) [18:41:20.569] Sys.unsetenv("R_FUTURE_PLAN") [18:41:20.569] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:20.569] } [18:41:20.569] ...future.workdir <- getwd() [18:41:20.569] } [18:41:20.569] ...future.oldOptions <- base::as.list(base::.Options) [18:41:20.569] ...future.oldEnvVars <- base::Sys.getenv() [18:41:20.569] } [18:41:20.569] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:20.569] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:20.569] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:20.569] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:20.569] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:20.569] future.stdout.windows.reencode = NULL, width = 80L) [18:41:20.569] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:20.569] base::names(...future.oldOptions)) [18:41:20.569] } [18:41:20.569] if (FALSE) { [18:41:20.569] } [18:41:20.569] else { [18:41:20.569] if (TRUE) { [18:41:20.569] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:20.569] open = "w") [18:41:20.569] } [18:41:20.569] else { [18:41:20.569] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:20.569] windows = "NUL", "/dev/null"), open = "w") [18:41:20.569] } [18:41:20.569] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:20.569] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:20.569] base::sink(type = "output", split = FALSE) [18:41:20.569] base::close(...future.stdout) [18:41:20.569] }, add = TRUE) [18:41:20.569] } [18:41:20.569] ...future.frame <- base::sys.nframe() [18:41:20.569] ...future.conditions <- base::list() [18:41:20.569] ...future.rng <- base::globalenv()$.Random.seed [18:41:20.569] if (FALSE) { [18:41:20.569] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:20.569] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:20.569] } [18:41:20.569] ...future.result <- base::tryCatch({ [18:41:20.569] base::withCallingHandlers({ [18:41:20.569] ...future.value <- base::withVisible(base::local({ [18:41:20.569] do.call(function(...) { [18:41:20.569] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.569] if (!identical(...future.globals.maxSize.org, [18:41:20.569] ...future.globals.maxSize)) { [18:41:20.569] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.569] on.exit(options(oopts), add = TRUE) [18:41:20.569] } [18:41:20.569] { [18:41:20.569] lapply(seq_along(...future.elements_ii), [18:41:20.569] FUN = function(jj) { [18:41:20.569] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.569] ...future.FUN(...future.X_jj, ...) [18:41:20.569] }) [18:41:20.569] } [18:41:20.569] }, args = future.call.arguments) [18:41:20.569] })) [18:41:20.569] future::FutureResult(value = ...future.value$value, [18:41:20.569] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:20.569] ...future.rng), globalenv = if (FALSE) [18:41:20.569] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:20.569] ...future.globalenv.names)) [18:41:20.569] else NULL, started = ...future.startTime, version = "1.8") [18:41:20.569] }, condition = base::local({ [18:41:20.569] c <- base::c [18:41:20.569] inherits <- base::inherits [18:41:20.569] invokeRestart <- base::invokeRestart [18:41:20.569] length <- base::length [18:41:20.569] list <- base::list [18:41:20.569] seq.int <- base::seq.int [18:41:20.569] signalCondition <- base::signalCondition [18:41:20.569] sys.calls <- base::sys.calls [18:41:20.569] `[[` <- base::`[[` [18:41:20.569] `+` <- base::`+` [18:41:20.569] `<<-` <- base::`<<-` [18:41:20.569] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:20.569] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:20.569] 3L)] [18:41:20.569] } [18:41:20.569] function(cond) { [18:41:20.569] is_error <- inherits(cond, "error") [18:41:20.569] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:20.569] NULL) [18:41:20.569] if (is_error) { [18:41:20.569] sessionInformation <- function() { [18:41:20.569] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:20.569] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:20.569] search = base::search(), system = base::Sys.info()) [18:41:20.569] } [18:41:20.569] ...future.conditions[[length(...future.conditions) + [18:41:20.569] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:20.569] cond$call), session = sessionInformation(), [18:41:20.569] timestamp = base::Sys.time(), signaled = 0L) [18:41:20.569] signalCondition(cond) [18:41:20.569] } [18:41:20.569] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:20.569] "immediateCondition"))) { [18:41:20.569] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:20.569] ...future.conditions[[length(...future.conditions) + [18:41:20.569] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:20.569] if (TRUE && !signal) { [18:41:20.569] muffleCondition <- function (cond, pattern = "^muffle") [18:41:20.569] { [18:41:20.569] inherits <- base::inherits [18:41:20.569] invokeRestart <- base::invokeRestart [18:41:20.569] is.null <- base::is.null [18:41:20.569] muffled <- FALSE [18:41:20.569] if (inherits(cond, "message")) { [18:41:20.569] muffled <- grepl(pattern, "muffleMessage") [18:41:20.569] if (muffled) [18:41:20.569] invokeRestart("muffleMessage") [18:41:20.569] } [18:41:20.569] else if (inherits(cond, "warning")) { [18:41:20.569] muffled <- grepl(pattern, "muffleWarning") [18:41:20.569] if (muffled) [18:41:20.569] invokeRestart("muffleWarning") [18:41:20.569] } [18:41:20.569] else if (inherits(cond, "condition")) { [18:41:20.569] if (!is.null(pattern)) { [18:41:20.569] computeRestarts <- base::computeRestarts [18:41:20.569] grepl <- base::grepl [18:41:20.569] restarts <- computeRestarts(cond) [18:41:20.569] for (restart in restarts) { [18:41:20.569] name <- restart$name [18:41:20.569] if (is.null(name)) [18:41:20.569] next [18:41:20.569] if (!grepl(pattern, name)) [18:41:20.569] next [18:41:20.569] invokeRestart(restart) [18:41:20.569] muffled <- TRUE [18:41:20.569] break [18:41:20.569] } [18:41:20.569] } [18:41:20.569] } [18:41:20.569] invisible(muffled) [18:41:20.569] } [18:41:20.569] muffleCondition(cond, pattern = "^muffle") [18:41:20.569] } [18:41:20.569] } [18:41:20.569] else { [18:41:20.569] if (TRUE) { [18:41:20.569] muffleCondition <- function (cond, pattern = "^muffle") [18:41:20.569] { [18:41:20.569] inherits <- base::inherits [18:41:20.569] invokeRestart <- base::invokeRestart [18:41:20.569] is.null <- base::is.null [18:41:20.569] muffled <- FALSE [18:41:20.569] if (inherits(cond, "message")) { [18:41:20.569] muffled <- grepl(pattern, "muffleMessage") [18:41:20.569] if (muffled) [18:41:20.569] invokeRestart("muffleMessage") [18:41:20.569] } [18:41:20.569] else if (inherits(cond, "warning")) { [18:41:20.569] muffled <- grepl(pattern, "muffleWarning") [18:41:20.569] if (muffled) [18:41:20.569] invokeRestart("muffleWarning") [18:41:20.569] } [18:41:20.569] else if (inherits(cond, "condition")) { [18:41:20.569] if (!is.null(pattern)) { [18:41:20.569] computeRestarts <- base::computeRestarts [18:41:20.569] grepl <- base::grepl [18:41:20.569] restarts <- computeRestarts(cond) [18:41:20.569] for (restart in restarts) { [18:41:20.569] name <- restart$name [18:41:20.569] if (is.null(name)) [18:41:20.569] next [18:41:20.569] if (!grepl(pattern, name)) [18:41:20.569] next [18:41:20.569] invokeRestart(restart) [18:41:20.569] muffled <- TRUE [18:41:20.569] break [18:41:20.569] } [18:41:20.569] } [18:41:20.569] } [18:41:20.569] invisible(muffled) [18:41:20.569] } [18:41:20.569] muffleCondition(cond, pattern = "^muffle") [18:41:20.569] } [18:41:20.569] } [18:41:20.569] } [18:41:20.569] })) [18:41:20.569] }, error = function(ex) { [18:41:20.569] base::structure(base::list(value = NULL, visible = NULL, [18:41:20.569] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:20.569] ...future.rng), started = ...future.startTime, [18:41:20.569] finished = Sys.time(), session_uuid = NA_character_, [18:41:20.569] version = "1.8"), class = "FutureResult") [18:41:20.569] }, finally = { [18:41:20.569] if (!identical(...future.workdir, getwd())) [18:41:20.569] setwd(...future.workdir) [18:41:20.569] { [18:41:20.569] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:20.569] ...future.oldOptions$nwarnings <- NULL [18:41:20.569] } [18:41:20.569] base::options(...future.oldOptions) [18:41:20.569] if (.Platform$OS.type == "windows") { [18:41:20.569] old_names <- names(...future.oldEnvVars) [18:41:20.569] envs <- base::Sys.getenv() [18:41:20.569] names <- names(envs) [18:41:20.569] common <- intersect(names, old_names) [18:41:20.569] added <- setdiff(names, old_names) [18:41:20.569] removed <- setdiff(old_names, names) [18:41:20.569] changed <- common[...future.oldEnvVars[common] != [18:41:20.569] envs[common]] [18:41:20.569] NAMES <- toupper(changed) [18:41:20.569] args <- list() [18:41:20.569] for (kk in seq_along(NAMES)) { [18:41:20.569] name <- changed[[kk]] [18:41:20.569] NAME <- NAMES[[kk]] [18:41:20.569] if (name != NAME && is.element(NAME, old_names)) [18:41:20.569] next [18:41:20.569] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:20.569] } [18:41:20.569] NAMES <- toupper(added) [18:41:20.569] for (kk in seq_along(NAMES)) { [18:41:20.569] name <- added[[kk]] [18:41:20.569] NAME <- NAMES[[kk]] [18:41:20.569] if (name != NAME && is.element(NAME, old_names)) [18:41:20.569] next [18:41:20.569] args[[name]] <- "" [18:41:20.569] } [18:41:20.569] NAMES <- toupper(removed) [18:41:20.569] for (kk in seq_along(NAMES)) { [18:41:20.569] name <- removed[[kk]] [18:41:20.569] NAME <- NAMES[[kk]] [18:41:20.569] if (name != NAME && is.element(NAME, old_names)) [18:41:20.569] next [18:41:20.569] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:20.569] } [18:41:20.569] if (length(args) > 0) [18:41:20.569] base::do.call(base::Sys.setenv, args = args) [18:41:20.569] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:20.569] } [18:41:20.569] else { [18:41:20.569] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:20.569] } [18:41:20.569] { [18:41:20.569] if (base::length(...future.futureOptionsAdded) > [18:41:20.569] 0L) { [18:41:20.569] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:20.569] base::names(opts) <- ...future.futureOptionsAdded [18:41:20.569] base::options(opts) [18:41:20.569] } [18:41:20.569] { [18:41:20.569] { [18:41:20.569] NULL [18:41:20.569] RNGkind("Mersenne-Twister") [18:41:20.569] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:20.569] inherits = FALSE) [18:41:20.569] } [18:41:20.569] options(future.plan = NULL) [18:41:20.569] if (is.na(NA_character_)) [18:41:20.569] Sys.unsetenv("R_FUTURE_PLAN") [18:41:20.569] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:20.569] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:20.569] .init = FALSE) [18:41:20.569] } [18:41:20.569] } [18:41:20.569] } [18:41:20.569] }) [18:41:20.569] if (TRUE) { [18:41:20.569] base::sink(type = "output", split = FALSE) [18:41:20.569] if (TRUE) { [18:41:20.569] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:20.569] } [18:41:20.569] else { [18:41:20.569] ...future.result["stdout"] <- base::list(NULL) [18:41:20.569] } [18:41:20.569] base::close(...future.stdout) [18:41:20.569] ...future.stdout <- NULL [18:41:20.569] } [18:41:20.569] ...future.result$conditions <- ...future.conditions [18:41:20.569] ...future.result$finished <- base::Sys.time() [18:41:20.569] ...future.result [18:41:20.569] } [18:41:20.574] assign_globals() ... [18:41:20.574] List of 5 [18:41:20.574] $ ...future.FUN :function (x, ...) [18:41:20.574] $ future.call.arguments : list() [18:41:20.574] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:20.574] $ ...future.elements_ii :List of 1 [18:41:20.574] ..$ b:Classes 'listenv', 'environment' [18:41:20.574] $ ...future.seeds_ii : NULL [18:41:20.574] $ ...future.globals.maxSize: NULL [18:41:20.574] - attr(*, "where")=List of 5 [18:41:20.574] ..$ ...future.FUN : [18:41:20.574] ..$ future.call.arguments : [18:41:20.574] ..$ ...future.elements_ii : [18:41:20.574] ..$ ...future.seeds_ii : [18:41:20.574] ..$ ...future.globals.maxSize: [18:41:20.574] - attr(*, "resolved")= logi FALSE [18:41:20.574] - attr(*, "total_size")= num 8145 [18:41:20.574] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:20.574] - attr(*, "already-done")= logi TRUE [18:41:20.581] - copied '...future.FUN' to environment [18:41:20.581] - copied 'future.call.arguments' to environment [18:41:20.581] - copied '...future.elements_ii' to environment [18:41:20.582] - copied '...future.seeds_ii' to environment [18:41:20.582] - copied '...future.globals.maxSize' to environment [18:41:20.582] assign_globals() ... done [18:41:20.583] plan(): Setting new future strategy stack: [18:41:20.583] List of future strategies: [18:41:20.583] 1. sequential: [18:41:20.583] - args: function (..., envir = parent.frame(), workers = "") [18:41:20.583] - tweaked: FALSE [18:41:20.583] - call: NULL [18:41:20.584] plan(): nbrOfWorkers() = 1 [18:41:20.585] plan(): Setting new future strategy stack: [18:41:20.586] List of future strategies: [18:41:20.586] 1. sequential: [18:41:20.586] - args: function (..., envir = parent.frame(), workers = "") [18:41:20.586] - tweaked: FALSE [18:41:20.586] - call: plan(strategy) [18:41:20.586] plan(): nbrOfWorkers() = 1 [18:41:20.587] SequentialFuture started (and completed) [18:41:20.587] - Launch lazy future ... done [18:41:20.587] run() for 'SequentialFuture' ... done [18:41:20.587] Created future: [18:41:20.588] SequentialFuture: [18:41:20.588] Label: 'future_lapply-2' [18:41:20.588] Expression: [18:41:20.588] { [18:41:20.588] do.call(function(...) { [18:41:20.588] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.588] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:20.588] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.588] on.exit(options(oopts), add = TRUE) [18:41:20.588] } [18:41:20.588] { [18:41:20.588] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:20.588] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.588] ...future.FUN(...future.X_jj, ...) [18:41:20.588] }) [18:41:20.588] } [18:41:20.588] }, args = future.call.arguments) [18:41:20.588] } [18:41:20.588] Lazy evaluation: FALSE [18:41:20.588] Asynchronous evaluation: FALSE [18:41:20.588] Local evaluation: TRUE [18:41:20.588] Environment: R_GlobalEnv [18:41:20.588] Capture standard output: TRUE [18:41:20.588] Capture condition classes: 'condition' (excluding 'nothing') [18:41:20.588] Globals: 5 objects totaling 3.71 KiB (function '...future.FUN' of 911 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 2.67 KiB, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:20.588] Packages: 1 packages ('listenv') [18:41:20.588] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:20.588] Resolved: TRUE [18:41:20.588] Value: 108 bytes of class 'list' [18:41:20.588] Early signaling: FALSE [18:41:20.588] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:20.588] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:20.589] Chunk #2 of 2 ... DONE [18:41:20.589] Launching 2 futures (chunks) ... DONE [18:41:20.589] Resolving 2 futures (chunks) ... [18:41:20.590] resolve() on list ... [18:41:20.590] recursive: 0 [18:41:20.590] length: 2 [18:41:20.590] [18:41:20.590] resolved() for 'SequentialFuture' ... [18:41:20.590] - state: 'finished' [18:41:20.591] - run: TRUE [18:41:20.591] - result: 'FutureResult' [18:41:20.591] resolved() for 'SequentialFuture' ... done [18:41:20.591] Future #1 [18:41:20.592] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:20.592] - nx: 2 [18:41:20.592] - relay: TRUE [18:41:20.592] - stdout: TRUE [18:41:20.592] - signal: TRUE [18:41:20.593] - resignal: FALSE [18:41:20.593] - force: TRUE [18:41:20.593] - relayed: [n=2] FALSE, FALSE [18:41:20.593] - queued futures: [n=2] FALSE, FALSE [18:41:20.593] - until=1 [18:41:20.593] - relaying element #1 [18:41:20.594] - relayed: [n=2] TRUE, FALSE [18:41:20.594] - queued futures: [n=2] TRUE, FALSE [18:41:20.594] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:20.594] length: 1 (resolved future 1) [18:41:20.595] resolved() for 'SequentialFuture' ... [18:41:20.595] - state: 'finished' [18:41:20.595] - run: TRUE [18:41:20.596] - result: 'FutureResult' [18:41:20.596] resolved() for 'SequentialFuture' ... done [18:41:20.596] Future #2 [18:41:20.596] signalConditionsASAP(SequentialFuture, pos=2) ... [18:41:20.596] - nx: 2 [18:41:20.597] - relay: TRUE [18:41:20.597] - stdout: TRUE [18:41:20.597] - signal: TRUE [18:41:20.597] - resignal: FALSE [18:41:20.597] - force: TRUE [18:41:20.597] - relayed: [n=2] TRUE, FALSE [18:41:20.598] - queued futures: [n=2] TRUE, FALSE [18:41:20.598] - until=2 [18:41:20.598] - relaying element #2 [18:41:20.598] - relayed: [n=2] TRUE, TRUE [18:41:20.599] - queued futures: [n=2] TRUE, TRUE [18:41:20.599] signalConditionsASAP(SequentialFuture, pos=2) ... done [18:41:20.599] length: 0 (resolved future 2) [18:41:20.599] Relaying remaining futures [18:41:20.599] signalConditionsASAP(NULL, pos=0) ... [18:41:20.600] - nx: 2 [18:41:20.600] - relay: TRUE [18:41:20.600] - stdout: TRUE [18:41:20.600] - signal: TRUE [18:41:20.600] - resignal: FALSE [18:41:20.600] - force: TRUE [18:41:20.601] - relayed: [n=2] TRUE, TRUE [18:41:20.601] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:20.601] - relayed: [n=2] TRUE, TRUE [18:41:20.601] - queued futures: [n=2] TRUE, TRUE [18:41:20.602] signalConditionsASAP(NULL, pos=0) ... done [18:41:20.602] resolve() on list ... DONE [18:41:20.602] - Number of value chunks collected: 2 [18:41:20.602] Resolving 2 futures (chunks) ... DONE [18:41:20.602] Reducing values from 2 chunks ... [18:41:20.603] - Number of values collected after concatenation: 2 [18:41:20.603] - Number of values expected: 2 [18:41:20.603] Reducing values from 2 chunks ... DONE [18:41:20.603] future_lapply() ... DONE List of 1 $ y:List of 2 ..$ a: Named chr "A" .. ..- attr(*, "names")= chr "A" ..$ b: Named chr [1:2] "A" "B" .. ..- attr(*, "names")= chr [1:2] "A" "B" - future_lapply(x, FUN = vector, ...) ... [18:41:20.612] future_lapply() ... [18:41:20.613] Number of chunks: 1 [18:41:20.613] getGlobalsAndPackagesXApply() ... [18:41:20.613] - future.globals: TRUE [18:41:20.614] getGlobalsAndPackages() ... [18:41:20.614] Searching for globals... [18:41:20.616] - globals found: [2] 'FUN', '.Internal' [18:41:20.616] Searching for globals ... DONE [18:41:20.616] Resolving globals: FALSE [18:41:20.617] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:20.617] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:20.618] - globals: [1] 'FUN' [18:41:20.618] [18:41:20.618] getGlobalsAndPackages() ... DONE [18:41:20.618] - globals found/used: [n=1] 'FUN' [18:41:20.618] - needed namespaces: [n=0] [18:41:20.619] Finding globals ... DONE [18:41:20.619] - use_args: TRUE [18:41:20.619] - Getting '...' globals ... [18:41:20.620] resolve() on list ... [18:41:20.620] recursive: 0 [18:41:20.620] length: 1 [18:41:20.620] elements: '...' [18:41:20.621] length: 0 (resolved future 1) [18:41:20.621] resolve() on list ... DONE [18:41:20.621] - '...' content: [n=1] 'length' [18:41:20.621] List of 1 [18:41:20.621] $ ...:List of 1 [18:41:20.621] ..$ length: int 2 [18:41:20.621] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:20.621] - attr(*, "where")=List of 1 [18:41:20.621] ..$ ...: [18:41:20.621] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:20.621] - attr(*, "resolved")= logi TRUE [18:41:20.621] - attr(*, "total_size")= num NA [18:41:20.626] - Getting '...' globals ... DONE [18:41:20.626] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:20.627] List of 2 [18:41:20.627] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:20.627] $ ... :List of 1 [18:41:20.627] ..$ length: int 2 [18:41:20.627] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:20.627] - attr(*, "where")=List of 2 [18:41:20.627] ..$ ...future.FUN: [18:41:20.627] ..$ ... : [18:41:20.627] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:20.627] - attr(*, "resolved")= logi FALSE [18:41:20.627] - attr(*, "total_size")= int 4288 [18:41:20.632] Packages to be attached in all futures: [n=0] [18:41:20.632] getGlobalsAndPackagesXApply() ... DONE [18:41:20.633] Number of futures (= number of chunks): 1 [18:41:20.633] Launching 1 futures (chunks) ... [18:41:20.633] Chunk #1 of 1 ... [18:41:20.633] - Finding globals in 'X' for chunk #1 ... [18:41:20.634] getGlobalsAndPackages() ... [18:41:20.634] Searching for globals... [18:41:20.634] [18:41:20.634] Searching for globals ... DONE [18:41:20.635] - globals: [0] [18:41:20.635] getGlobalsAndPackages() ... DONE [18:41:20.635] + additional globals found: [n=0] [18:41:20.635] + additional namespaces needed: [n=0] [18:41:20.635] - Finding globals in 'X' for chunk #1 ... DONE [18:41:20.635] - seeds: [18:41:20.636] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.636] getGlobalsAndPackages() ... [18:41:20.636] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.636] Resolving globals: FALSE [18:41:20.636] Tweak future expression to call with '...' arguments ... [18:41:20.637] { [18:41:20.637] do.call(function(...) { [18:41:20.637] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.637] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:20.637] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.637] on.exit(options(oopts), add = TRUE) [18:41:20.637] } [18:41:20.637] { [18:41:20.637] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:20.637] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.637] ...future.FUN(...future.X_jj, ...) [18:41:20.637] }) [18:41:20.637] } [18:41:20.637] }, args = future.call.arguments) [18:41:20.637] } [18:41:20.637] Tweak future expression to call with '...' arguments ... DONE [18:41:20.638] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.638] [18:41:20.638] getGlobalsAndPackages() ... DONE [18:41:20.638] run() for 'Future' ... [18:41:20.639] - state: 'created' [18:41:20.639] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:20.639] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:20.640] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:20.640] - Field: 'label' [18:41:20.640] - Field: 'local' [18:41:20.640] - Field: 'owner' [18:41:20.640] - Field: 'envir' [18:41:20.641] - Field: 'packages' [18:41:20.641] - Field: 'gc' [18:41:20.641] - Field: 'conditions' [18:41:20.641] - Field: 'expr' [18:41:20.642] - Field: 'uuid' [18:41:20.642] - Field: 'seed' [18:41:20.642] - Field: 'version' [18:41:20.642] - Field: 'result' [18:41:20.643] - Field: 'asynchronous' [18:41:20.643] - Field: 'calls' [18:41:20.643] - Field: 'globals' [18:41:20.643] - Field: 'stdout' [18:41:20.643] - Field: 'earlySignal' [18:41:20.644] - Field: 'lazy' [18:41:20.644] - Field: 'state' [18:41:20.644] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:20.644] - Launch lazy future ... [18:41:20.645] Packages needed by the future expression (n = 0): [18:41:20.645] Packages needed by future strategies (n = 0): [18:41:20.645] { [18:41:20.645] { [18:41:20.645] { [18:41:20.645] ...future.startTime <- base::Sys.time() [18:41:20.645] { [18:41:20.645] { [18:41:20.645] { [18:41:20.645] base::local({ [18:41:20.645] has_future <- base::requireNamespace("future", [18:41:20.645] quietly = TRUE) [18:41:20.645] if (has_future) { [18:41:20.645] ns <- base::getNamespace("future") [18:41:20.645] version <- ns[[".package"]][["version"]] [18:41:20.645] if (is.null(version)) [18:41:20.645] version <- utils::packageVersion("future") [18:41:20.645] } [18:41:20.645] else { [18:41:20.645] version <- NULL [18:41:20.645] } [18:41:20.645] if (!has_future || version < "1.8.0") { [18:41:20.645] info <- base::c(r_version = base::gsub("R version ", [18:41:20.645] "", base::R.version$version.string), [18:41:20.645] platform = base::sprintf("%s (%s-bit)", [18:41:20.645] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:20.645] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:20.645] "release", "version")], collapse = " "), [18:41:20.645] hostname = base::Sys.info()[["nodename"]]) [18:41:20.645] info <- base::sprintf("%s: %s", base::names(info), [18:41:20.645] info) [18:41:20.645] info <- base::paste(info, collapse = "; ") [18:41:20.645] if (!has_future) { [18:41:20.645] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:20.645] info) [18:41:20.645] } [18:41:20.645] else { [18:41:20.645] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:20.645] info, version) [18:41:20.645] } [18:41:20.645] base::stop(msg) [18:41:20.645] } [18:41:20.645] }) [18:41:20.645] } [18:41:20.645] ...future.strategy.old <- future::plan("list") [18:41:20.645] options(future.plan = NULL) [18:41:20.645] Sys.unsetenv("R_FUTURE_PLAN") [18:41:20.645] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:20.645] } [18:41:20.645] ...future.workdir <- getwd() [18:41:20.645] } [18:41:20.645] ...future.oldOptions <- base::as.list(base::.Options) [18:41:20.645] ...future.oldEnvVars <- base::Sys.getenv() [18:41:20.645] } [18:41:20.645] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:20.645] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:20.645] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:20.645] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:20.645] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:20.645] future.stdout.windows.reencode = NULL, width = 80L) [18:41:20.645] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:20.645] base::names(...future.oldOptions)) [18:41:20.645] } [18:41:20.645] if (FALSE) { [18:41:20.645] } [18:41:20.645] else { [18:41:20.645] if (TRUE) { [18:41:20.645] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:20.645] open = "w") [18:41:20.645] } [18:41:20.645] else { [18:41:20.645] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:20.645] windows = "NUL", "/dev/null"), open = "w") [18:41:20.645] } [18:41:20.645] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:20.645] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:20.645] base::sink(type = "output", split = FALSE) [18:41:20.645] base::close(...future.stdout) [18:41:20.645] }, add = TRUE) [18:41:20.645] } [18:41:20.645] ...future.frame <- base::sys.nframe() [18:41:20.645] ...future.conditions <- base::list() [18:41:20.645] ...future.rng <- base::globalenv()$.Random.seed [18:41:20.645] if (FALSE) { [18:41:20.645] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:20.645] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:20.645] } [18:41:20.645] ...future.result <- base::tryCatch({ [18:41:20.645] base::withCallingHandlers({ [18:41:20.645] ...future.value <- base::withVisible(base::local({ [18:41:20.645] do.call(function(...) { [18:41:20.645] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.645] if (!identical(...future.globals.maxSize.org, [18:41:20.645] ...future.globals.maxSize)) { [18:41:20.645] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.645] on.exit(options(oopts), add = TRUE) [18:41:20.645] } [18:41:20.645] { [18:41:20.645] lapply(seq_along(...future.elements_ii), [18:41:20.645] FUN = function(jj) { [18:41:20.645] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.645] ...future.FUN(...future.X_jj, ...) [18:41:20.645] }) [18:41:20.645] } [18:41:20.645] }, args = future.call.arguments) [18:41:20.645] })) [18:41:20.645] future::FutureResult(value = ...future.value$value, [18:41:20.645] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:20.645] ...future.rng), globalenv = if (FALSE) [18:41:20.645] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:20.645] ...future.globalenv.names)) [18:41:20.645] else NULL, started = ...future.startTime, version = "1.8") [18:41:20.645] }, condition = base::local({ [18:41:20.645] c <- base::c [18:41:20.645] inherits <- base::inherits [18:41:20.645] invokeRestart <- base::invokeRestart [18:41:20.645] length <- base::length [18:41:20.645] list <- base::list [18:41:20.645] seq.int <- base::seq.int [18:41:20.645] signalCondition <- base::signalCondition [18:41:20.645] sys.calls <- base::sys.calls [18:41:20.645] `[[` <- base::`[[` [18:41:20.645] `+` <- base::`+` [18:41:20.645] `<<-` <- base::`<<-` [18:41:20.645] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:20.645] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:20.645] 3L)] [18:41:20.645] } [18:41:20.645] function(cond) { [18:41:20.645] is_error <- inherits(cond, "error") [18:41:20.645] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:20.645] NULL) [18:41:20.645] if (is_error) { [18:41:20.645] sessionInformation <- function() { [18:41:20.645] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:20.645] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:20.645] search = base::search(), system = base::Sys.info()) [18:41:20.645] } [18:41:20.645] ...future.conditions[[length(...future.conditions) + [18:41:20.645] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:20.645] cond$call), session = sessionInformation(), [18:41:20.645] timestamp = base::Sys.time(), signaled = 0L) [18:41:20.645] signalCondition(cond) [18:41:20.645] } [18:41:20.645] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:20.645] "immediateCondition"))) { [18:41:20.645] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:20.645] ...future.conditions[[length(...future.conditions) + [18:41:20.645] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:20.645] if (TRUE && !signal) { [18:41:20.645] muffleCondition <- function (cond, pattern = "^muffle") [18:41:20.645] { [18:41:20.645] inherits <- base::inherits [18:41:20.645] invokeRestart <- base::invokeRestart [18:41:20.645] is.null <- base::is.null [18:41:20.645] muffled <- FALSE [18:41:20.645] if (inherits(cond, "message")) { [18:41:20.645] muffled <- grepl(pattern, "muffleMessage") [18:41:20.645] if (muffled) [18:41:20.645] invokeRestart("muffleMessage") [18:41:20.645] } [18:41:20.645] else if (inherits(cond, "warning")) { [18:41:20.645] muffled <- grepl(pattern, "muffleWarning") [18:41:20.645] if (muffled) [18:41:20.645] invokeRestart("muffleWarning") [18:41:20.645] } [18:41:20.645] else if (inherits(cond, "condition")) { [18:41:20.645] if (!is.null(pattern)) { [18:41:20.645] computeRestarts <- base::computeRestarts [18:41:20.645] grepl <- base::grepl [18:41:20.645] restarts <- computeRestarts(cond) [18:41:20.645] for (restart in restarts) { [18:41:20.645] name <- restart$name [18:41:20.645] if (is.null(name)) [18:41:20.645] next [18:41:20.645] if (!grepl(pattern, name)) [18:41:20.645] next [18:41:20.645] invokeRestart(restart) [18:41:20.645] muffled <- TRUE [18:41:20.645] break [18:41:20.645] } [18:41:20.645] } [18:41:20.645] } [18:41:20.645] invisible(muffled) [18:41:20.645] } [18:41:20.645] muffleCondition(cond, pattern = "^muffle") [18:41:20.645] } [18:41:20.645] } [18:41:20.645] else { [18:41:20.645] if (TRUE) { [18:41:20.645] muffleCondition <- function (cond, pattern = "^muffle") [18:41:20.645] { [18:41:20.645] inherits <- base::inherits [18:41:20.645] invokeRestart <- base::invokeRestart [18:41:20.645] is.null <- base::is.null [18:41:20.645] muffled <- FALSE [18:41:20.645] if (inherits(cond, "message")) { [18:41:20.645] muffled <- grepl(pattern, "muffleMessage") [18:41:20.645] if (muffled) [18:41:20.645] invokeRestart("muffleMessage") [18:41:20.645] } [18:41:20.645] else if (inherits(cond, "warning")) { [18:41:20.645] muffled <- grepl(pattern, "muffleWarning") [18:41:20.645] if (muffled) [18:41:20.645] invokeRestart("muffleWarning") [18:41:20.645] } [18:41:20.645] else if (inherits(cond, "condition")) { [18:41:20.645] if (!is.null(pattern)) { [18:41:20.645] computeRestarts <- base::computeRestarts [18:41:20.645] grepl <- base::grepl [18:41:20.645] restarts <- computeRestarts(cond) [18:41:20.645] for (restart in restarts) { [18:41:20.645] name <- restart$name [18:41:20.645] if (is.null(name)) [18:41:20.645] next [18:41:20.645] if (!grepl(pattern, name)) [18:41:20.645] next [18:41:20.645] invokeRestart(restart) [18:41:20.645] muffled <- TRUE [18:41:20.645] break [18:41:20.645] } [18:41:20.645] } [18:41:20.645] } [18:41:20.645] invisible(muffled) [18:41:20.645] } [18:41:20.645] muffleCondition(cond, pattern = "^muffle") [18:41:20.645] } [18:41:20.645] } [18:41:20.645] } [18:41:20.645] })) [18:41:20.645] }, error = function(ex) { [18:41:20.645] base::structure(base::list(value = NULL, visible = NULL, [18:41:20.645] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:20.645] ...future.rng), started = ...future.startTime, [18:41:20.645] finished = Sys.time(), session_uuid = NA_character_, [18:41:20.645] version = "1.8"), class = "FutureResult") [18:41:20.645] }, finally = { [18:41:20.645] if (!identical(...future.workdir, getwd())) [18:41:20.645] setwd(...future.workdir) [18:41:20.645] { [18:41:20.645] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:20.645] ...future.oldOptions$nwarnings <- NULL [18:41:20.645] } [18:41:20.645] base::options(...future.oldOptions) [18:41:20.645] if (.Platform$OS.type == "windows") { [18:41:20.645] old_names <- names(...future.oldEnvVars) [18:41:20.645] envs <- base::Sys.getenv() [18:41:20.645] names <- names(envs) [18:41:20.645] common <- intersect(names, old_names) [18:41:20.645] added <- setdiff(names, old_names) [18:41:20.645] removed <- setdiff(old_names, names) [18:41:20.645] changed <- common[...future.oldEnvVars[common] != [18:41:20.645] envs[common]] [18:41:20.645] NAMES <- toupper(changed) [18:41:20.645] args <- list() [18:41:20.645] for (kk in seq_along(NAMES)) { [18:41:20.645] name <- changed[[kk]] [18:41:20.645] NAME <- NAMES[[kk]] [18:41:20.645] if (name != NAME && is.element(NAME, old_names)) [18:41:20.645] next [18:41:20.645] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:20.645] } [18:41:20.645] NAMES <- toupper(added) [18:41:20.645] for (kk in seq_along(NAMES)) { [18:41:20.645] name <- added[[kk]] [18:41:20.645] NAME <- NAMES[[kk]] [18:41:20.645] if (name != NAME && is.element(NAME, old_names)) [18:41:20.645] next [18:41:20.645] args[[name]] <- "" [18:41:20.645] } [18:41:20.645] NAMES <- toupper(removed) [18:41:20.645] for (kk in seq_along(NAMES)) { [18:41:20.645] name <- removed[[kk]] [18:41:20.645] NAME <- NAMES[[kk]] [18:41:20.645] if (name != NAME && is.element(NAME, old_names)) [18:41:20.645] next [18:41:20.645] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:20.645] } [18:41:20.645] if (length(args) > 0) [18:41:20.645] base::do.call(base::Sys.setenv, args = args) [18:41:20.645] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:20.645] } [18:41:20.645] else { [18:41:20.645] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:20.645] } [18:41:20.645] { [18:41:20.645] if (base::length(...future.futureOptionsAdded) > [18:41:20.645] 0L) { [18:41:20.645] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:20.645] base::names(opts) <- ...future.futureOptionsAdded [18:41:20.645] base::options(opts) [18:41:20.645] } [18:41:20.645] { [18:41:20.645] { [18:41:20.645] NULL [18:41:20.645] RNGkind("Mersenne-Twister") [18:41:20.645] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:20.645] inherits = FALSE) [18:41:20.645] } [18:41:20.645] options(future.plan = NULL) [18:41:20.645] if (is.na(NA_character_)) [18:41:20.645] Sys.unsetenv("R_FUTURE_PLAN") [18:41:20.645] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:20.645] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:20.645] .init = FALSE) [18:41:20.645] } [18:41:20.645] } [18:41:20.645] } [18:41:20.645] }) [18:41:20.645] if (TRUE) { [18:41:20.645] base::sink(type = "output", split = FALSE) [18:41:20.645] if (TRUE) { [18:41:20.645] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:20.645] } [18:41:20.645] else { [18:41:20.645] ...future.result["stdout"] <- base::list(NULL) [18:41:20.645] } [18:41:20.645] base::close(...future.stdout) [18:41:20.645] ...future.stdout <- NULL [18:41:20.645] } [18:41:20.645] ...future.result$conditions <- ...future.conditions [18:41:20.645] ...future.result$finished <- base::Sys.time() [18:41:20.645] ...future.result [18:41:20.645] } [18:41:20.650] assign_globals() ... [18:41:20.650] List of 5 [18:41:20.650] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:20.650] $ future.call.arguments :List of 1 [18:41:20.650] ..$ length: int 2 [18:41:20.650] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:20.650] $ ...future.elements_ii :List of 4 [18:41:20.650] ..$ a: chr "integer" [18:41:20.650] ..$ b: chr "numeric" [18:41:20.650] ..$ c: chr "character" [18:41:20.650] ..$ c: chr "list" [18:41:20.650] $ ...future.seeds_ii : NULL [18:41:20.650] $ ...future.globals.maxSize: NULL [18:41:20.650] - attr(*, "where")=List of 5 [18:41:20.650] ..$ ...future.FUN : [18:41:20.650] ..$ future.call.arguments : [18:41:20.650] ..$ ...future.elements_ii : [18:41:20.650] ..$ ...future.seeds_ii : [18:41:20.650] ..$ ...future.globals.maxSize: [18:41:20.650] - attr(*, "resolved")= logi FALSE [18:41:20.650] - attr(*, "total_size")= num 4288 [18:41:20.650] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:20.650] - attr(*, "already-done")= logi TRUE [18:41:20.658] - copied '...future.FUN' to environment [18:41:20.658] - copied 'future.call.arguments' to environment [18:41:20.658] - copied '...future.elements_ii' to environment [18:41:20.659] - copied '...future.seeds_ii' to environment [18:41:20.659] - copied '...future.globals.maxSize' to environment [18:41:20.659] assign_globals() ... done [18:41:20.660] plan(): Setting new future strategy stack: [18:41:20.660] List of future strategies: [18:41:20.660] 1. sequential: [18:41:20.660] - args: function (..., envir = parent.frame(), workers = "") [18:41:20.660] - tweaked: FALSE [18:41:20.660] - call: NULL [18:41:20.661] plan(): nbrOfWorkers() = 1 [18:41:20.662] plan(): Setting new future strategy stack: [18:41:20.662] List of future strategies: [18:41:20.662] 1. sequential: [18:41:20.662] - args: function (..., envir = parent.frame(), workers = "") [18:41:20.662] - tweaked: FALSE [18:41:20.662] - call: plan(strategy) [18:41:20.663] plan(): nbrOfWorkers() = 1 [18:41:20.663] SequentialFuture started (and completed) [18:41:20.664] - Launch lazy future ... done [18:41:20.664] run() for 'SequentialFuture' ... done [18:41:20.664] Created future: [18:41:20.664] SequentialFuture: [18:41:20.664] Label: 'future_lapply-1' [18:41:20.664] Expression: [18:41:20.664] { [18:41:20.664] do.call(function(...) { [18:41:20.664] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.664] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:20.664] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.664] on.exit(options(oopts), add = TRUE) [18:41:20.664] } [18:41:20.664] { [18:41:20.664] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:20.664] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.664] ...future.FUN(...future.X_jj, ...) [18:41:20.664] }) [18:41:20.664] } [18:41:20.664] }, args = future.call.arguments) [18:41:20.664] } [18:41:20.664] Lazy evaluation: FALSE [18:41:20.664] Asynchronous evaluation: FALSE [18:41:20.664] Local evaluation: TRUE [18:41:20.664] Environment: R_GlobalEnv [18:41:20.664] Capture standard output: TRUE [18:41:20.664] Capture condition classes: 'condition' (excluding 'nothing') [18:41:20.664] Globals: 5 objects totaling 853 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 191 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:20.664] Packages: [18:41:20.664] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:20.664] Resolved: TRUE [18:41:20.664] Value: 111 bytes of class 'list' [18:41:20.664] Early signaling: FALSE [18:41:20.664] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:20.664] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:20.665] Chunk #1 of 1 ... DONE [18:41:20.666] Launching 1 futures (chunks) ... DONE [18:41:20.666] Resolving 1 futures (chunks) ... [18:41:20.666] resolve() on list ... [18:41:20.666] recursive: 0 [18:41:20.666] length: 1 [18:41:20.666] [18:41:20.667] resolved() for 'SequentialFuture' ... [18:41:20.667] - state: 'finished' [18:41:20.667] - run: TRUE [18:41:20.667] - result: 'FutureResult' [18:41:20.668] resolved() for 'SequentialFuture' ... done [18:41:20.668] Future #1 [18:41:20.668] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:20.668] - nx: 1 [18:41:20.668] - relay: TRUE [18:41:20.669] - stdout: TRUE [18:41:20.669] - signal: TRUE [18:41:20.669] - resignal: FALSE [18:41:20.669] - force: TRUE [18:41:20.669] - relayed: [n=1] FALSE [18:41:20.669] - queued futures: [n=1] FALSE [18:41:20.670] - until=1 [18:41:20.670] - relaying element #1 [18:41:20.670] - relayed: [n=1] TRUE [18:41:20.670] - queued futures: [n=1] TRUE [18:41:20.670] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:20.671] length: 0 (resolved future 1) [18:41:20.671] Relaying remaining futures [18:41:20.671] signalConditionsASAP(NULL, pos=0) ... [18:41:20.671] - nx: 1 [18:41:20.671] - relay: TRUE [18:41:20.672] - stdout: TRUE [18:41:20.672] - signal: TRUE [18:41:20.672] - resignal: FALSE [18:41:20.672] - force: TRUE [18:41:20.672] - relayed: [n=1] TRUE [18:41:20.672] - queued futures: [n=1] TRUE - flush all [18:41:20.673] - relayed: [n=1] TRUE [18:41:20.673] - queued futures: [n=1] TRUE [18:41:20.673] signalConditionsASAP(NULL, pos=0) ... done [18:41:20.673] resolve() on list ... DONE [18:41:20.674] - Number of value chunks collected: 1 [18:41:20.674] Resolving 1 futures (chunks) ... DONE [18:41:20.674] Reducing values from 1 chunks ... [18:41:20.674] - Number of values collected after concatenation: 4 [18:41:20.675] - Number of values expected: 4 [18:41:20.675] Reducing values from 1 chunks ... DONE [18:41:20.675] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL [18:41:20.678] future_lapply() ... [18:41:20.679] Number of chunks: 1 [18:41:20.679] getGlobalsAndPackagesXApply() ... [18:41:20.680] - future.globals: TRUE [18:41:20.680] getGlobalsAndPackages() ... [18:41:20.680] Searching for globals... [18:41:20.682] - globals found: [2] 'FUN', '.Internal' [18:41:20.682] Searching for globals ... DONE [18:41:20.682] Resolving globals: FALSE [18:41:20.683] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:20.683] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:20.683] - globals: [1] 'FUN' [18:41:20.684] [18:41:20.684] getGlobalsAndPackages() ... DONE [18:41:20.684] - globals found/used: [n=1] 'FUN' [18:41:20.684] - needed namespaces: [n=0] [18:41:20.684] Finding globals ... DONE [18:41:20.685] - use_args: TRUE [18:41:20.685] - Getting '...' globals ... [18:41:20.685] resolve() on list ... [18:41:20.686] recursive: 0 [18:41:20.686] length: 1 [18:41:20.686] elements: '...' [18:41:20.686] length: 0 (resolved future 1) [18:41:20.686] resolve() on list ... DONE [18:41:20.687] - '...' content: [n=1] 'length' [18:41:20.687] List of 1 [18:41:20.687] $ ...:List of 1 [18:41:20.687] ..$ length: int 2 [18:41:20.687] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:20.687] - attr(*, "where")=List of 1 [18:41:20.687] ..$ ...: [18:41:20.687] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:20.687] - attr(*, "resolved")= logi TRUE [18:41:20.687] - attr(*, "total_size")= num NA [18:41:20.691] - Getting '...' globals ... DONE [18:41:20.691] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:20.691] List of 2 [18:41:20.691] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:20.691] $ ... :List of 1 [18:41:20.691] ..$ length: int 2 [18:41:20.691] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:20.691] - attr(*, "where")=List of 2 [18:41:20.691] ..$ ...future.FUN: [18:41:20.691] ..$ ... : [18:41:20.691] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:20.691] - attr(*, "resolved")= logi FALSE [18:41:20.691] - attr(*, "total_size")= int 4324 [18:41:20.696] Packages to be attached in all futures: [n=0] [18:41:20.696] getGlobalsAndPackagesXApply() ... DONE [18:41:20.696] Number of futures (= number of chunks): 1 [18:41:20.696] Launching 1 futures (chunks) ... [18:41:20.697] Chunk #1 of 1 ... [18:41:20.697] - Finding globals in 'X' for chunk #1 ... [18:41:20.697] getGlobalsAndPackages() ... [18:41:20.697] Searching for globals... [18:41:20.698] [18:41:20.698] Searching for globals ... DONE [18:41:20.698] - globals: [0] [18:41:20.698] getGlobalsAndPackages() ... DONE [18:41:20.698] + additional globals found: [n=0] [18:41:20.699] + additional namespaces needed: [n=0] [18:41:20.699] - Finding globals in 'X' for chunk #1 ... DONE [18:41:20.699] - seeds: [18:41:20.699] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.699] getGlobalsAndPackages() ... [18:41:20.699] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.700] Resolving globals: FALSE [18:41:20.700] Tweak future expression to call with '...' arguments ... [18:41:20.700] { [18:41:20.700] do.call(function(...) { [18:41:20.700] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.700] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:20.700] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.700] on.exit(options(oopts), add = TRUE) [18:41:20.700] } [18:41:20.700] { [18:41:20.700] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:20.700] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.700] ...future.FUN(...future.X_jj, ...) [18:41:20.700] }) [18:41:20.700] } [18:41:20.700] }, args = future.call.arguments) [18:41:20.700] } [18:41:20.701] Tweak future expression to call with '...' arguments ... DONE [18:41:20.701] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.701] [18:41:20.701] getGlobalsAndPackages() ... DONE [18:41:20.702] run() for 'Future' ... [18:41:20.702] - state: 'created' [18:41:20.702] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:20.703] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:20.703] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:20.703] - Field: 'label' [18:41:20.703] - Field: 'local' [18:41:20.704] - Field: 'owner' [18:41:20.704] - Field: 'envir' [18:41:20.704] - Field: 'packages' [18:41:20.704] - Field: 'gc' [18:41:20.704] - Field: 'conditions' [18:41:20.705] - Field: 'expr' [18:41:20.705] - Field: 'uuid' [18:41:20.705] - Field: 'seed' [18:41:20.705] - Field: 'version' [18:41:20.705] - Field: 'result' [18:41:20.706] - Field: 'asynchronous' [18:41:20.706] - Field: 'calls' [18:41:20.706] - Field: 'globals' [18:41:20.706] - Field: 'stdout' [18:41:20.706] - Field: 'earlySignal' [18:41:20.707] - Field: 'lazy' [18:41:20.707] - Field: 'state' [18:41:20.707] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:20.707] - Launch lazy future ... [18:41:20.707] Packages needed by the future expression (n = 0): [18:41:20.708] Packages needed by future strategies (n = 0): [18:41:20.708] { [18:41:20.708] { [18:41:20.708] { [18:41:20.708] ...future.startTime <- base::Sys.time() [18:41:20.708] { [18:41:20.708] { [18:41:20.708] { [18:41:20.708] base::local({ [18:41:20.708] has_future <- base::requireNamespace("future", [18:41:20.708] quietly = TRUE) [18:41:20.708] if (has_future) { [18:41:20.708] ns <- base::getNamespace("future") [18:41:20.708] version <- ns[[".package"]][["version"]] [18:41:20.708] if (is.null(version)) [18:41:20.708] version <- utils::packageVersion("future") [18:41:20.708] } [18:41:20.708] else { [18:41:20.708] version <- NULL [18:41:20.708] } [18:41:20.708] if (!has_future || version < "1.8.0") { [18:41:20.708] info <- base::c(r_version = base::gsub("R version ", [18:41:20.708] "", base::R.version$version.string), [18:41:20.708] platform = base::sprintf("%s (%s-bit)", [18:41:20.708] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:20.708] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:20.708] "release", "version")], collapse = " "), [18:41:20.708] hostname = base::Sys.info()[["nodename"]]) [18:41:20.708] info <- base::sprintf("%s: %s", base::names(info), [18:41:20.708] info) [18:41:20.708] info <- base::paste(info, collapse = "; ") [18:41:20.708] if (!has_future) { [18:41:20.708] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:20.708] info) [18:41:20.708] } [18:41:20.708] else { [18:41:20.708] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:20.708] info, version) [18:41:20.708] } [18:41:20.708] base::stop(msg) [18:41:20.708] } [18:41:20.708] }) [18:41:20.708] } [18:41:20.708] ...future.strategy.old <- future::plan("list") [18:41:20.708] options(future.plan = NULL) [18:41:20.708] Sys.unsetenv("R_FUTURE_PLAN") [18:41:20.708] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:20.708] } [18:41:20.708] ...future.workdir <- getwd() [18:41:20.708] } [18:41:20.708] ...future.oldOptions <- base::as.list(base::.Options) [18:41:20.708] ...future.oldEnvVars <- base::Sys.getenv() [18:41:20.708] } [18:41:20.708] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:20.708] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:20.708] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:20.708] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:20.708] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:20.708] future.stdout.windows.reencode = NULL, width = 80L) [18:41:20.708] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:20.708] base::names(...future.oldOptions)) [18:41:20.708] } [18:41:20.708] if (FALSE) { [18:41:20.708] } [18:41:20.708] else { [18:41:20.708] if (TRUE) { [18:41:20.708] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:20.708] open = "w") [18:41:20.708] } [18:41:20.708] else { [18:41:20.708] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:20.708] windows = "NUL", "/dev/null"), open = "w") [18:41:20.708] } [18:41:20.708] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:20.708] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:20.708] base::sink(type = "output", split = FALSE) [18:41:20.708] base::close(...future.stdout) [18:41:20.708] }, add = TRUE) [18:41:20.708] } [18:41:20.708] ...future.frame <- base::sys.nframe() [18:41:20.708] ...future.conditions <- base::list() [18:41:20.708] ...future.rng <- base::globalenv()$.Random.seed [18:41:20.708] if (FALSE) { [18:41:20.708] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:20.708] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:20.708] } [18:41:20.708] ...future.result <- base::tryCatch({ [18:41:20.708] base::withCallingHandlers({ [18:41:20.708] ...future.value <- base::withVisible(base::local({ [18:41:20.708] do.call(function(...) { [18:41:20.708] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.708] if (!identical(...future.globals.maxSize.org, [18:41:20.708] ...future.globals.maxSize)) { [18:41:20.708] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.708] on.exit(options(oopts), add = TRUE) [18:41:20.708] } [18:41:20.708] { [18:41:20.708] lapply(seq_along(...future.elements_ii), [18:41:20.708] FUN = function(jj) { [18:41:20.708] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.708] ...future.FUN(...future.X_jj, ...) [18:41:20.708] }) [18:41:20.708] } [18:41:20.708] }, args = future.call.arguments) [18:41:20.708] })) [18:41:20.708] future::FutureResult(value = ...future.value$value, [18:41:20.708] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:20.708] ...future.rng), globalenv = if (FALSE) [18:41:20.708] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:20.708] ...future.globalenv.names)) [18:41:20.708] else NULL, started = ...future.startTime, version = "1.8") [18:41:20.708] }, condition = base::local({ [18:41:20.708] c <- base::c [18:41:20.708] inherits <- base::inherits [18:41:20.708] invokeRestart <- base::invokeRestart [18:41:20.708] length <- base::length [18:41:20.708] list <- base::list [18:41:20.708] seq.int <- base::seq.int [18:41:20.708] signalCondition <- base::signalCondition [18:41:20.708] sys.calls <- base::sys.calls [18:41:20.708] `[[` <- base::`[[` [18:41:20.708] `+` <- base::`+` [18:41:20.708] `<<-` <- base::`<<-` [18:41:20.708] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:20.708] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:20.708] 3L)] [18:41:20.708] } [18:41:20.708] function(cond) { [18:41:20.708] is_error <- inherits(cond, "error") [18:41:20.708] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:20.708] NULL) [18:41:20.708] if (is_error) { [18:41:20.708] sessionInformation <- function() { [18:41:20.708] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:20.708] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:20.708] search = base::search(), system = base::Sys.info()) [18:41:20.708] } [18:41:20.708] ...future.conditions[[length(...future.conditions) + [18:41:20.708] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:20.708] cond$call), session = sessionInformation(), [18:41:20.708] timestamp = base::Sys.time(), signaled = 0L) [18:41:20.708] signalCondition(cond) [18:41:20.708] } [18:41:20.708] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:20.708] "immediateCondition"))) { [18:41:20.708] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:20.708] ...future.conditions[[length(...future.conditions) + [18:41:20.708] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:20.708] if (TRUE && !signal) { [18:41:20.708] muffleCondition <- function (cond, pattern = "^muffle") [18:41:20.708] { [18:41:20.708] inherits <- base::inherits [18:41:20.708] invokeRestart <- base::invokeRestart [18:41:20.708] is.null <- base::is.null [18:41:20.708] muffled <- FALSE [18:41:20.708] if (inherits(cond, "message")) { [18:41:20.708] muffled <- grepl(pattern, "muffleMessage") [18:41:20.708] if (muffled) [18:41:20.708] invokeRestart("muffleMessage") [18:41:20.708] } [18:41:20.708] else if (inherits(cond, "warning")) { [18:41:20.708] muffled <- grepl(pattern, "muffleWarning") [18:41:20.708] if (muffled) [18:41:20.708] invokeRestart("muffleWarning") [18:41:20.708] } [18:41:20.708] else if (inherits(cond, "condition")) { [18:41:20.708] if (!is.null(pattern)) { [18:41:20.708] computeRestarts <- base::computeRestarts [18:41:20.708] grepl <- base::grepl [18:41:20.708] restarts <- computeRestarts(cond) [18:41:20.708] for (restart in restarts) { [18:41:20.708] name <- restart$name [18:41:20.708] if (is.null(name)) [18:41:20.708] next [18:41:20.708] if (!grepl(pattern, name)) [18:41:20.708] next [18:41:20.708] invokeRestart(restart) [18:41:20.708] muffled <- TRUE [18:41:20.708] break [18:41:20.708] } [18:41:20.708] } [18:41:20.708] } [18:41:20.708] invisible(muffled) [18:41:20.708] } [18:41:20.708] muffleCondition(cond, pattern = "^muffle") [18:41:20.708] } [18:41:20.708] } [18:41:20.708] else { [18:41:20.708] if (TRUE) { [18:41:20.708] muffleCondition <- function (cond, pattern = "^muffle") [18:41:20.708] { [18:41:20.708] inherits <- base::inherits [18:41:20.708] invokeRestart <- base::invokeRestart [18:41:20.708] is.null <- base::is.null [18:41:20.708] muffled <- FALSE [18:41:20.708] if (inherits(cond, "message")) { [18:41:20.708] muffled <- grepl(pattern, "muffleMessage") [18:41:20.708] if (muffled) [18:41:20.708] invokeRestart("muffleMessage") [18:41:20.708] } [18:41:20.708] else if (inherits(cond, "warning")) { [18:41:20.708] muffled <- grepl(pattern, "muffleWarning") [18:41:20.708] if (muffled) [18:41:20.708] invokeRestart("muffleWarning") [18:41:20.708] } [18:41:20.708] else if (inherits(cond, "condition")) { [18:41:20.708] if (!is.null(pattern)) { [18:41:20.708] computeRestarts <- base::computeRestarts [18:41:20.708] grepl <- base::grepl [18:41:20.708] restarts <- computeRestarts(cond) [18:41:20.708] for (restart in restarts) { [18:41:20.708] name <- restart$name [18:41:20.708] if (is.null(name)) [18:41:20.708] next [18:41:20.708] if (!grepl(pattern, name)) [18:41:20.708] next [18:41:20.708] invokeRestart(restart) [18:41:20.708] muffled <- TRUE [18:41:20.708] break [18:41:20.708] } [18:41:20.708] } [18:41:20.708] } [18:41:20.708] invisible(muffled) [18:41:20.708] } [18:41:20.708] muffleCondition(cond, pattern = "^muffle") [18:41:20.708] } [18:41:20.708] } [18:41:20.708] } [18:41:20.708] })) [18:41:20.708] }, error = function(ex) { [18:41:20.708] base::structure(base::list(value = NULL, visible = NULL, [18:41:20.708] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:20.708] ...future.rng), started = ...future.startTime, [18:41:20.708] finished = Sys.time(), session_uuid = NA_character_, [18:41:20.708] version = "1.8"), class = "FutureResult") [18:41:20.708] }, finally = { [18:41:20.708] if (!identical(...future.workdir, getwd())) [18:41:20.708] setwd(...future.workdir) [18:41:20.708] { [18:41:20.708] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:20.708] ...future.oldOptions$nwarnings <- NULL [18:41:20.708] } [18:41:20.708] base::options(...future.oldOptions) [18:41:20.708] if (.Platform$OS.type == "windows") { [18:41:20.708] old_names <- names(...future.oldEnvVars) [18:41:20.708] envs <- base::Sys.getenv() [18:41:20.708] names <- names(envs) [18:41:20.708] common <- intersect(names, old_names) [18:41:20.708] added <- setdiff(names, old_names) [18:41:20.708] removed <- setdiff(old_names, names) [18:41:20.708] changed <- common[...future.oldEnvVars[common] != [18:41:20.708] envs[common]] [18:41:20.708] NAMES <- toupper(changed) [18:41:20.708] args <- list() [18:41:20.708] for (kk in seq_along(NAMES)) { [18:41:20.708] name <- changed[[kk]] [18:41:20.708] NAME <- NAMES[[kk]] [18:41:20.708] if (name != NAME && is.element(NAME, old_names)) [18:41:20.708] next [18:41:20.708] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:20.708] } [18:41:20.708] NAMES <- toupper(added) [18:41:20.708] for (kk in seq_along(NAMES)) { [18:41:20.708] name <- added[[kk]] [18:41:20.708] NAME <- NAMES[[kk]] [18:41:20.708] if (name != NAME && is.element(NAME, old_names)) [18:41:20.708] next [18:41:20.708] args[[name]] <- "" [18:41:20.708] } [18:41:20.708] NAMES <- toupper(removed) [18:41:20.708] for (kk in seq_along(NAMES)) { [18:41:20.708] name <- removed[[kk]] [18:41:20.708] NAME <- NAMES[[kk]] [18:41:20.708] if (name != NAME && is.element(NAME, old_names)) [18:41:20.708] next [18:41:20.708] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:20.708] } [18:41:20.708] if (length(args) > 0) [18:41:20.708] base::do.call(base::Sys.setenv, args = args) [18:41:20.708] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:20.708] } [18:41:20.708] else { [18:41:20.708] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:20.708] } [18:41:20.708] { [18:41:20.708] if (base::length(...future.futureOptionsAdded) > [18:41:20.708] 0L) { [18:41:20.708] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:20.708] base::names(opts) <- ...future.futureOptionsAdded [18:41:20.708] base::options(opts) [18:41:20.708] } [18:41:20.708] { [18:41:20.708] { [18:41:20.708] NULL [18:41:20.708] RNGkind("Mersenne-Twister") [18:41:20.708] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:20.708] inherits = FALSE) [18:41:20.708] } [18:41:20.708] options(future.plan = NULL) [18:41:20.708] if (is.na(NA_character_)) [18:41:20.708] Sys.unsetenv("R_FUTURE_PLAN") [18:41:20.708] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:20.708] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:20.708] .init = FALSE) [18:41:20.708] } [18:41:20.708] } [18:41:20.708] } [18:41:20.708] }) [18:41:20.708] if (TRUE) { [18:41:20.708] base::sink(type = "output", split = FALSE) [18:41:20.708] if (TRUE) { [18:41:20.708] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:20.708] } [18:41:20.708] else { [18:41:20.708] ...future.result["stdout"] <- base::list(NULL) [18:41:20.708] } [18:41:20.708] base::close(...future.stdout) [18:41:20.708] ...future.stdout <- NULL [18:41:20.708] } [18:41:20.708] ...future.result$conditions <- ...future.conditions [18:41:20.708] ...future.result$finished <- base::Sys.time() [18:41:20.708] ...future.result [18:41:20.708] } [18:41:20.712] assign_globals() ... [18:41:20.713] List of 5 [18:41:20.713] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:20.713] $ future.call.arguments :List of 1 [18:41:20.713] ..$ length: int 2 [18:41:20.713] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:20.713] $ ...future.elements_ii :List of 4 [18:41:20.713] ..$ a: chr "integer" [18:41:20.713] ..$ b: chr "numeric" [18:41:20.713] ..$ c: chr "character" [18:41:20.713] ..$ c: chr "list" [18:41:20.713] $ ...future.seeds_ii : NULL [18:41:20.713] $ ...future.globals.maxSize: NULL [18:41:20.713] - attr(*, "where")=List of 5 [18:41:20.713] ..$ ...future.FUN : [18:41:20.713] ..$ future.call.arguments : [18:41:20.713] ..$ ...future.elements_ii : [18:41:20.713] ..$ ...future.seeds_ii : [18:41:20.713] ..$ ...future.globals.maxSize: [18:41:20.713] - attr(*, "resolved")= logi FALSE [18:41:20.713] - attr(*, "total_size")= num 4324 [18:41:20.713] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:20.713] - attr(*, "already-done")= logi TRUE [18:41:20.721] - copied '...future.FUN' to environment [18:41:20.721] - copied 'future.call.arguments' to environment [18:41:20.722] - copied '...future.elements_ii' to environment [18:41:20.722] - copied '...future.seeds_ii' to environment [18:41:20.722] - copied '...future.globals.maxSize' to environment [18:41:20.722] assign_globals() ... done [18:41:20.723] plan(): Setting new future strategy stack: [18:41:20.723] List of future strategies: [18:41:20.723] 1. sequential: [18:41:20.723] - args: function (..., envir = parent.frame(), workers = "") [18:41:20.723] - tweaked: FALSE [18:41:20.723] - call: NULL [18:41:20.724] plan(): nbrOfWorkers() = 1 [18:41:20.725] plan(): Setting new future strategy stack: [18:41:20.725] List of future strategies: [18:41:20.725] 1. sequential: [18:41:20.725] - args: function (..., envir = parent.frame(), workers = "") [18:41:20.725] - tweaked: FALSE [18:41:20.725] - call: plan(strategy) [18:41:20.726] plan(): nbrOfWorkers() = 1 [18:41:20.726] SequentialFuture started (and completed) [18:41:20.727] - Launch lazy future ... done [18:41:20.727] run() for 'SequentialFuture' ... done [18:41:20.727] Created future: [18:41:20.727] SequentialFuture: [18:41:20.727] Label: 'future_lapply-1' [18:41:20.727] Expression: [18:41:20.727] { [18:41:20.727] do.call(function(...) { [18:41:20.727] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.727] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:20.727] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.727] on.exit(options(oopts), add = TRUE) [18:41:20.727] } [18:41:20.727] { [18:41:20.727] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:20.727] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.727] ...future.FUN(...future.X_jj, ...) [18:41:20.727] }) [18:41:20.727] } [18:41:20.727] }, args = future.call.arguments) [18:41:20.727] } [18:41:20.727] Lazy evaluation: FALSE [18:41:20.727] Asynchronous evaluation: FALSE [18:41:20.727] Local evaluation: TRUE [18:41:20.727] Environment: R_GlobalEnv [18:41:20.727] Capture standard output: TRUE [18:41:20.727] Capture condition classes: 'condition' (excluding 'nothing') [18:41:20.727] Globals: 5 objects totaling 853 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 191 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:20.727] Packages: [18:41:20.727] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:20.727] Resolved: TRUE [18:41:20.727] Value: 111 bytes of class 'list' [18:41:20.727] Early signaling: FALSE [18:41:20.727] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:20.727] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:20.734] Chunk #1 of 1 ... DONE [18:41:20.734] Launching 1 futures (chunks) ... DONE [18:41:20.734] Resolving 1 futures (chunks) ... [18:41:20.735] resolve() on list ... [18:41:20.735] recursive: 0 [18:41:20.735] length: 1 [18:41:20.735] [18:41:20.735] resolved() for 'SequentialFuture' ... [18:41:20.736] - state: 'finished' [18:41:20.736] - run: TRUE [18:41:20.736] - result: 'FutureResult' [18:41:20.736] resolved() for 'SequentialFuture' ... done [18:41:20.737] Future #1 [18:41:20.737] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:20.737] - nx: 1 [18:41:20.737] - relay: TRUE [18:41:20.737] - stdout: TRUE [18:41:20.738] - signal: TRUE [18:41:20.738] - resignal: FALSE [18:41:20.738] - force: TRUE [18:41:20.738] - relayed: [n=1] FALSE [18:41:20.738] - queued futures: [n=1] FALSE [18:41:20.738] - until=1 [18:41:20.739] - relaying element #1 [18:41:20.739] - relayed: [n=1] TRUE [18:41:20.739] - queued futures: [n=1] TRUE [18:41:20.739] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:20.740] length: 0 (resolved future 1) [18:41:20.740] Relaying remaining futures [18:41:20.740] signalConditionsASAP(NULL, pos=0) ... [18:41:20.740] - nx: 1 [18:41:20.740] - relay: TRUE [18:41:20.741] - stdout: TRUE [18:41:20.741] - signal: TRUE [18:41:20.741] - resignal: FALSE [18:41:20.741] - force: TRUE [18:41:20.741] - relayed: [n=1] TRUE [18:41:20.741] - queued futures: [n=1] TRUE - flush all [18:41:20.742] - relayed: [n=1] TRUE [18:41:20.742] - queued futures: [n=1] TRUE [18:41:20.742] signalConditionsASAP(NULL, pos=0) ... done [18:41:20.742] resolve() on list ... DONE [18:41:20.743] - Number of value chunks collected: 1 [18:41:20.743] Resolving 1 futures (chunks) ... DONE [18:41:20.743] Reducing values from 1 chunks ... [18:41:20.743] - Number of values collected after concatenation: 4 [18:41:20.743] - Number of values expected: 4 [18:41:20.743] Reducing values from 1 chunks ... DONE [18:41:20.744] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL - future_lapply(x, FUN = base::vector, ...) ... [18:41:20.747] future_lapply() ... [18:41:20.748] Number of chunks: 1 [18:41:20.748] getGlobalsAndPackagesXApply() ... [18:41:20.749] - future.globals: TRUE [18:41:20.749] getGlobalsAndPackages() ... [18:41:20.749] Searching for globals... [18:41:20.751] - globals found: [2] 'FUN', '.Internal' [18:41:20.751] Searching for globals ... DONE [18:41:20.751] Resolving globals: FALSE [18:41:20.752] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:20.752] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:20.753] - globals: [1] 'FUN' [18:41:20.753] [18:41:20.753] getGlobalsAndPackages() ... DONE [18:41:20.753] - globals found/used: [n=1] 'FUN' [18:41:20.753] - needed namespaces: [n=0] [18:41:20.754] Finding globals ... DONE [18:41:20.754] - use_args: TRUE [18:41:20.754] - Getting '...' globals ... [18:41:20.755] resolve() on list ... [18:41:20.755] recursive: 0 [18:41:20.755] length: 1 [18:41:20.755] elements: '...' [18:41:20.755] length: 0 (resolved future 1) [18:41:20.756] resolve() on list ... DONE [18:41:20.756] - '...' content: [n=1] 'length' [18:41:20.756] List of 1 [18:41:20.756] $ ...:List of 1 [18:41:20.756] ..$ length: int 2 [18:41:20.756] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:20.756] - attr(*, "where")=List of 1 [18:41:20.756] ..$ ...: [18:41:20.756] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:20.756] - attr(*, "resolved")= logi TRUE [18:41:20.756] - attr(*, "total_size")= num NA [18:41:20.760] - Getting '...' globals ... DONE [18:41:20.761] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:20.761] List of 2 [18:41:20.761] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:20.761] $ ... :List of 1 [18:41:20.761] ..$ length: int 2 [18:41:20.761] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:20.761] - attr(*, "where")=List of 2 [18:41:20.761] ..$ ...future.FUN: [18:41:20.761] ..$ ... : [18:41:20.761] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:20.761] - attr(*, "resolved")= logi FALSE [18:41:20.761] - attr(*, "total_size")= int 4406 [18:41:20.766] Packages to be attached in all futures: [n=0] [18:41:20.766] getGlobalsAndPackagesXApply() ... DONE [18:41:20.766] Number of futures (= number of chunks): 1 [18:41:20.766] Launching 1 futures (chunks) ... [18:41:20.767] Chunk #1 of 1 ... [18:41:20.767] - Finding globals in 'X' for chunk #1 ... [18:41:20.767] getGlobalsAndPackages() ... [18:41:20.767] Searching for globals... [18:41:20.768] [18:41:20.768] Searching for globals ... DONE [18:41:20.768] - globals: [0] [18:41:20.768] getGlobalsAndPackages() ... DONE [18:41:20.768] + additional globals found: [n=0] [18:41:20.769] + additional namespaces needed: [n=0] [18:41:20.769] - Finding globals in 'X' for chunk #1 ... DONE [18:41:20.769] - seeds: [18:41:20.769] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.769] getGlobalsAndPackages() ... [18:41:20.769] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.770] Resolving globals: FALSE [18:41:20.770] Tweak future expression to call with '...' arguments ... [18:41:20.770] { [18:41:20.770] do.call(function(...) { [18:41:20.770] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.770] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:20.770] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.770] on.exit(options(oopts), add = TRUE) [18:41:20.770] } [18:41:20.770] { [18:41:20.770] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:20.770] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.770] ...future.FUN(...future.X_jj, ...) [18:41:20.770] }) [18:41:20.770] } [18:41:20.770] }, args = future.call.arguments) [18:41:20.770] } [18:41:20.771] Tweak future expression to call with '...' arguments ... DONE [18:41:20.771] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.771] [18:41:20.772] getGlobalsAndPackages() ... DONE [18:41:20.772] run() for 'Future' ... [18:41:20.772] - state: 'created' [18:41:20.772] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:20.773] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:20.773] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:20.773] - Field: 'label' [18:41:20.773] - Field: 'local' [18:41:20.774] - Field: 'owner' [18:41:20.774] - Field: 'envir' [18:41:20.774] - Field: 'packages' [18:41:20.774] - Field: 'gc' [18:41:20.774] - Field: 'conditions' [18:41:20.775] - Field: 'expr' [18:41:20.775] - Field: 'uuid' [18:41:20.775] - Field: 'seed' [18:41:20.775] - Field: 'version' [18:41:20.775] - Field: 'result' [18:41:20.776] - Field: 'asynchronous' [18:41:20.776] - Field: 'calls' [18:41:20.776] - Field: 'globals' [18:41:20.776] - Field: 'stdout' [18:41:20.776] - Field: 'earlySignal' [18:41:20.777] - Field: 'lazy' [18:41:20.777] - Field: 'state' [18:41:20.777] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:20.777] - Launch lazy future ... [18:41:20.777] Packages needed by the future expression (n = 0): [18:41:20.778] Packages needed by future strategies (n = 0): [18:41:20.778] { [18:41:20.778] { [18:41:20.778] { [18:41:20.778] ...future.startTime <- base::Sys.time() [18:41:20.778] { [18:41:20.778] { [18:41:20.778] { [18:41:20.778] base::local({ [18:41:20.778] has_future <- base::requireNamespace("future", [18:41:20.778] quietly = TRUE) [18:41:20.778] if (has_future) { [18:41:20.778] ns <- base::getNamespace("future") [18:41:20.778] version <- ns[[".package"]][["version"]] [18:41:20.778] if (is.null(version)) [18:41:20.778] version <- utils::packageVersion("future") [18:41:20.778] } [18:41:20.778] else { [18:41:20.778] version <- NULL [18:41:20.778] } [18:41:20.778] if (!has_future || version < "1.8.0") { [18:41:20.778] info <- base::c(r_version = base::gsub("R version ", [18:41:20.778] "", base::R.version$version.string), [18:41:20.778] platform = base::sprintf("%s (%s-bit)", [18:41:20.778] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:20.778] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:20.778] "release", "version")], collapse = " "), [18:41:20.778] hostname = base::Sys.info()[["nodename"]]) [18:41:20.778] info <- base::sprintf("%s: %s", base::names(info), [18:41:20.778] info) [18:41:20.778] info <- base::paste(info, collapse = "; ") [18:41:20.778] if (!has_future) { [18:41:20.778] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:20.778] info) [18:41:20.778] } [18:41:20.778] else { [18:41:20.778] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:20.778] info, version) [18:41:20.778] } [18:41:20.778] base::stop(msg) [18:41:20.778] } [18:41:20.778] }) [18:41:20.778] } [18:41:20.778] ...future.strategy.old <- future::plan("list") [18:41:20.778] options(future.plan = NULL) [18:41:20.778] Sys.unsetenv("R_FUTURE_PLAN") [18:41:20.778] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:20.778] } [18:41:20.778] ...future.workdir <- getwd() [18:41:20.778] } [18:41:20.778] ...future.oldOptions <- base::as.list(base::.Options) [18:41:20.778] ...future.oldEnvVars <- base::Sys.getenv() [18:41:20.778] } [18:41:20.778] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:20.778] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:20.778] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:20.778] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:20.778] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:20.778] future.stdout.windows.reencode = NULL, width = 80L) [18:41:20.778] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:20.778] base::names(...future.oldOptions)) [18:41:20.778] } [18:41:20.778] if (FALSE) { [18:41:20.778] } [18:41:20.778] else { [18:41:20.778] if (TRUE) { [18:41:20.778] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:20.778] open = "w") [18:41:20.778] } [18:41:20.778] else { [18:41:20.778] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:20.778] windows = "NUL", "/dev/null"), open = "w") [18:41:20.778] } [18:41:20.778] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:20.778] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:20.778] base::sink(type = "output", split = FALSE) [18:41:20.778] base::close(...future.stdout) [18:41:20.778] }, add = TRUE) [18:41:20.778] } [18:41:20.778] ...future.frame <- base::sys.nframe() [18:41:20.778] ...future.conditions <- base::list() [18:41:20.778] ...future.rng <- base::globalenv()$.Random.seed [18:41:20.778] if (FALSE) { [18:41:20.778] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:20.778] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:20.778] } [18:41:20.778] ...future.result <- base::tryCatch({ [18:41:20.778] base::withCallingHandlers({ [18:41:20.778] ...future.value <- base::withVisible(base::local({ [18:41:20.778] do.call(function(...) { [18:41:20.778] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.778] if (!identical(...future.globals.maxSize.org, [18:41:20.778] ...future.globals.maxSize)) { [18:41:20.778] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.778] on.exit(options(oopts), add = TRUE) [18:41:20.778] } [18:41:20.778] { [18:41:20.778] lapply(seq_along(...future.elements_ii), [18:41:20.778] FUN = function(jj) { [18:41:20.778] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.778] ...future.FUN(...future.X_jj, ...) [18:41:20.778] }) [18:41:20.778] } [18:41:20.778] }, args = future.call.arguments) [18:41:20.778] })) [18:41:20.778] future::FutureResult(value = ...future.value$value, [18:41:20.778] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:20.778] ...future.rng), globalenv = if (FALSE) [18:41:20.778] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:20.778] ...future.globalenv.names)) [18:41:20.778] else NULL, started = ...future.startTime, version = "1.8") [18:41:20.778] }, condition = base::local({ [18:41:20.778] c <- base::c [18:41:20.778] inherits <- base::inherits [18:41:20.778] invokeRestart <- base::invokeRestart [18:41:20.778] length <- base::length [18:41:20.778] list <- base::list [18:41:20.778] seq.int <- base::seq.int [18:41:20.778] signalCondition <- base::signalCondition [18:41:20.778] sys.calls <- base::sys.calls [18:41:20.778] `[[` <- base::`[[` [18:41:20.778] `+` <- base::`+` [18:41:20.778] `<<-` <- base::`<<-` [18:41:20.778] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:20.778] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:20.778] 3L)] [18:41:20.778] } [18:41:20.778] function(cond) { [18:41:20.778] is_error <- inherits(cond, "error") [18:41:20.778] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:20.778] NULL) [18:41:20.778] if (is_error) { [18:41:20.778] sessionInformation <- function() { [18:41:20.778] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:20.778] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:20.778] search = base::search(), system = base::Sys.info()) [18:41:20.778] } [18:41:20.778] ...future.conditions[[length(...future.conditions) + [18:41:20.778] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:20.778] cond$call), session = sessionInformation(), [18:41:20.778] timestamp = base::Sys.time(), signaled = 0L) [18:41:20.778] signalCondition(cond) [18:41:20.778] } [18:41:20.778] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:20.778] "immediateCondition"))) { [18:41:20.778] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:20.778] ...future.conditions[[length(...future.conditions) + [18:41:20.778] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:20.778] if (TRUE && !signal) { [18:41:20.778] muffleCondition <- function (cond, pattern = "^muffle") [18:41:20.778] { [18:41:20.778] inherits <- base::inherits [18:41:20.778] invokeRestart <- base::invokeRestart [18:41:20.778] is.null <- base::is.null [18:41:20.778] muffled <- FALSE [18:41:20.778] if (inherits(cond, "message")) { [18:41:20.778] muffled <- grepl(pattern, "muffleMessage") [18:41:20.778] if (muffled) [18:41:20.778] invokeRestart("muffleMessage") [18:41:20.778] } [18:41:20.778] else if (inherits(cond, "warning")) { [18:41:20.778] muffled <- grepl(pattern, "muffleWarning") [18:41:20.778] if (muffled) [18:41:20.778] invokeRestart("muffleWarning") [18:41:20.778] } [18:41:20.778] else if (inherits(cond, "condition")) { [18:41:20.778] if (!is.null(pattern)) { [18:41:20.778] computeRestarts <- base::computeRestarts [18:41:20.778] grepl <- base::grepl [18:41:20.778] restarts <- computeRestarts(cond) [18:41:20.778] for (restart in restarts) { [18:41:20.778] name <- restart$name [18:41:20.778] if (is.null(name)) [18:41:20.778] next [18:41:20.778] if (!grepl(pattern, name)) [18:41:20.778] next [18:41:20.778] invokeRestart(restart) [18:41:20.778] muffled <- TRUE [18:41:20.778] break [18:41:20.778] } [18:41:20.778] } [18:41:20.778] } [18:41:20.778] invisible(muffled) [18:41:20.778] } [18:41:20.778] muffleCondition(cond, pattern = "^muffle") [18:41:20.778] } [18:41:20.778] } [18:41:20.778] else { [18:41:20.778] if (TRUE) { [18:41:20.778] muffleCondition <- function (cond, pattern = "^muffle") [18:41:20.778] { [18:41:20.778] inherits <- base::inherits [18:41:20.778] invokeRestart <- base::invokeRestart [18:41:20.778] is.null <- base::is.null [18:41:20.778] muffled <- FALSE [18:41:20.778] if (inherits(cond, "message")) { [18:41:20.778] muffled <- grepl(pattern, "muffleMessage") [18:41:20.778] if (muffled) [18:41:20.778] invokeRestart("muffleMessage") [18:41:20.778] } [18:41:20.778] else if (inherits(cond, "warning")) { [18:41:20.778] muffled <- grepl(pattern, "muffleWarning") [18:41:20.778] if (muffled) [18:41:20.778] invokeRestart("muffleWarning") [18:41:20.778] } [18:41:20.778] else if (inherits(cond, "condition")) { [18:41:20.778] if (!is.null(pattern)) { [18:41:20.778] computeRestarts <- base::computeRestarts [18:41:20.778] grepl <- base::grepl [18:41:20.778] restarts <- computeRestarts(cond) [18:41:20.778] for (restart in restarts) { [18:41:20.778] name <- restart$name [18:41:20.778] if (is.null(name)) [18:41:20.778] next [18:41:20.778] if (!grepl(pattern, name)) [18:41:20.778] next [18:41:20.778] invokeRestart(restart) [18:41:20.778] muffled <- TRUE [18:41:20.778] break [18:41:20.778] } [18:41:20.778] } [18:41:20.778] } [18:41:20.778] invisible(muffled) [18:41:20.778] } [18:41:20.778] muffleCondition(cond, pattern = "^muffle") [18:41:20.778] } [18:41:20.778] } [18:41:20.778] } [18:41:20.778] })) [18:41:20.778] }, error = function(ex) { [18:41:20.778] base::structure(base::list(value = NULL, visible = NULL, [18:41:20.778] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:20.778] ...future.rng), started = ...future.startTime, [18:41:20.778] finished = Sys.time(), session_uuid = NA_character_, [18:41:20.778] version = "1.8"), class = "FutureResult") [18:41:20.778] }, finally = { [18:41:20.778] if (!identical(...future.workdir, getwd())) [18:41:20.778] setwd(...future.workdir) [18:41:20.778] { [18:41:20.778] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:20.778] ...future.oldOptions$nwarnings <- NULL [18:41:20.778] } [18:41:20.778] base::options(...future.oldOptions) [18:41:20.778] if (.Platform$OS.type == "windows") { [18:41:20.778] old_names <- names(...future.oldEnvVars) [18:41:20.778] envs <- base::Sys.getenv() [18:41:20.778] names <- names(envs) [18:41:20.778] common <- intersect(names, old_names) [18:41:20.778] added <- setdiff(names, old_names) [18:41:20.778] removed <- setdiff(old_names, names) [18:41:20.778] changed <- common[...future.oldEnvVars[common] != [18:41:20.778] envs[common]] [18:41:20.778] NAMES <- toupper(changed) [18:41:20.778] args <- list() [18:41:20.778] for (kk in seq_along(NAMES)) { [18:41:20.778] name <- changed[[kk]] [18:41:20.778] NAME <- NAMES[[kk]] [18:41:20.778] if (name != NAME && is.element(NAME, old_names)) [18:41:20.778] next [18:41:20.778] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:20.778] } [18:41:20.778] NAMES <- toupper(added) [18:41:20.778] for (kk in seq_along(NAMES)) { [18:41:20.778] name <- added[[kk]] [18:41:20.778] NAME <- NAMES[[kk]] [18:41:20.778] if (name != NAME && is.element(NAME, old_names)) [18:41:20.778] next [18:41:20.778] args[[name]] <- "" [18:41:20.778] } [18:41:20.778] NAMES <- toupper(removed) [18:41:20.778] for (kk in seq_along(NAMES)) { [18:41:20.778] name <- removed[[kk]] [18:41:20.778] NAME <- NAMES[[kk]] [18:41:20.778] if (name != NAME && is.element(NAME, old_names)) [18:41:20.778] next [18:41:20.778] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:20.778] } [18:41:20.778] if (length(args) > 0) [18:41:20.778] base::do.call(base::Sys.setenv, args = args) [18:41:20.778] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:20.778] } [18:41:20.778] else { [18:41:20.778] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:20.778] } [18:41:20.778] { [18:41:20.778] if (base::length(...future.futureOptionsAdded) > [18:41:20.778] 0L) { [18:41:20.778] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:20.778] base::names(opts) <- ...future.futureOptionsAdded [18:41:20.778] base::options(opts) [18:41:20.778] } [18:41:20.778] { [18:41:20.778] { [18:41:20.778] NULL [18:41:20.778] RNGkind("Mersenne-Twister") [18:41:20.778] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:20.778] inherits = FALSE) [18:41:20.778] } [18:41:20.778] options(future.plan = NULL) [18:41:20.778] if (is.na(NA_character_)) [18:41:20.778] Sys.unsetenv("R_FUTURE_PLAN") [18:41:20.778] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:20.778] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:20.778] .init = FALSE) [18:41:20.778] } [18:41:20.778] } [18:41:20.778] } [18:41:20.778] }) [18:41:20.778] if (TRUE) { [18:41:20.778] base::sink(type = "output", split = FALSE) [18:41:20.778] if (TRUE) { [18:41:20.778] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:20.778] } [18:41:20.778] else { [18:41:20.778] ...future.result["stdout"] <- base::list(NULL) [18:41:20.778] } [18:41:20.778] base::close(...future.stdout) [18:41:20.778] ...future.stdout <- NULL [18:41:20.778] } [18:41:20.778] ...future.result$conditions <- ...future.conditions [18:41:20.778] ...future.result$finished <- base::Sys.time() [18:41:20.778] ...future.result [18:41:20.778] } [18:41:20.782] assign_globals() ... [18:41:20.782] List of 5 [18:41:20.782] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:20.782] $ future.call.arguments :List of 1 [18:41:20.782] ..$ length: int 2 [18:41:20.782] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:20.782] $ ...future.elements_ii :List of 4 [18:41:20.782] ..$ a: chr "integer" [18:41:20.782] ..$ b: chr "numeric" [18:41:20.782] ..$ c: chr "character" [18:41:20.782] ..$ c: chr "list" [18:41:20.782] $ ...future.seeds_ii : NULL [18:41:20.782] $ ...future.globals.maxSize: NULL [18:41:20.782] - attr(*, "where")=List of 5 [18:41:20.782] ..$ ...future.FUN : [18:41:20.782] ..$ future.call.arguments : [18:41:20.782] ..$ ...future.elements_ii : [18:41:20.782] ..$ ...future.seeds_ii : [18:41:20.782] ..$ ...future.globals.maxSize: [18:41:20.782] - attr(*, "resolved")= logi FALSE [18:41:20.782] - attr(*, "total_size")= num 4406 [18:41:20.782] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:20.782] - attr(*, "already-done")= logi TRUE [18:41:20.790] - copied '...future.FUN' to environment [18:41:20.791] - copied 'future.call.arguments' to environment [18:41:20.791] - copied '...future.elements_ii' to environment [18:41:20.791] - copied '...future.seeds_ii' to environment [18:41:20.791] - copied '...future.globals.maxSize' to environment [18:41:20.791] assign_globals() ... done [18:41:20.792] plan(): Setting new future strategy stack: [18:41:20.792] List of future strategies: [18:41:20.792] 1. sequential: [18:41:20.792] - args: function (..., envir = parent.frame(), workers = "") [18:41:20.792] - tweaked: FALSE [18:41:20.792] - call: NULL [18:41:20.792] plan(): nbrOfWorkers() = 1 [18:41:20.794] plan(): Setting new future strategy stack: [18:41:20.794] List of future strategies: [18:41:20.794] 1. sequential: [18:41:20.794] - args: function (..., envir = parent.frame(), workers = "") [18:41:20.794] - tweaked: FALSE [18:41:20.794] - call: plan(strategy) [18:41:20.795] plan(): nbrOfWorkers() = 1 [18:41:20.795] SequentialFuture started (and completed) [18:41:20.795] - Launch lazy future ... done [18:41:20.795] run() for 'SequentialFuture' ... done [18:41:20.796] Created future: [18:41:20.796] SequentialFuture: [18:41:20.796] Label: 'future_lapply-1' [18:41:20.796] Expression: [18:41:20.796] { [18:41:20.796] do.call(function(...) { [18:41:20.796] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.796] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:20.796] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.796] on.exit(options(oopts), add = TRUE) [18:41:20.796] } [18:41:20.796] { [18:41:20.796] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:20.796] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.796] ...future.FUN(...future.X_jj, ...) [18:41:20.796] }) [18:41:20.796] } [18:41:20.796] }, args = future.call.arguments) [18:41:20.796] } [18:41:20.796] Lazy evaluation: FALSE [18:41:20.796] Asynchronous evaluation: FALSE [18:41:20.796] Local evaluation: TRUE [18:41:20.796] Environment: R_GlobalEnv [18:41:20.796] Capture standard output: TRUE [18:41:20.796] Capture condition classes: 'condition' (excluding 'nothing') [18:41:20.796] Globals: 5 objects totaling 853 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 191 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:20.796] Packages: [18:41:20.796] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:20.796] Resolved: TRUE [18:41:20.796] Value: 111 bytes of class 'list' [18:41:20.796] Early signaling: FALSE [18:41:20.796] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:20.796] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:20.797] Chunk #1 of 1 ... DONE [18:41:20.797] Launching 1 futures (chunks) ... DONE [18:41:20.797] Resolving 1 futures (chunks) ... [18:41:20.798] resolve() on list ... [18:41:20.798] recursive: 0 [18:41:20.798] length: 1 [18:41:20.798] [18:41:20.799] resolved() for 'SequentialFuture' ... [18:41:20.799] - state: 'finished' [18:41:20.799] - run: TRUE [18:41:20.799] - result: 'FutureResult' [18:41:20.799] resolved() for 'SequentialFuture' ... done [18:41:20.800] Future #1 [18:41:20.800] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:20.800] - nx: 1 [18:41:20.800] - relay: TRUE [18:41:20.800] - stdout: TRUE [18:41:20.800] - signal: TRUE [18:41:20.801] - resignal: FALSE [18:41:20.801] - force: TRUE [18:41:20.801] - relayed: [n=1] FALSE [18:41:20.801] - queued futures: [n=1] FALSE [18:41:20.801] - until=1 [18:41:20.801] - relaying element #1 [18:41:20.802] - relayed: [n=1] TRUE [18:41:20.802] - queued futures: [n=1] TRUE [18:41:20.802] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:20.802] length: 0 (resolved future 1) [18:41:20.803] Relaying remaining futures [18:41:20.803] signalConditionsASAP(NULL, pos=0) ... [18:41:20.803] - nx: 1 [18:41:20.803] - relay: TRUE [18:41:20.803] - stdout: TRUE [18:41:20.803] - signal: TRUE [18:41:20.803] - resignal: FALSE [18:41:20.804] - force: TRUE [18:41:20.804] - relayed: [n=1] TRUE [18:41:20.804] - queued futures: [n=1] TRUE - flush all [18:41:20.804] - relayed: [n=1] TRUE [18:41:20.804] - queued futures: [n=1] TRUE [18:41:20.805] signalConditionsASAP(NULL, pos=0) ... done [18:41:20.805] resolve() on list ... DONE [18:41:20.805] - Number of value chunks collected: 1 [18:41:20.805] Resolving 1 futures (chunks) ... DONE [18:41:20.805] Reducing values from 1 chunks ... [18:41:20.806] - Number of values collected after concatenation: 4 [18:41:20.806] - Number of values expected: 4 [18:41:20.806] Reducing values from 1 chunks ... DONE [18:41:20.806] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL - future_lapply(x, FUN = future:::hpaste, ...) ... [18:41:20.809] future_lapply() ... [18:41:20.819] Number of chunks: 1 [18:41:20.819] getGlobalsAndPackagesXApply() ... [18:41:20.819] - future.globals: TRUE [18:41:20.819] getGlobalsAndPackages() ... [18:41:20.819] Searching for globals... [18:41:20.830] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [18:41:20.830] Searching for globals ... DONE [18:41:20.831] Resolving globals: FALSE [18:41:20.832] The total size of the 1 globals is 7.17 KiB (7342 bytes) [18:41:20.832] The total size of the 1 globals exported for future expression ('FUN(collapse = "; ", maxHead = 3L)') is 7.17 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (7.17 KiB of class 'function') [18:41:20.833] - globals: [1] 'FUN' [18:41:20.833] - packages: [1] 'future' [18:41:20.833] getGlobalsAndPackages() ... DONE [18:41:20.833] - globals found/used: [n=1] 'FUN' [18:41:20.834] - needed namespaces: [n=1] 'future' [18:41:20.834] Finding globals ... DONE [18:41:20.834] - use_args: TRUE [18:41:20.834] - Getting '...' globals ... [18:41:20.835] resolve() on list ... [18:41:20.835] recursive: 0 [18:41:20.835] length: 1 [18:41:20.835] elements: '...' [18:41:20.835] length: 0 (resolved future 1) [18:41:20.836] resolve() on list ... DONE [18:41:20.836] - '...' content: [n=2] 'collapse', 'maxHead' [18:41:20.836] List of 1 [18:41:20.836] $ ...:List of 2 [18:41:20.836] ..$ collapse: chr "; " [18:41:20.836] ..$ maxHead : int 3 [18:41:20.836] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:20.836] - attr(*, "where")=List of 1 [18:41:20.836] ..$ ...: [18:41:20.836] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:20.836] - attr(*, "resolved")= logi TRUE [18:41:20.836] - attr(*, "total_size")= num NA [18:41:20.922] - Getting '...' globals ... DONE [18:41:20.922] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:20.923] List of 2 [18:41:20.923] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [18:41:20.923] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [18:41:20.923] $ ... :List of 2 [18:41:20.923] ..$ collapse: chr "; " [18:41:20.923] ..$ maxHead : int 3 [18:41:20.923] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:20.923] - attr(*, "where")=List of 2 [18:41:20.923] ..$ ...future.FUN: [18:41:20.923] ..$ ... : [18:41:20.923] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:20.923] - attr(*, "resolved")= logi FALSE [18:41:20.923] - attr(*, "total_size")= int 20301 [18:41:20.927] Packages to be attached in all futures: [n=1] 'future' [18:41:20.927] getGlobalsAndPackagesXApply() ... DONE [18:41:20.927] Number of futures (= number of chunks): 1 [18:41:20.928] Launching 1 futures (chunks) ... [18:41:20.928] Chunk #1 of 1 ... [18:41:20.928] - Finding globals in 'X' for chunk #1 ... [18:41:20.928] getGlobalsAndPackages() ... [18:41:20.928] Searching for globals... [18:41:20.929] [18:41:20.929] Searching for globals ... DONE [18:41:20.929] - globals: [0] [18:41:20.929] getGlobalsAndPackages() ... DONE [18:41:20.929] + additional globals found: [n=0] [18:41:20.930] + additional namespaces needed: [n=0] [18:41:20.930] - Finding globals in 'X' for chunk #1 ... DONE [18:41:20.930] - seeds: [18:41:20.930] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.930] getGlobalsAndPackages() ... [18:41:20.930] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.931] Resolving globals: FALSE [18:41:20.931] Tweak future expression to call with '...' arguments ... [18:41:20.931] { [18:41:20.931] do.call(function(...) { [18:41:20.931] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.931] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:20.931] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.931] on.exit(options(oopts), add = TRUE) [18:41:20.931] } [18:41:20.931] { [18:41:20.931] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:20.931] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.931] ...future.FUN(...future.X_jj, ...) [18:41:20.931] }) [18:41:20.931] } [18:41:20.931] }, args = future.call.arguments) [18:41:20.931] } [18:41:20.931] Tweak future expression to call with '...' arguments ... DONE [18:41:20.932] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.932] - packages: [1] 'future' [18:41:20.932] getGlobalsAndPackages() ... DONE [18:41:20.933] run() for 'Future' ... [18:41:20.933] - state: 'created' [18:41:20.933] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:20.934] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:20.934] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:20.934] - Field: 'label' [18:41:20.934] - Field: 'local' [18:41:20.935] - Field: 'owner' [18:41:20.935] - Field: 'envir' [18:41:20.935] - Field: 'packages' [18:41:20.935] - Field: 'gc' [18:41:20.935] - Field: 'conditions' [18:41:20.936] - Field: 'expr' [18:41:20.936] - Field: 'uuid' [18:41:20.936] - Field: 'seed' [18:41:20.936] - Field: 'version' [18:41:20.936] - Field: 'result' [18:41:20.936] - Field: 'asynchronous' [18:41:20.937] - Field: 'calls' [18:41:20.937] - Field: 'globals' [18:41:20.937] - Field: 'stdout' [18:41:20.937] - Field: 'earlySignal' [18:41:20.937] - Field: 'lazy' [18:41:20.937] - Field: 'state' [18:41:20.938] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:20.938] - Launch lazy future ... [18:41:20.938] Packages needed by the future expression (n = 1): 'future' [18:41:20.938] Packages needed by future strategies (n = 0): [18:41:20.939] { [18:41:20.939] { [18:41:20.939] { [18:41:20.939] ...future.startTime <- base::Sys.time() [18:41:20.939] { [18:41:20.939] { [18:41:20.939] { [18:41:20.939] { [18:41:20.939] base::local({ [18:41:20.939] has_future <- base::requireNamespace("future", [18:41:20.939] quietly = TRUE) [18:41:20.939] if (has_future) { [18:41:20.939] ns <- base::getNamespace("future") [18:41:20.939] version <- ns[[".package"]][["version"]] [18:41:20.939] if (is.null(version)) [18:41:20.939] version <- utils::packageVersion("future") [18:41:20.939] } [18:41:20.939] else { [18:41:20.939] version <- NULL [18:41:20.939] } [18:41:20.939] if (!has_future || version < "1.8.0") { [18:41:20.939] info <- base::c(r_version = base::gsub("R version ", [18:41:20.939] "", base::R.version$version.string), [18:41:20.939] platform = base::sprintf("%s (%s-bit)", [18:41:20.939] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:20.939] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:20.939] "release", "version")], collapse = " "), [18:41:20.939] hostname = base::Sys.info()[["nodename"]]) [18:41:20.939] info <- base::sprintf("%s: %s", base::names(info), [18:41:20.939] info) [18:41:20.939] info <- base::paste(info, collapse = "; ") [18:41:20.939] if (!has_future) { [18:41:20.939] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:20.939] info) [18:41:20.939] } [18:41:20.939] else { [18:41:20.939] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:20.939] info, version) [18:41:20.939] } [18:41:20.939] base::stop(msg) [18:41:20.939] } [18:41:20.939] }) [18:41:20.939] } [18:41:20.939] base::local({ [18:41:20.939] for (pkg in "future") { [18:41:20.939] base::loadNamespace(pkg) [18:41:20.939] base::library(pkg, character.only = TRUE) [18:41:20.939] } [18:41:20.939] }) [18:41:20.939] } [18:41:20.939] ...future.strategy.old <- future::plan("list") [18:41:20.939] options(future.plan = NULL) [18:41:20.939] Sys.unsetenv("R_FUTURE_PLAN") [18:41:20.939] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:20.939] } [18:41:20.939] ...future.workdir <- getwd() [18:41:20.939] } [18:41:20.939] ...future.oldOptions <- base::as.list(base::.Options) [18:41:20.939] ...future.oldEnvVars <- base::Sys.getenv() [18:41:20.939] } [18:41:20.939] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:20.939] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:20.939] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:20.939] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:20.939] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:20.939] future.stdout.windows.reencode = NULL, width = 80L) [18:41:20.939] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:20.939] base::names(...future.oldOptions)) [18:41:20.939] } [18:41:20.939] if (FALSE) { [18:41:20.939] } [18:41:20.939] else { [18:41:20.939] if (TRUE) { [18:41:20.939] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:20.939] open = "w") [18:41:20.939] } [18:41:20.939] else { [18:41:20.939] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:20.939] windows = "NUL", "/dev/null"), open = "w") [18:41:20.939] } [18:41:20.939] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:20.939] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:20.939] base::sink(type = "output", split = FALSE) [18:41:20.939] base::close(...future.stdout) [18:41:20.939] }, add = TRUE) [18:41:20.939] } [18:41:20.939] ...future.frame <- base::sys.nframe() [18:41:20.939] ...future.conditions <- base::list() [18:41:20.939] ...future.rng <- base::globalenv()$.Random.seed [18:41:20.939] if (FALSE) { [18:41:20.939] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:20.939] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:20.939] } [18:41:20.939] ...future.result <- base::tryCatch({ [18:41:20.939] base::withCallingHandlers({ [18:41:20.939] ...future.value <- base::withVisible(base::local({ [18:41:20.939] do.call(function(...) { [18:41:20.939] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.939] if (!identical(...future.globals.maxSize.org, [18:41:20.939] ...future.globals.maxSize)) { [18:41:20.939] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.939] on.exit(options(oopts), add = TRUE) [18:41:20.939] } [18:41:20.939] { [18:41:20.939] lapply(seq_along(...future.elements_ii), [18:41:20.939] FUN = function(jj) { [18:41:20.939] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.939] ...future.FUN(...future.X_jj, ...) [18:41:20.939] }) [18:41:20.939] } [18:41:20.939] }, args = future.call.arguments) [18:41:20.939] })) [18:41:20.939] future::FutureResult(value = ...future.value$value, [18:41:20.939] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:20.939] ...future.rng), globalenv = if (FALSE) [18:41:20.939] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:20.939] ...future.globalenv.names)) [18:41:20.939] else NULL, started = ...future.startTime, version = "1.8") [18:41:20.939] }, condition = base::local({ [18:41:20.939] c <- base::c [18:41:20.939] inherits <- base::inherits [18:41:20.939] invokeRestart <- base::invokeRestart [18:41:20.939] length <- base::length [18:41:20.939] list <- base::list [18:41:20.939] seq.int <- base::seq.int [18:41:20.939] signalCondition <- base::signalCondition [18:41:20.939] sys.calls <- base::sys.calls [18:41:20.939] `[[` <- base::`[[` [18:41:20.939] `+` <- base::`+` [18:41:20.939] `<<-` <- base::`<<-` [18:41:20.939] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:20.939] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:20.939] 3L)] [18:41:20.939] } [18:41:20.939] function(cond) { [18:41:20.939] is_error <- inherits(cond, "error") [18:41:20.939] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:20.939] NULL) [18:41:20.939] if (is_error) { [18:41:20.939] sessionInformation <- function() { [18:41:20.939] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:20.939] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:20.939] search = base::search(), system = base::Sys.info()) [18:41:20.939] } [18:41:20.939] ...future.conditions[[length(...future.conditions) + [18:41:20.939] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:20.939] cond$call), session = sessionInformation(), [18:41:20.939] timestamp = base::Sys.time(), signaled = 0L) [18:41:20.939] signalCondition(cond) [18:41:20.939] } [18:41:20.939] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:20.939] "immediateCondition"))) { [18:41:20.939] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:20.939] ...future.conditions[[length(...future.conditions) + [18:41:20.939] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:20.939] if (TRUE && !signal) { [18:41:20.939] muffleCondition <- function (cond, pattern = "^muffle") [18:41:20.939] { [18:41:20.939] inherits <- base::inherits [18:41:20.939] invokeRestart <- base::invokeRestart [18:41:20.939] is.null <- base::is.null [18:41:20.939] muffled <- FALSE [18:41:20.939] if (inherits(cond, "message")) { [18:41:20.939] muffled <- grepl(pattern, "muffleMessage") [18:41:20.939] if (muffled) [18:41:20.939] invokeRestart("muffleMessage") [18:41:20.939] } [18:41:20.939] else if (inherits(cond, "warning")) { [18:41:20.939] muffled <- grepl(pattern, "muffleWarning") [18:41:20.939] if (muffled) [18:41:20.939] invokeRestart("muffleWarning") [18:41:20.939] } [18:41:20.939] else if (inherits(cond, "condition")) { [18:41:20.939] if (!is.null(pattern)) { [18:41:20.939] computeRestarts <- base::computeRestarts [18:41:20.939] grepl <- base::grepl [18:41:20.939] restarts <- computeRestarts(cond) [18:41:20.939] for (restart in restarts) { [18:41:20.939] name <- restart$name [18:41:20.939] if (is.null(name)) [18:41:20.939] next [18:41:20.939] if (!grepl(pattern, name)) [18:41:20.939] next [18:41:20.939] invokeRestart(restart) [18:41:20.939] muffled <- TRUE [18:41:20.939] break [18:41:20.939] } [18:41:20.939] } [18:41:20.939] } [18:41:20.939] invisible(muffled) [18:41:20.939] } [18:41:20.939] muffleCondition(cond, pattern = "^muffle") [18:41:20.939] } [18:41:20.939] } [18:41:20.939] else { [18:41:20.939] if (TRUE) { [18:41:20.939] muffleCondition <- function (cond, pattern = "^muffle") [18:41:20.939] { [18:41:20.939] inherits <- base::inherits [18:41:20.939] invokeRestart <- base::invokeRestart [18:41:20.939] is.null <- base::is.null [18:41:20.939] muffled <- FALSE [18:41:20.939] if (inherits(cond, "message")) { [18:41:20.939] muffled <- grepl(pattern, "muffleMessage") [18:41:20.939] if (muffled) [18:41:20.939] invokeRestart("muffleMessage") [18:41:20.939] } [18:41:20.939] else if (inherits(cond, "warning")) { [18:41:20.939] muffled <- grepl(pattern, "muffleWarning") [18:41:20.939] if (muffled) [18:41:20.939] invokeRestart("muffleWarning") [18:41:20.939] } [18:41:20.939] else if (inherits(cond, "condition")) { [18:41:20.939] if (!is.null(pattern)) { [18:41:20.939] computeRestarts <- base::computeRestarts [18:41:20.939] grepl <- base::grepl [18:41:20.939] restarts <- computeRestarts(cond) [18:41:20.939] for (restart in restarts) { [18:41:20.939] name <- restart$name [18:41:20.939] if (is.null(name)) [18:41:20.939] next [18:41:20.939] if (!grepl(pattern, name)) [18:41:20.939] next [18:41:20.939] invokeRestart(restart) [18:41:20.939] muffled <- TRUE [18:41:20.939] break [18:41:20.939] } [18:41:20.939] } [18:41:20.939] } [18:41:20.939] invisible(muffled) [18:41:20.939] } [18:41:20.939] muffleCondition(cond, pattern = "^muffle") [18:41:20.939] } [18:41:20.939] } [18:41:20.939] } [18:41:20.939] })) [18:41:20.939] }, error = function(ex) { [18:41:20.939] base::structure(base::list(value = NULL, visible = NULL, [18:41:20.939] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:20.939] ...future.rng), started = ...future.startTime, [18:41:20.939] finished = Sys.time(), session_uuid = NA_character_, [18:41:20.939] version = "1.8"), class = "FutureResult") [18:41:20.939] }, finally = { [18:41:20.939] if (!identical(...future.workdir, getwd())) [18:41:20.939] setwd(...future.workdir) [18:41:20.939] { [18:41:20.939] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:20.939] ...future.oldOptions$nwarnings <- NULL [18:41:20.939] } [18:41:20.939] base::options(...future.oldOptions) [18:41:20.939] if (.Platform$OS.type == "windows") { [18:41:20.939] old_names <- names(...future.oldEnvVars) [18:41:20.939] envs <- base::Sys.getenv() [18:41:20.939] names <- names(envs) [18:41:20.939] common <- intersect(names, old_names) [18:41:20.939] added <- setdiff(names, old_names) [18:41:20.939] removed <- setdiff(old_names, names) [18:41:20.939] changed <- common[...future.oldEnvVars[common] != [18:41:20.939] envs[common]] [18:41:20.939] NAMES <- toupper(changed) [18:41:20.939] args <- list() [18:41:20.939] for (kk in seq_along(NAMES)) { [18:41:20.939] name <- changed[[kk]] [18:41:20.939] NAME <- NAMES[[kk]] [18:41:20.939] if (name != NAME && is.element(NAME, old_names)) [18:41:20.939] next [18:41:20.939] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:20.939] } [18:41:20.939] NAMES <- toupper(added) [18:41:20.939] for (kk in seq_along(NAMES)) { [18:41:20.939] name <- added[[kk]] [18:41:20.939] NAME <- NAMES[[kk]] [18:41:20.939] if (name != NAME && is.element(NAME, old_names)) [18:41:20.939] next [18:41:20.939] args[[name]] <- "" [18:41:20.939] } [18:41:20.939] NAMES <- toupper(removed) [18:41:20.939] for (kk in seq_along(NAMES)) { [18:41:20.939] name <- removed[[kk]] [18:41:20.939] NAME <- NAMES[[kk]] [18:41:20.939] if (name != NAME && is.element(NAME, old_names)) [18:41:20.939] next [18:41:20.939] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:20.939] } [18:41:20.939] if (length(args) > 0) [18:41:20.939] base::do.call(base::Sys.setenv, args = args) [18:41:20.939] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:20.939] } [18:41:20.939] else { [18:41:20.939] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:20.939] } [18:41:20.939] { [18:41:20.939] if (base::length(...future.futureOptionsAdded) > [18:41:20.939] 0L) { [18:41:20.939] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:20.939] base::names(opts) <- ...future.futureOptionsAdded [18:41:20.939] base::options(opts) [18:41:20.939] } [18:41:20.939] { [18:41:20.939] { [18:41:20.939] NULL [18:41:20.939] RNGkind("Mersenne-Twister") [18:41:20.939] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:20.939] inherits = FALSE) [18:41:20.939] } [18:41:20.939] options(future.plan = NULL) [18:41:20.939] if (is.na(NA_character_)) [18:41:20.939] Sys.unsetenv("R_FUTURE_PLAN") [18:41:20.939] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:20.939] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:20.939] .init = FALSE) [18:41:20.939] } [18:41:20.939] } [18:41:20.939] } [18:41:20.939] }) [18:41:20.939] if (TRUE) { [18:41:20.939] base::sink(type = "output", split = FALSE) [18:41:20.939] if (TRUE) { [18:41:20.939] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:20.939] } [18:41:20.939] else { [18:41:20.939] ...future.result["stdout"] <- base::list(NULL) [18:41:20.939] } [18:41:20.939] base::close(...future.stdout) [18:41:20.939] ...future.stdout <- NULL [18:41:20.939] } [18:41:20.939] ...future.result$conditions <- ...future.conditions [18:41:20.939] ...future.result$finished <- base::Sys.time() [18:41:20.939] ...future.result [18:41:20.939] } [18:41:20.943] assign_globals() ... [18:41:20.943] List of 5 [18:41:20.943] $ ...future.FUN :function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [18:41:20.943] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [18:41:20.943] $ future.call.arguments :List of 2 [18:41:20.943] ..$ collapse: chr "; " [18:41:20.943] ..$ maxHead : int 3 [18:41:20.943] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:20.943] $ ...future.elements_ii :List of 1 [18:41:20.943] ..$ a: Named chr [1:101] "hello" "1" "2" "3" ... [18:41:20.943] .. ..- attr(*, "names")= chr [1:101] "" "b1" "b2" "b3" ... [18:41:20.943] $ ...future.seeds_ii : NULL [18:41:20.943] $ ...future.globals.maxSize: NULL [18:41:20.943] - attr(*, "where")=List of 5 [18:41:20.943] ..$ ...future.FUN : [18:41:20.943] ..$ future.call.arguments : [18:41:20.943] ..$ ...future.elements_ii : [18:41:20.943] ..$ ...future.seeds_ii : [18:41:20.943] ..$ ...future.globals.maxSize: [18:41:20.943] - attr(*, "resolved")= logi FALSE [18:41:20.943] - attr(*, "total_size")= num 20301 [18:41:20.943] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:20.943] - attr(*, "already-done")= logi TRUE [18:41:20.951] - copied '...future.FUN' to environment [18:41:20.951] - copied 'future.call.arguments' to environment [18:41:20.951] - copied '...future.elements_ii' to environment [18:41:20.951] - copied '...future.seeds_ii' to environment [18:41:20.951] - copied '...future.globals.maxSize' to environment [18:41:20.952] assign_globals() ... done [18:41:20.952] plan(): Setting new future strategy stack: [18:41:20.953] List of future strategies: [18:41:20.953] 1. sequential: [18:41:20.953] - args: function (..., envir = parent.frame(), workers = "") [18:41:20.953] - tweaked: FALSE [18:41:20.953] - call: NULL [18:41:20.953] plan(): nbrOfWorkers() = 1 [18:41:20.955] plan(): Setting new future strategy stack: [18:41:20.955] List of future strategies: [18:41:20.955] 1. sequential: [18:41:20.955] - args: function (..., envir = parent.frame(), workers = "") [18:41:20.955] - tweaked: FALSE [18:41:20.955] - call: plan(strategy) [18:41:20.956] plan(): nbrOfWorkers() = 1 [18:41:20.956] SequentialFuture started (and completed) [18:41:20.956] - Launch lazy future ... done [18:41:20.956] run() for 'SequentialFuture' ... done [18:41:20.957] Created future: [18:41:20.957] SequentialFuture: [18:41:20.957] Label: 'future_lapply-1' [18:41:20.957] Expression: [18:41:20.957] { [18:41:20.957] do.call(function(...) { [18:41:20.957] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.957] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:20.957] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.957] on.exit(options(oopts), add = TRUE) [18:41:20.957] } [18:41:20.957] { [18:41:20.957] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:20.957] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.957] ...future.FUN(...future.X_jj, ...) [18:41:20.957] }) [18:41:20.957] } [18:41:20.957] }, args = future.call.arguments) [18:41:20.957] } [18:41:20.957] Lazy evaluation: FALSE [18:41:20.957] Asynchronous evaluation: FALSE [18:41:20.957] Local evaluation: TRUE [18:41:20.957] Environment: R_GlobalEnv [18:41:20.957] Capture standard output: TRUE [18:41:20.957] Capture condition classes: 'condition' (excluding 'nothing') [18:41:20.957] Globals: 5 objects totaling 9.56 KiB (function '...future.FUN' of 7.17 KiB, DotDotDotList 'future.call.arguments' of 187 bytes, list '...future.elements_ii' of 2.15 KiB, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:20.957] Packages: 1 packages ('future') [18:41:20.957] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:20.957] Resolved: TRUE [18:41:20.957] Value: 68 bytes of class 'list' [18:41:20.957] Early signaling: FALSE [18:41:20.957] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:20.957] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:20.958] Chunk #1 of 1 ... DONE [18:41:20.958] Launching 1 futures (chunks) ... DONE [18:41:20.958] Resolving 1 futures (chunks) ... [18:41:20.958] resolve() on list ... [18:41:20.959] recursive: 0 [18:41:20.959] length: 1 [18:41:20.959] [18:41:20.959] resolved() for 'SequentialFuture' ... [18:41:20.959] - state: 'finished' [18:41:20.959] - run: TRUE [18:41:20.960] - result: 'FutureResult' [18:41:20.960] resolved() for 'SequentialFuture' ... done [18:41:20.960] Future #1 [18:41:20.960] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:20.960] - nx: 1 [18:41:20.961] - relay: TRUE [18:41:20.961] - stdout: TRUE [18:41:20.961] - signal: TRUE [18:41:20.961] - resignal: FALSE [18:41:20.961] - force: TRUE [18:41:20.961] - relayed: [n=1] FALSE [18:41:20.962] - queued futures: [n=1] FALSE [18:41:20.962] - until=1 [18:41:20.962] - relaying element #1 [18:41:20.962] - relayed: [n=1] TRUE [18:41:20.962] - queued futures: [n=1] TRUE [18:41:20.962] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:20.963] length: 0 (resolved future 1) [18:41:20.963] Relaying remaining futures [18:41:20.963] signalConditionsASAP(NULL, pos=0) ... [18:41:20.963] - nx: 1 [18:41:20.963] - relay: TRUE [18:41:20.963] - stdout: TRUE [18:41:20.964] - signal: TRUE [18:41:20.964] - resignal: FALSE [18:41:20.964] - force: TRUE [18:41:20.964] - relayed: [n=1] TRUE [18:41:20.964] - queued futures: [n=1] TRUE - flush all [18:41:20.964] - relayed: [n=1] TRUE [18:41:20.965] - queued futures: [n=1] TRUE [18:41:20.965] signalConditionsASAP(NULL, pos=0) ... done [18:41:20.965] resolve() on list ... DONE [18:41:20.965] - Number of value chunks collected: 1 [18:41:20.965] Resolving 1 futures (chunks) ... DONE [18:41:20.965] Reducing values from 1 chunks ... [18:41:20.966] - Number of values collected after concatenation: 1 [18:41:20.966] - Number of values expected: 1 [18:41:20.966] Reducing values from 1 chunks ... DONE [18:41:20.966] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [18:41:20.967] future_lapply() ... [18:41:20.968] Number of chunks: 1 [18:41:20.968] getGlobalsAndPackagesXApply() ... [18:41:20.969] - future.globals: TRUE [18:41:20.969] getGlobalsAndPackages() ... [18:41:20.969] Searching for globals... [18:41:20.971] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [18:41:20.971] Searching for globals ... DONE [18:41:20.971] Resolving globals: FALSE [18:41:20.971] The total size of the 1 globals is 911 bytes (911 bytes) [18:41:20.972] The total size of the 1 globals exported for future expression ('FUN()') is 911 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (911 bytes of class 'function') [18:41:20.972] - globals: [1] 'FUN' [18:41:20.972] - packages: [1] 'listenv' [18:41:20.973] getGlobalsAndPackages() ... DONE [18:41:20.973] - globals found/used: [n=1] 'FUN' [18:41:20.973] - needed namespaces: [n=1] 'listenv' [18:41:20.973] Finding globals ... DONE [18:41:20.973] - use_args: TRUE [18:41:20.974] - Getting '...' globals ... [18:41:20.974] resolve() on list ... [18:41:20.974] recursive: 0 [18:41:20.974] length: 1 [18:41:20.975] elements: '...' [18:41:20.975] length: 0 (resolved future 1) [18:41:20.975] resolve() on list ... DONE [18:41:20.975] - '...' content: [n=0] [18:41:20.975] List of 1 [18:41:20.975] $ ...: list() [18:41:20.975] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:20.975] - attr(*, "where")=List of 1 [18:41:20.975] ..$ ...: [18:41:20.975] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:20.975] - attr(*, "resolved")= logi TRUE [18:41:20.975] - attr(*, "total_size")= num NA [18:41:20.978] - Getting '...' globals ... DONE [18:41:20.978] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:20.979] List of 2 [18:41:20.979] $ ...future.FUN:function (x, ...) [18:41:20.979] $ ... : list() [18:41:20.979] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:20.979] - attr(*, "where")=List of 2 [18:41:20.979] ..$ ...future.FUN: [18:41:20.979] ..$ ... : [18:41:20.979] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:20.979] - attr(*, "resolved")= logi FALSE [18:41:20.979] - attr(*, "total_size")= int 8145 [18:41:20.982] Packages to be attached in all futures: [n=1] 'listenv' [18:41:20.982] getGlobalsAndPackagesXApply() ... DONE [18:41:20.982] Number of futures (= number of chunks): 1 [18:41:20.983] Launching 1 futures (chunks) ... [18:41:20.983] Chunk #1 of 1 ... [18:41:20.983] - Finding globals in 'X' for chunk #1 ... [18:41:20.983] getGlobalsAndPackages() ... [18:41:20.983] Searching for globals... [18:41:20.984] [18:41:20.984] Searching for globals ... DONE [18:41:20.984] - globals: [0] [18:41:20.984] getGlobalsAndPackages() ... DONE [18:41:20.985] + additional globals found: [n=0] [18:41:20.985] + additional namespaces needed: [n=0] [18:41:20.985] - Finding globals in 'X' for chunk #1 ... DONE [18:41:20.985] - seeds: [18:41:20.985] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.985] getGlobalsAndPackages() ... [18:41:20.986] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.986] Resolving globals: FALSE [18:41:20.986] Tweak future expression to call with '...' arguments ... [18:41:20.986] { [18:41:20.986] do.call(function(...) { [18:41:20.986] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.986] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:20.986] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.986] on.exit(options(oopts), add = TRUE) [18:41:20.986] } [18:41:20.986] { [18:41:20.986] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:20.986] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.986] ...future.FUN(...future.X_jj, ...) [18:41:20.986] }) [18:41:20.986] } [18:41:20.986] }, args = future.call.arguments) [18:41:20.986] } [18:41:20.987] Tweak future expression to call with '...' arguments ... DONE [18:41:20.987] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:20.988] - packages: [1] 'listenv' [18:41:20.988] getGlobalsAndPackages() ... DONE [18:41:20.988] run() for 'Future' ... [18:41:20.988] - state: 'created' [18:41:20.989] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:20.989] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:20.989] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:20.989] - Field: 'label' [18:41:20.990] - Field: 'local' [18:41:20.990] - Field: 'owner' [18:41:20.990] - Field: 'envir' [18:41:20.990] - Field: 'packages' [18:41:20.990] - Field: 'gc' [18:41:20.990] - Field: 'conditions' [18:41:20.991] - Field: 'expr' [18:41:20.991] - Field: 'uuid' [18:41:20.991] - Field: 'seed' [18:41:20.991] - Field: 'version' [18:41:20.991] - Field: 'result' [18:41:20.992] - Field: 'asynchronous' [18:41:20.992] - Field: 'calls' [18:41:20.992] - Field: 'globals' [18:41:20.992] - Field: 'stdout' [18:41:20.992] - Field: 'earlySignal' [18:41:20.992] - Field: 'lazy' [18:41:20.993] - Field: 'state' [18:41:20.993] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:20.993] - Launch lazy future ... [18:41:20.993] Packages needed by the future expression (n = 1): 'listenv' [18:41:20.994] Packages needed by future strategies (n = 0): [18:41:20.994] { [18:41:20.994] { [18:41:20.994] { [18:41:20.994] ...future.startTime <- base::Sys.time() [18:41:20.994] { [18:41:20.994] { [18:41:20.994] { [18:41:20.994] { [18:41:20.994] base::local({ [18:41:20.994] has_future <- base::requireNamespace("future", [18:41:20.994] quietly = TRUE) [18:41:20.994] if (has_future) { [18:41:20.994] ns <- base::getNamespace("future") [18:41:20.994] version <- ns[[".package"]][["version"]] [18:41:20.994] if (is.null(version)) [18:41:20.994] version <- utils::packageVersion("future") [18:41:20.994] } [18:41:20.994] else { [18:41:20.994] version <- NULL [18:41:20.994] } [18:41:20.994] if (!has_future || version < "1.8.0") { [18:41:20.994] info <- base::c(r_version = base::gsub("R version ", [18:41:20.994] "", base::R.version$version.string), [18:41:20.994] platform = base::sprintf("%s (%s-bit)", [18:41:20.994] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:20.994] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:20.994] "release", "version")], collapse = " "), [18:41:20.994] hostname = base::Sys.info()[["nodename"]]) [18:41:20.994] info <- base::sprintf("%s: %s", base::names(info), [18:41:20.994] info) [18:41:20.994] info <- base::paste(info, collapse = "; ") [18:41:20.994] if (!has_future) { [18:41:20.994] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:20.994] info) [18:41:20.994] } [18:41:20.994] else { [18:41:20.994] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:20.994] info, version) [18:41:20.994] } [18:41:20.994] base::stop(msg) [18:41:20.994] } [18:41:20.994] }) [18:41:20.994] } [18:41:20.994] base::local({ [18:41:20.994] for (pkg in "listenv") { [18:41:20.994] base::loadNamespace(pkg) [18:41:20.994] base::library(pkg, character.only = TRUE) [18:41:20.994] } [18:41:20.994] }) [18:41:20.994] } [18:41:20.994] ...future.strategy.old <- future::plan("list") [18:41:20.994] options(future.plan = NULL) [18:41:20.994] Sys.unsetenv("R_FUTURE_PLAN") [18:41:20.994] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:20.994] } [18:41:20.994] ...future.workdir <- getwd() [18:41:20.994] } [18:41:20.994] ...future.oldOptions <- base::as.list(base::.Options) [18:41:20.994] ...future.oldEnvVars <- base::Sys.getenv() [18:41:20.994] } [18:41:20.994] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:20.994] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:20.994] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:20.994] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:20.994] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:20.994] future.stdout.windows.reencode = NULL, width = 80L) [18:41:20.994] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:20.994] base::names(...future.oldOptions)) [18:41:20.994] } [18:41:20.994] if (FALSE) { [18:41:20.994] } [18:41:20.994] else { [18:41:20.994] if (TRUE) { [18:41:20.994] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:20.994] open = "w") [18:41:20.994] } [18:41:20.994] else { [18:41:20.994] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:20.994] windows = "NUL", "/dev/null"), open = "w") [18:41:20.994] } [18:41:20.994] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:20.994] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:20.994] base::sink(type = "output", split = FALSE) [18:41:20.994] base::close(...future.stdout) [18:41:20.994] }, add = TRUE) [18:41:20.994] } [18:41:20.994] ...future.frame <- base::sys.nframe() [18:41:20.994] ...future.conditions <- base::list() [18:41:20.994] ...future.rng <- base::globalenv()$.Random.seed [18:41:20.994] if (FALSE) { [18:41:20.994] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:20.994] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:20.994] } [18:41:20.994] ...future.result <- base::tryCatch({ [18:41:20.994] base::withCallingHandlers({ [18:41:20.994] ...future.value <- base::withVisible(base::local({ [18:41:20.994] do.call(function(...) { [18:41:20.994] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:20.994] if (!identical(...future.globals.maxSize.org, [18:41:20.994] ...future.globals.maxSize)) { [18:41:20.994] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:20.994] on.exit(options(oopts), add = TRUE) [18:41:20.994] } [18:41:20.994] { [18:41:20.994] lapply(seq_along(...future.elements_ii), [18:41:20.994] FUN = function(jj) { [18:41:20.994] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:20.994] ...future.FUN(...future.X_jj, ...) [18:41:20.994] }) [18:41:20.994] } [18:41:20.994] }, args = future.call.arguments) [18:41:20.994] })) [18:41:20.994] future::FutureResult(value = ...future.value$value, [18:41:20.994] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:20.994] ...future.rng), globalenv = if (FALSE) [18:41:20.994] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:20.994] ...future.globalenv.names)) [18:41:20.994] else NULL, started = ...future.startTime, version = "1.8") [18:41:20.994] }, condition = base::local({ [18:41:20.994] c <- base::c [18:41:20.994] inherits <- base::inherits [18:41:20.994] invokeRestart <- base::invokeRestart [18:41:20.994] length <- base::length [18:41:20.994] list <- base::list [18:41:20.994] seq.int <- base::seq.int [18:41:20.994] signalCondition <- base::signalCondition [18:41:20.994] sys.calls <- base::sys.calls [18:41:20.994] `[[` <- base::`[[` [18:41:20.994] `+` <- base::`+` [18:41:20.994] `<<-` <- base::`<<-` [18:41:20.994] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:20.994] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:20.994] 3L)] [18:41:20.994] } [18:41:20.994] function(cond) { [18:41:20.994] is_error <- inherits(cond, "error") [18:41:20.994] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:20.994] NULL) [18:41:20.994] if (is_error) { [18:41:20.994] sessionInformation <- function() { [18:41:20.994] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:20.994] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:20.994] search = base::search(), system = base::Sys.info()) [18:41:20.994] } [18:41:20.994] ...future.conditions[[length(...future.conditions) + [18:41:20.994] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:20.994] cond$call), session = sessionInformation(), [18:41:20.994] timestamp = base::Sys.time(), signaled = 0L) [18:41:20.994] signalCondition(cond) [18:41:20.994] } [18:41:20.994] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:20.994] "immediateCondition"))) { [18:41:20.994] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:20.994] ...future.conditions[[length(...future.conditions) + [18:41:20.994] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:20.994] if (TRUE && !signal) { [18:41:20.994] muffleCondition <- function (cond, pattern = "^muffle") [18:41:20.994] { [18:41:20.994] inherits <- base::inherits [18:41:20.994] invokeRestart <- base::invokeRestart [18:41:20.994] is.null <- base::is.null [18:41:20.994] muffled <- FALSE [18:41:20.994] if (inherits(cond, "message")) { [18:41:20.994] muffled <- grepl(pattern, "muffleMessage") [18:41:20.994] if (muffled) [18:41:20.994] invokeRestart("muffleMessage") [18:41:20.994] } [18:41:20.994] else if (inherits(cond, "warning")) { [18:41:20.994] muffled <- grepl(pattern, "muffleWarning") [18:41:20.994] if (muffled) [18:41:20.994] invokeRestart("muffleWarning") [18:41:20.994] } [18:41:20.994] else if (inherits(cond, "condition")) { [18:41:20.994] if (!is.null(pattern)) { [18:41:20.994] computeRestarts <- base::computeRestarts [18:41:20.994] grepl <- base::grepl [18:41:20.994] restarts <- computeRestarts(cond) [18:41:20.994] for (restart in restarts) { [18:41:20.994] name <- restart$name [18:41:20.994] if (is.null(name)) [18:41:20.994] next [18:41:20.994] if (!grepl(pattern, name)) [18:41:20.994] next [18:41:20.994] invokeRestart(restart) [18:41:20.994] muffled <- TRUE [18:41:20.994] break [18:41:20.994] } [18:41:20.994] } [18:41:20.994] } [18:41:20.994] invisible(muffled) [18:41:20.994] } [18:41:20.994] muffleCondition(cond, pattern = "^muffle") [18:41:20.994] } [18:41:20.994] } [18:41:20.994] else { [18:41:20.994] if (TRUE) { [18:41:20.994] muffleCondition <- function (cond, pattern = "^muffle") [18:41:20.994] { [18:41:20.994] inherits <- base::inherits [18:41:20.994] invokeRestart <- base::invokeRestart [18:41:20.994] is.null <- base::is.null [18:41:20.994] muffled <- FALSE [18:41:20.994] if (inherits(cond, "message")) { [18:41:20.994] muffled <- grepl(pattern, "muffleMessage") [18:41:20.994] if (muffled) [18:41:20.994] invokeRestart("muffleMessage") [18:41:20.994] } [18:41:20.994] else if (inherits(cond, "warning")) { [18:41:20.994] muffled <- grepl(pattern, "muffleWarning") [18:41:20.994] if (muffled) [18:41:20.994] invokeRestart("muffleWarning") [18:41:20.994] } [18:41:20.994] else if (inherits(cond, "condition")) { [18:41:20.994] if (!is.null(pattern)) { [18:41:20.994] computeRestarts <- base::computeRestarts [18:41:20.994] grepl <- base::grepl [18:41:20.994] restarts <- computeRestarts(cond) [18:41:20.994] for (restart in restarts) { [18:41:20.994] name <- restart$name [18:41:20.994] if (is.null(name)) [18:41:20.994] next [18:41:20.994] if (!grepl(pattern, name)) [18:41:20.994] next [18:41:20.994] invokeRestart(restart) [18:41:20.994] muffled <- TRUE [18:41:20.994] break [18:41:20.994] } [18:41:20.994] } [18:41:20.994] } [18:41:20.994] invisible(muffled) [18:41:20.994] } [18:41:20.994] muffleCondition(cond, pattern = "^muffle") [18:41:20.994] } [18:41:20.994] } [18:41:20.994] } [18:41:20.994] })) [18:41:20.994] }, error = function(ex) { [18:41:20.994] base::structure(base::list(value = NULL, visible = NULL, [18:41:20.994] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:20.994] ...future.rng), started = ...future.startTime, [18:41:20.994] finished = Sys.time(), session_uuid = NA_character_, [18:41:20.994] version = "1.8"), class = "FutureResult") [18:41:20.994] }, finally = { [18:41:20.994] if (!identical(...future.workdir, getwd())) [18:41:20.994] setwd(...future.workdir) [18:41:20.994] { [18:41:20.994] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:20.994] ...future.oldOptions$nwarnings <- NULL [18:41:20.994] } [18:41:20.994] base::options(...future.oldOptions) [18:41:20.994] if (.Platform$OS.type == "windows") { [18:41:20.994] old_names <- names(...future.oldEnvVars) [18:41:20.994] envs <- base::Sys.getenv() [18:41:20.994] names <- names(envs) [18:41:20.994] common <- intersect(names, old_names) [18:41:20.994] added <- setdiff(names, old_names) [18:41:20.994] removed <- setdiff(old_names, names) [18:41:20.994] changed <- common[...future.oldEnvVars[common] != [18:41:20.994] envs[common]] [18:41:20.994] NAMES <- toupper(changed) [18:41:20.994] args <- list() [18:41:20.994] for (kk in seq_along(NAMES)) { [18:41:20.994] name <- changed[[kk]] [18:41:20.994] NAME <- NAMES[[kk]] [18:41:20.994] if (name != NAME && is.element(NAME, old_names)) [18:41:20.994] next [18:41:20.994] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:20.994] } [18:41:20.994] NAMES <- toupper(added) [18:41:20.994] for (kk in seq_along(NAMES)) { [18:41:20.994] name <- added[[kk]] [18:41:20.994] NAME <- NAMES[[kk]] [18:41:20.994] if (name != NAME && is.element(NAME, old_names)) [18:41:20.994] next [18:41:20.994] args[[name]] <- "" [18:41:20.994] } [18:41:20.994] NAMES <- toupper(removed) [18:41:20.994] for (kk in seq_along(NAMES)) { [18:41:20.994] name <- removed[[kk]] [18:41:20.994] NAME <- NAMES[[kk]] [18:41:20.994] if (name != NAME && is.element(NAME, old_names)) [18:41:20.994] next [18:41:20.994] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:20.994] } [18:41:20.994] if (length(args) > 0) [18:41:20.994] base::do.call(base::Sys.setenv, args = args) [18:41:20.994] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:20.994] } [18:41:20.994] else { [18:41:20.994] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:20.994] } [18:41:20.994] { [18:41:20.994] if (base::length(...future.futureOptionsAdded) > [18:41:20.994] 0L) { [18:41:20.994] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:20.994] base::names(opts) <- ...future.futureOptionsAdded [18:41:20.994] base::options(opts) [18:41:20.994] } [18:41:20.994] { [18:41:20.994] { [18:41:20.994] NULL [18:41:20.994] RNGkind("Mersenne-Twister") [18:41:20.994] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:20.994] inherits = FALSE) [18:41:20.994] } [18:41:20.994] options(future.plan = NULL) [18:41:20.994] if (is.na(NA_character_)) [18:41:20.994] Sys.unsetenv("R_FUTURE_PLAN") [18:41:20.994] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:20.994] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:20.994] .init = FALSE) [18:41:20.994] } [18:41:20.994] } [18:41:20.994] } [18:41:20.994] }) [18:41:20.994] if (TRUE) { [18:41:20.994] base::sink(type = "output", split = FALSE) [18:41:20.994] if (TRUE) { [18:41:20.994] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:20.994] } [18:41:20.994] else { [18:41:20.994] ...future.result["stdout"] <- base::list(NULL) [18:41:20.994] } [18:41:20.994] base::close(...future.stdout) [18:41:20.994] ...future.stdout <- NULL [18:41:20.994] } [18:41:20.994] ...future.result$conditions <- ...future.conditions [18:41:20.994] ...future.result$finished <- base::Sys.time() [18:41:20.994] ...future.result [18:41:20.994] } [18:41:20.998] assign_globals() ... [18:41:20.998] List of 5 [18:41:20.998] $ ...future.FUN :function (x, ...) [18:41:20.998] $ future.call.arguments : list() [18:41:20.998] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:20.998] $ ...future.elements_ii :List of 2 [18:41:20.998] ..$ a:Classes 'listenv', 'environment' [18:41:20.998] ..$ b:Classes 'listenv', 'environment' [18:41:20.998] $ ...future.seeds_ii : NULL [18:41:20.998] $ ...future.globals.maxSize: NULL [18:41:20.998] - attr(*, "where")=List of 5 [18:41:20.998] ..$ ...future.FUN : [18:41:20.998] ..$ future.call.arguments : [18:41:20.998] ..$ ...future.elements_ii : [18:41:20.998] ..$ ...future.seeds_ii : [18:41:20.998] ..$ ...future.globals.maxSize: [18:41:20.998] - attr(*, "resolved")= logi FALSE [18:41:20.998] - attr(*, "total_size")= num 8145 [18:41:20.998] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:20.998] - attr(*, "already-done")= logi TRUE [18:41:21.005] - copied '...future.FUN' to environment [18:41:21.005] - copied 'future.call.arguments' to environment [18:41:21.005] - copied '...future.elements_ii' to environment [18:41:21.006] - copied '...future.seeds_ii' to environment [18:41:21.006] - copied '...future.globals.maxSize' to environment [18:41:21.006] assign_globals() ... done [18:41:21.007] plan(): Setting new future strategy stack: [18:41:21.007] List of future strategies: [18:41:21.007] 1. sequential: [18:41:21.007] - args: function (..., envir = parent.frame(), workers = "") [18:41:21.007] - tweaked: FALSE [18:41:21.007] - call: NULL [18:41:21.008] plan(): nbrOfWorkers() = 1 [18:41:21.009] plan(): Setting new future strategy stack: [18:41:21.009] List of future strategies: [18:41:21.009] 1. sequential: [18:41:21.009] - args: function (..., envir = parent.frame(), workers = "") [18:41:21.009] - tweaked: FALSE [18:41:21.009] - call: plan(strategy) [18:41:21.010] plan(): nbrOfWorkers() = 1 [18:41:21.010] SequentialFuture started (and completed) [18:41:21.011] - Launch lazy future ... done [18:41:21.011] run() for 'SequentialFuture' ... done [18:41:21.011] Created future: [18:41:21.011] SequentialFuture: [18:41:21.011] Label: 'future_lapply-1' [18:41:21.011] Expression: [18:41:21.011] { [18:41:21.011] do.call(function(...) { [18:41:21.011] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:21.011] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:21.011] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:21.011] on.exit(options(oopts), add = TRUE) [18:41:21.011] } [18:41:21.011] { [18:41:21.011] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:21.011] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:21.011] ...future.FUN(...future.X_jj, ...) [18:41:21.011] }) [18:41:21.011] } [18:41:21.011] }, args = future.call.arguments) [18:41:21.011] } [18:41:21.011] Lazy evaluation: FALSE [18:41:21.011] Asynchronous evaluation: FALSE [18:41:21.011] Local evaluation: TRUE [18:41:21.011] Environment: R_GlobalEnv [18:41:21.011] Capture standard output: TRUE [18:41:21.011] Capture condition classes: 'condition' (excluding 'nothing') [18:41:21.011] Globals: 5 objects totaling 4.14 KiB (function '...future.FUN' of 911 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 3.10 KiB, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:21.011] Packages: 1 packages ('listenv') [18:41:21.011] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:21.011] Resolved: TRUE [18:41:21.011] Value: 154 bytes of class 'list' [18:41:21.011] Early signaling: FALSE [18:41:21.011] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:21.011] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:21.012] Chunk #1 of 1 ... DONE [18:41:21.013] Launching 1 futures (chunks) ... DONE [18:41:21.013] Resolving 1 futures (chunks) ... [18:41:21.013] resolve() on list ... [18:41:21.013] recursive: 0 [18:41:21.013] length: 1 [18:41:21.014] [18:41:21.014] resolved() for 'SequentialFuture' ... [18:41:21.014] - state: 'finished' [18:41:21.014] - run: TRUE [18:41:21.014] - result: 'FutureResult' [18:41:21.015] resolved() for 'SequentialFuture' ... done [18:41:21.015] Future #1 [18:41:21.015] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:21.015] - nx: 1 [18:41:21.015] - relay: TRUE [18:41:21.016] - stdout: TRUE [18:41:21.016] - signal: TRUE [18:41:21.016] - resignal: FALSE [18:41:21.016] - force: TRUE [18:41:21.016] - relayed: [n=1] FALSE [18:41:21.016] - queued futures: [n=1] FALSE [18:41:21.017] - until=1 [18:41:21.017] - relaying element #1 [18:41:21.017] - relayed: [n=1] TRUE [18:41:21.017] - queued futures: [n=1] TRUE [18:41:21.018] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:21.018] length: 0 (resolved future 1) [18:41:21.018] Relaying remaining futures [18:41:21.018] signalConditionsASAP(NULL, pos=0) ... [18:41:21.018] - nx: 1 [18:41:21.018] - relay: TRUE [18:41:21.019] - stdout: TRUE [18:41:21.019] - signal: TRUE [18:41:21.019] - resignal: FALSE [18:41:21.019] - force: TRUE [18:41:21.019] - relayed: [n=1] TRUE [18:41:21.019] - queued futures: [n=1] TRUE - flush all [18:41:21.020] - relayed: [n=1] TRUE [18:41:21.020] - queued futures: [n=1] TRUE [18:41:21.020] signalConditionsASAP(NULL, pos=0) ... done [18:41:21.020] resolve() on list ... DONE [18:41:21.020] - Number of value chunks collected: 1 [18:41:21.021] Resolving 1 futures (chunks) ... DONE [18:41:21.021] Reducing values from 1 chunks ... [18:41:21.021] - Number of values collected after concatenation: 2 [18:41:21.021] - Number of values expected: 2 [18:41:21.021] Reducing values from 1 chunks ... DONE [18:41:21.021] future_lapply() ... DONE List of 1 $ y:List of 2 ..$ a: Named chr "A" .. ..- attr(*, "names")= chr "A" ..$ b: Named chr [1:2] "A" "B" .. ..- attr(*, "names")= chr [1:2] "A" "B" - future_lapply(x, FUN = vector, ...) ... [18:41:21.024] future_lapply() ... [18:41:21.025] Number of chunks: 1 [18:41:21.025] Index remapping (attribute 'ordering'): [n = 4] 1, 4, 3, 2 [18:41:21.025] getGlobalsAndPackagesXApply() ... [18:41:21.025] - future.globals: TRUE [18:41:21.026] getGlobalsAndPackages() ... [18:41:21.026] Searching for globals... [18:41:21.027] - globals found: [2] 'FUN', '.Internal' [18:41:21.028] Searching for globals ... DONE [18:41:21.028] Resolving globals: FALSE [18:41:21.028] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:21.029] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:21.029] - globals: [1] 'FUN' [18:41:21.029] [18:41:21.029] getGlobalsAndPackages() ... DONE [18:41:21.030] - globals found/used: [n=1] 'FUN' [18:41:21.030] - needed namespaces: [n=0] [18:41:21.030] Finding globals ... DONE [18:41:21.030] - use_args: TRUE [18:41:21.030] - Getting '...' globals ... [18:41:21.031] resolve() on list ... [18:41:21.031] recursive: 0 [18:41:21.031] length: 1 [18:41:21.031] elements: '...' [18:41:21.032] length: 0 (resolved future 1) [18:41:21.032] resolve() on list ... DONE [18:41:21.032] - '...' content: [n=1] 'length' [18:41:21.032] List of 1 [18:41:21.032] $ ...:List of 1 [18:41:21.032] ..$ length: int 2 [18:41:21.032] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:21.032] - attr(*, "where")=List of 1 [18:41:21.032] ..$ ...: [18:41:21.032] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:21.032] - attr(*, "resolved")= logi TRUE [18:41:21.032] - attr(*, "total_size")= num NA [18:41:21.036] - Getting '...' globals ... DONE [18:41:21.037] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:21.037] List of 2 [18:41:21.037] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:21.037] $ ... :List of 1 [18:41:21.037] ..$ length: int 2 [18:41:21.037] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:21.037] - attr(*, "where")=List of 2 [18:41:21.037] ..$ ...future.FUN: [18:41:21.037] ..$ ... : [18:41:21.037] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:21.037] - attr(*, "resolved")= logi FALSE [18:41:21.037] - attr(*, "total_size")= int 4338 [18:41:21.044] Packages to be attached in all futures: [n=0] [18:41:21.044] getGlobalsAndPackagesXApply() ... DONE [18:41:21.044] Number of futures (= number of chunks): 1 [18:41:21.045] Launching 1 futures (chunks) ... [18:41:21.045] Chunk #1 of 1 ... [18:41:21.045] - Finding globals in 'X' for chunk #1 ... [18:41:21.045] getGlobalsAndPackages() ... [18:41:21.045] Searching for globals... [18:41:21.046] [18:41:21.046] Searching for globals ... DONE [18:41:21.046] - globals: [0] [18:41:21.046] getGlobalsAndPackages() ... DONE [18:41:21.046] + additional globals found: [n=0] [18:41:21.046] + additional namespaces needed: [n=0] [18:41:21.047] - Finding globals in 'X' for chunk #1 ... DONE [18:41:21.047] - seeds: [18:41:21.047] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:21.047] getGlobalsAndPackages() ... [18:41:21.047] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:21.047] Resolving globals: FALSE [18:41:21.048] Tweak future expression to call with '...' arguments ... [18:41:21.048] { [18:41:21.048] do.call(function(...) { [18:41:21.048] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:21.048] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:21.048] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:21.048] on.exit(options(oopts), add = TRUE) [18:41:21.048] } [18:41:21.048] { [18:41:21.048] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:21.048] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:21.048] ...future.FUN(...future.X_jj, ...) [18:41:21.048] }) [18:41:21.048] } [18:41:21.048] }, args = future.call.arguments) [18:41:21.048] } [18:41:21.048] Tweak future expression to call with '...' arguments ... DONE [18:41:21.049] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:21.049] [18:41:21.049] getGlobalsAndPackages() ... DONE [18:41:21.050] run() for 'Future' ... [18:41:21.050] - state: 'created' [18:41:21.050] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:21.050] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:21.051] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:21.051] - Field: 'label' [18:41:21.051] - Field: 'local' [18:41:21.051] - Field: 'owner' [18:41:21.051] - Field: 'envir' [18:41:21.051] - Field: 'packages' [18:41:21.052] - Field: 'gc' [18:41:21.052] - Field: 'conditions' [18:41:21.052] - Field: 'expr' [18:41:21.052] - Field: 'uuid' [18:41:21.052] - Field: 'seed' [18:41:21.052] - Field: 'version' [18:41:21.053] - Field: 'result' [18:41:21.053] - Field: 'asynchronous' [18:41:21.053] - Field: 'calls' [18:41:21.053] - Field: 'globals' [18:41:21.053] - Field: 'stdout' [18:41:21.054] - Field: 'earlySignal' [18:41:21.054] - Field: 'lazy' [18:41:21.054] - Field: 'state' [18:41:21.054] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:21.054] - Launch lazy future ... [18:41:21.054] Packages needed by the future expression (n = 0): [18:41:21.055] Packages needed by future strategies (n = 0): [18:41:21.055] { [18:41:21.055] { [18:41:21.055] { [18:41:21.055] ...future.startTime <- base::Sys.time() [18:41:21.055] { [18:41:21.055] { [18:41:21.055] { [18:41:21.055] base::local({ [18:41:21.055] has_future <- base::requireNamespace("future", [18:41:21.055] quietly = TRUE) [18:41:21.055] if (has_future) { [18:41:21.055] ns <- base::getNamespace("future") [18:41:21.055] version <- ns[[".package"]][["version"]] [18:41:21.055] if (is.null(version)) [18:41:21.055] version <- utils::packageVersion("future") [18:41:21.055] } [18:41:21.055] else { [18:41:21.055] version <- NULL [18:41:21.055] } [18:41:21.055] if (!has_future || version < "1.8.0") { [18:41:21.055] info <- base::c(r_version = base::gsub("R version ", [18:41:21.055] "", base::R.version$version.string), [18:41:21.055] platform = base::sprintf("%s (%s-bit)", [18:41:21.055] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:21.055] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:21.055] "release", "version")], collapse = " "), [18:41:21.055] hostname = base::Sys.info()[["nodename"]]) [18:41:21.055] info <- base::sprintf("%s: %s", base::names(info), [18:41:21.055] info) [18:41:21.055] info <- base::paste(info, collapse = "; ") [18:41:21.055] if (!has_future) { [18:41:21.055] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:21.055] info) [18:41:21.055] } [18:41:21.055] else { [18:41:21.055] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:21.055] info, version) [18:41:21.055] } [18:41:21.055] base::stop(msg) [18:41:21.055] } [18:41:21.055] }) [18:41:21.055] } [18:41:21.055] ...future.strategy.old <- future::plan("list") [18:41:21.055] options(future.plan = NULL) [18:41:21.055] Sys.unsetenv("R_FUTURE_PLAN") [18:41:21.055] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:21.055] } [18:41:21.055] ...future.workdir <- getwd() [18:41:21.055] } [18:41:21.055] ...future.oldOptions <- base::as.list(base::.Options) [18:41:21.055] ...future.oldEnvVars <- base::Sys.getenv() [18:41:21.055] } [18:41:21.055] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:21.055] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:21.055] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:21.055] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:21.055] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:21.055] future.stdout.windows.reencode = NULL, width = 80L) [18:41:21.055] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:21.055] base::names(...future.oldOptions)) [18:41:21.055] } [18:41:21.055] if (FALSE) { [18:41:21.055] } [18:41:21.055] else { [18:41:21.055] if (TRUE) { [18:41:21.055] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:21.055] open = "w") [18:41:21.055] } [18:41:21.055] else { [18:41:21.055] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:21.055] windows = "NUL", "/dev/null"), open = "w") [18:41:21.055] } [18:41:21.055] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:21.055] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:21.055] base::sink(type = "output", split = FALSE) [18:41:21.055] base::close(...future.stdout) [18:41:21.055] }, add = TRUE) [18:41:21.055] } [18:41:21.055] ...future.frame <- base::sys.nframe() [18:41:21.055] ...future.conditions <- base::list() [18:41:21.055] ...future.rng <- base::globalenv()$.Random.seed [18:41:21.055] if (FALSE) { [18:41:21.055] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:21.055] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:21.055] } [18:41:21.055] ...future.result <- base::tryCatch({ [18:41:21.055] base::withCallingHandlers({ [18:41:21.055] ...future.value <- base::withVisible(base::local({ [18:41:21.055] do.call(function(...) { [18:41:21.055] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:21.055] if (!identical(...future.globals.maxSize.org, [18:41:21.055] ...future.globals.maxSize)) { [18:41:21.055] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:21.055] on.exit(options(oopts), add = TRUE) [18:41:21.055] } [18:41:21.055] { [18:41:21.055] lapply(seq_along(...future.elements_ii), [18:41:21.055] FUN = function(jj) { [18:41:21.055] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:21.055] ...future.FUN(...future.X_jj, ...) [18:41:21.055] }) [18:41:21.055] } [18:41:21.055] }, args = future.call.arguments) [18:41:21.055] })) [18:41:21.055] future::FutureResult(value = ...future.value$value, [18:41:21.055] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:21.055] ...future.rng), globalenv = if (FALSE) [18:41:21.055] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:21.055] ...future.globalenv.names)) [18:41:21.055] else NULL, started = ...future.startTime, version = "1.8") [18:41:21.055] }, condition = base::local({ [18:41:21.055] c <- base::c [18:41:21.055] inherits <- base::inherits [18:41:21.055] invokeRestart <- base::invokeRestart [18:41:21.055] length <- base::length [18:41:21.055] list <- base::list [18:41:21.055] seq.int <- base::seq.int [18:41:21.055] signalCondition <- base::signalCondition [18:41:21.055] sys.calls <- base::sys.calls [18:41:21.055] `[[` <- base::`[[` [18:41:21.055] `+` <- base::`+` [18:41:21.055] `<<-` <- base::`<<-` [18:41:21.055] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:21.055] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:21.055] 3L)] [18:41:21.055] } [18:41:21.055] function(cond) { [18:41:21.055] is_error <- inherits(cond, "error") [18:41:21.055] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:21.055] NULL) [18:41:21.055] if (is_error) { [18:41:21.055] sessionInformation <- function() { [18:41:21.055] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:21.055] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:21.055] search = base::search(), system = base::Sys.info()) [18:41:21.055] } [18:41:21.055] ...future.conditions[[length(...future.conditions) + [18:41:21.055] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:21.055] cond$call), session = sessionInformation(), [18:41:21.055] timestamp = base::Sys.time(), signaled = 0L) [18:41:21.055] signalCondition(cond) [18:41:21.055] } [18:41:21.055] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:21.055] "immediateCondition"))) { [18:41:21.055] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:21.055] ...future.conditions[[length(...future.conditions) + [18:41:21.055] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:21.055] if (TRUE && !signal) { [18:41:21.055] muffleCondition <- function (cond, pattern = "^muffle") [18:41:21.055] { [18:41:21.055] inherits <- base::inherits [18:41:21.055] invokeRestart <- base::invokeRestart [18:41:21.055] is.null <- base::is.null [18:41:21.055] muffled <- FALSE [18:41:21.055] if (inherits(cond, "message")) { [18:41:21.055] muffled <- grepl(pattern, "muffleMessage") [18:41:21.055] if (muffled) [18:41:21.055] invokeRestart("muffleMessage") [18:41:21.055] } [18:41:21.055] else if (inherits(cond, "warning")) { [18:41:21.055] muffled <- grepl(pattern, "muffleWarning") [18:41:21.055] if (muffled) [18:41:21.055] invokeRestart("muffleWarning") [18:41:21.055] } [18:41:21.055] else if (inherits(cond, "condition")) { [18:41:21.055] if (!is.null(pattern)) { [18:41:21.055] computeRestarts <- base::computeRestarts [18:41:21.055] grepl <- base::grepl [18:41:21.055] restarts <- computeRestarts(cond) [18:41:21.055] for (restart in restarts) { [18:41:21.055] name <- restart$name [18:41:21.055] if (is.null(name)) [18:41:21.055] next [18:41:21.055] if (!grepl(pattern, name)) [18:41:21.055] next [18:41:21.055] invokeRestart(restart) [18:41:21.055] muffled <- TRUE [18:41:21.055] break [18:41:21.055] } [18:41:21.055] } [18:41:21.055] } [18:41:21.055] invisible(muffled) [18:41:21.055] } [18:41:21.055] muffleCondition(cond, pattern = "^muffle") [18:41:21.055] } [18:41:21.055] } [18:41:21.055] else { [18:41:21.055] if (TRUE) { [18:41:21.055] muffleCondition <- function (cond, pattern = "^muffle") [18:41:21.055] { [18:41:21.055] inherits <- base::inherits [18:41:21.055] invokeRestart <- base::invokeRestart [18:41:21.055] is.null <- base::is.null [18:41:21.055] muffled <- FALSE [18:41:21.055] if (inherits(cond, "message")) { [18:41:21.055] muffled <- grepl(pattern, "muffleMessage") [18:41:21.055] if (muffled) [18:41:21.055] invokeRestart("muffleMessage") [18:41:21.055] } [18:41:21.055] else if (inherits(cond, "warning")) { [18:41:21.055] muffled <- grepl(pattern, "muffleWarning") [18:41:21.055] if (muffled) [18:41:21.055] invokeRestart("muffleWarning") [18:41:21.055] } [18:41:21.055] else if (inherits(cond, "condition")) { [18:41:21.055] if (!is.null(pattern)) { [18:41:21.055] computeRestarts <- base::computeRestarts [18:41:21.055] grepl <- base::grepl [18:41:21.055] restarts <- computeRestarts(cond) [18:41:21.055] for (restart in restarts) { [18:41:21.055] name <- restart$name [18:41:21.055] if (is.null(name)) [18:41:21.055] next [18:41:21.055] if (!grepl(pattern, name)) [18:41:21.055] next [18:41:21.055] invokeRestart(restart) [18:41:21.055] muffled <- TRUE [18:41:21.055] break [18:41:21.055] } [18:41:21.055] } [18:41:21.055] } [18:41:21.055] invisible(muffled) [18:41:21.055] } [18:41:21.055] muffleCondition(cond, pattern = "^muffle") [18:41:21.055] } [18:41:21.055] } [18:41:21.055] } [18:41:21.055] })) [18:41:21.055] }, error = function(ex) { [18:41:21.055] base::structure(base::list(value = NULL, visible = NULL, [18:41:21.055] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:21.055] ...future.rng), started = ...future.startTime, [18:41:21.055] finished = Sys.time(), session_uuid = NA_character_, [18:41:21.055] version = "1.8"), class = "FutureResult") [18:41:21.055] }, finally = { [18:41:21.055] if (!identical(...future.workdir, getwd())) [18:41:21.055] setwd(...future.workdir) [18:41:21.055] { [18:41:21.055] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:21.055] ...future.oldOptions$nwarnings <- NULL [18:41:21.055] } [18:41:21.055] base::options(...future.oldOptions) [18:41:21.055] if (.Platform$OS.type == "windows") { [18:41:21.055] old_names <- names(...future.oldEnvVars) [18:41:21.055] envs <- base::Sys.getenv() [18:41:21.055] names <- names(envs) [18:41:21.055] common <- intersect(names, old_names) [18:41:21.055] added <- setdiff(names, old_names) [18:41:21.055] removed <- setdiff(old_names, names) [18:41:21.055] changed <- common[...future.oldEnvVars[common] != [18:41:21.055] envs[common]] [18:41:21.055] NAMES <- toupper(changed) [18:41:21.055] args <- list() [18:41:21.055] for (kk in seq_along(NAMES)) { [18:41:21.055] name <- changed[[kk]] [18:41:21.055] NAME <- NAMES[[kk]] [18:41:21.055] if (name != NAME && is.element(NAME, old_names)) [18:41:21.055] next [18:41:21.055] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:21.055] } [18:41:21.055] NAMES <- toupper(added) [18:41:21.055] for (kk in seq_along(NAMES)) { [18:41:21.055] name <- added[[kk]] [18:41:21.055] NAME <- NAMES[[kk]] [18:41:21.055] if (name != NAME && is.element(NAME, old_names)) [18:41:21.055] next [18:41:21.055] args[[name]] <- "" [18:41:21.055] } [18:41:21.055] NAMES <- toupper(removed) [18:41:21.055] for (kk in seq_along(NAMES)) { [18:41:21.055] name <- removed[[kk]] [18:41:21.055] NAME <- NAMES[[kk]] [18:41:21.055] if (name != NAME && is.element(NAME, old_names)) [18:41:21.055] next [18:41:21.055] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:21.055] } [18:41:21.055] if (length(args) > 0) [18:41:21.055] base::do.call(base::Sys.setenv, args = args) [18:41:21.055] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:21.055] } [18:41:21.055] else { [18:41:21.055] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:21.055] } [18:41:21.055] { [18:41:21.055] if (base::length(...future.futureOptionsAdded) > [18:41:21.055] 0L) { [18:41:21.055] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:21.055] base::names(opts) <- ...future.futureOptionsAdded [18:41:21.055] base::options(opts) [18:41:21.055] } [18:41:21.055] { [18:41:21.055] { [18:41:21.055] NULL [18:41:21.055] RNGkind("Mersenne-Twister") [18:41:21.055] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:21.055] inherits = FALSE) [18:41:21.055] } [18:41:21.055] options(future.plan = NULL) [18:41:21.055] if (is.na(NA_character_)) [18:41:21.055] Sys.unsetenv("R_FUTURE_PLAN") [18:41:21.055] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:21.055] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:21.055] .init = FALSE) [18:41:21.055] } [18:41:21.055] } [18:41:21.055] } [18:41:21.055] }) [18:41:21.055] if (TRUE) { [18:41:21.055] base::sink(type = "output", split = FALSE) [18:41:21.055] if (TRUE) { [18:41:21.055] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:21.055] } [18:41:21.055] else { [18:41:21.055] ...future.result["stdout"] <- base::list(NULL) [18:41:21.055] } [18:41:21.055] base::close(...future.stdout) [18:41:21.055] ...future.stdout <- NULL [18:41:21.055] } [18:41:21.055] ...future.result$conditions <- ...future.conditions [18:41:21.055] ...future.result$finished <- base::Sys.time() [18:41:21.055] ...future.result [18:41:21.055] } [18:41:21.059] assign_globals() ... [18:41:21.059] List of 5 [18:41:21.059] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:21.059] $ future.call.arguments :List of 1 [18:41:21.059] ..$ length: int 2 [18:41:21.059] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:21.059] $ ...future.elements_ii :List of 4 [18:41:21.059] ..$ a: chr "integer" [18:41:21.059] ..$ c: chr "list" [18:41:21.059] ..$ c: chr "character" [18:41:21.059] ..$ b: chr "numeric" [18:41:21.059] $ ...future.seeds_ii : NULL [18:41:21.059] $ ...future.globals.maxSize: NULL [18:41:21.059] - attr(*, "where")=List of 5 [18:41:21.059] ..$ ...future.FUN : [18:41:21.059] ..$ future.call.arguments : [18:41:21.059] ..$ ...future.elements_ii : [18:41:21.059] ..$ ...future.seeds_ii : [18:41:21.059] ..$ ...future.globals.maxSize: [18:41:21.059] - attr(*, "resolved")= logi FALSE [18:41:21.059] - attr(*, "total_size")= num 4338 [18:41:21.059] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:21.059] - attr(*, "already-done")= logi TRUE [18:41:21.067] - copied '...future.FUN' to environment [18:41:21.067] - copied 'future.call.arguments' to environment [18:41:21.067] - copied '...future.elements_ii' to environment [18:41:21.067] - copied '...future.seeds_ii' to environment [18:41:21.067] - copied '...future.globals.maxSize' to environment [18:41:21.068] assign_globals() ... done [18:41:21.068] plan(): Setting new future strategy stack: [18:41:21.068] List of future strategies: [18:41:21.068] 1. sequential: [18:41:21.068] - args: function (..., envir = parent.frame(), workers = "") [18:41:21.068] - tweaked: FALSE [18:41:21.068] - call: NULL [18:41:21.069] plan(): nbrOfWorkers() = 1 [18:41:21.070] plan(): Setting new future strategy stack: [18:41:21.070] List of future strategies: [18:41:21.070] 1. sequential: [18:41:21.070] - args: function (..., envir = parent.frame(), workers = "") [18:41:21.070] - tweaked: FALSE [18:41:21.070] - call: plan(strategy) [18:41:21.071] plan(): nbrOfWorkers() = 1 [18:41:21.071] SequentialFuture started (and completed) [18:41:21.072] - Launch lazy future ... done [18:41:21.072] run() for 'SequentialFuture' ... done [18:41:21.072] Created future: [18:41:21.072] SequentialFuture: [18:41:21.072] Label: 'future_lapply-1' [18:41:21.072] Expression: [18:41:21.072] { [18:41:21.072] do.call(function(...) { [18:41:21.072] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:21.072] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:21.072] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:21.072] on.exit(options(oopts), add = TRUE) [18:41:21.072] } [18:41:21.072] { [18:41:21.072] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:21.072] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:21.072] ...future.FUN(...future.X_jj, ...) [18:41:21.072] }) [18:41:21.072] } [18:41:21.072] }, args = future.call.arguments) [18:41:21.072] } [18:41:21.072] Lazy evaluation: FALSE [18:41:21.072] Asynchronous evaluation: FALSE [18:41:21.072] Local evaluation: TRUE [18:41:21.072] Environment: R_GlobalEnv [18:41:21.072] Capture standard output: TRUE [18:41:21.072] Capture condition classes: 'condition' (excluding 'nothing') [18:41:21.072] Globals: 5 objects totaling 853 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 191 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:21.072] Packages: [18:41:21.072] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:21.072] Resolved: TRUE [18:41:21.072] Value: 111 bytes of class 'list' [18:41:21.072] Early signaling: FALSE [18:41:21.072] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:21.072] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:21.073] Chunk #1 of 1 ... DONE [18:41:21.073] Launching 1 futures (chunks) ... DONE [18:41:21.074] Resolving 1 futures (chunks) ... [18:41:21.074] resolve() on list ... [18:41:21.074] recursive: 0 [18:41:21.074] length: 1 [18:41:21.074] [18:41:21.074] resolved() for 'SequentialFuture' ... [18:41:21.075] - state: 'finished' [18:41:21.075] - run: TRUE [18:41:21.075] - result: 'FutureResult' [18:41:21.075] resolved() for 'SequentialFuture' ... done [18:41:21.075] Future #1 [18:41:21.076] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:21.076] - nx: 1 [18:41:21.076] - relay: TRUE [18:41:21.076] - stdout: TRUE [18:41:21.076] - signal: TRUE [18:41:21.076] - resignal: FALSE [18:41:21.077] - force: TRUE [18:41:21.077] - relayed: [n=1] FALSE [18:41:21.077] - queued futures: [n=1] FALSE [18:41:21.077] - until=1 [18:41:21.077] - relaying element #1 [18:41:21.077] - relayed: [n=1] TRUE [18:41:21.078] - queued futures: [n=1] TRUE [18:41:21.078] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:21.078] length: 0 (resolved future 1) [18:41:21.078] Relaying remaining futures [18:41:21.078] signalConditionsASAP(NULL, pos=0) ... [18:41:21.079] - nx: 1 [18:41:21.079] - relay: TRUE [18:41:21.079] - stdout: TRUE [18:41:21.079] - signal: TRUE [18:41:21.079] - resignal: FALSE [18:41:21.079] - force: TRUE [18:41:21.079] - relayed: [n=1] TRUE [18:41:21.080] - queued futures: [n=1] TRUE - flush all [18:41:21.080] - relayed: [n=1] TRUE [18:41:21.080] - queued futures: [n=1] TRUE [18:41:21.080] signalConditionsASAP(NULL, pos=0) ... done [18:41:21.080] resolve() on list ... DONE [18:41:21.081] - Number of value chunks collected: 1 [18:41:21.081] Resolving 1 futures (chunks) ... DONE [18:41:21.081] Reducing values from 1 chunks ... [18:41:21.081] - Number of values collected after concatenation: 4 [18:41:21.081] - Number of values expected: 4 [18:41:21.081] Reverse index remapping (attribute 'ordering'): [n = 4] 1, 4, 3, 2 [18:41:21.082] Reducing values from 1 chunks ... DONE [18:41:21.082] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL [18:41:21.084] future_lapply() ... [18:41:21.085] Number of chunks: 1 [18:41:21.085] Index remapping (attribute 'ordering'): [n = 4] 1, 3, 4, 2 [18:41:21.086] getGlobalsAndPackagesXApply() ... [18:41:21.086] - future.globals: TRUE [18:41:21.086] getGlobalsAndPackages() ... [18:41:21.086] Searching for globals... [18:41:21.087] - globals found: [2] 'FUN', '.Internal' [18:41:21.088] Searching for globals ... DONE [18:41:21.088] Resolving globals: FALSE [18:41:21.088] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:21.089] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:21.089] - globals: [1] 'FUN' [18:41:21.089] [18:41:21.089] getGlobalsAndPackages() ... DONE [18:41:21.090] - globals found/used: [n=1] 'FUN' [18:41:21.090] - needed namespaces: [n=0] [18:41:21.090] Finding globals ... DONE [18:41:21.090] - use_args: TRUE [18:41:21.090] - Getting '...' globals ... [18:41:21.091] resolve() on list ... [18:41:21.091] recursive: 0 [18:41:21.091] length: 1 [18:41:21.091] elements: '...' [18:41:21.091] length: 0 (resolved future 1) [18:41:21.092] resolve() on list ... DONE [18:41:21.092] - '...' content: [n=1] 'length' [18:41:21.092] List of 1 [18:41:21.092] $ ...:List of 1 [18:41:21.092] ..$ length: int 2 [18:41:21.092] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:21.092] - attr(*, "where")=List of 1 [18:41:21.092] ..$ ...: [18:41:21.092] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:21.092] - attr(*, "resolved")= logi TRUE [18:41:21.092] - attr(*, "total_size")= num NA [18:41:21.096] - Getting '...' globals ... DONE [18:41:21.096] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:21.096] List of 2 [18:41:21.096] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:21.096] $ ... :List of 1 [18:41:21.096] ..$ length: int 2 [18:41:21.096] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:21.096] - attr(*, "where")=List of 2 [18:41:21.096] ..$ ...future.FUN: [18:41:21.096] ..$ ... : [18:41:21.096] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:21.096] - attr(*, "resolved")= logi FALSE [18:41:21.096] - attr(*, "total_size")= int 4374 [18:41:21.100] Packages to be attached in all futures: [n=0] [18:41:21.100] getGlobalsAndPackagesXApply() ... DONE [18:41:21.101] Number of futures (= number of chunks): 1 [18:41:21.101] Launching 1 futures (chunks) ... [18:41:21.101] Chunk #1 of 1 ... [18:41:21.101] - Finding globals in 'X' for chunk #1 ... [18:41:21.101] getGlobalsAndPackages() ... [18:41:21.102] Searching for globals... [18:41:21.102] [18:41:21.102] Searching for globals ... DONE [18:41:21.102] - globals: [0] [18:41:21.102] getGlobalsAndPackages() ... DONE [18:41:21.103] + additional globals found: [n=0] [18:41:21.103] + additional namespaces needed: [n=0] [18:41:21.103] - Finding globals in 'X' for chunk #1 ... DONE [18:41:21.103] - seeds: [18:41:21.103] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:21.103] getGlobalsAndPackages() ... [18:41:21.103] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:21.104] Resolving globals: FALSE [18:41:21.104] Tweak future expression to call with '...' arguments ... [18:41:21.104] { [18:41:21.104] do.call(function(...) { [18:41:21.104] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:21.104] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:21.104] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:21.104] on.exit(options(oopts), add = TRUE) [18:41:21.104] } [18:41:21.104] { [18:41:21.104] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:21.104] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:21.104] ...future.FUN(...future.X_jj, ...) [18:41:21.104] }) [18:41:21.104] } [18:41:21.104] }, args = future.call.arguments) [18:41:21.104] } [18:41:21.104] Tweak future expression to call with '...' arguments ... DONE [18:41:21.105] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:21.105] [18:41:21.105] getGlobalsAndPackages() ... DONE [18:41:21.106] run() for 'Future' ... [18:41:21.106] - state: 'created' [18:41:21.106] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:21.106] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:21.107] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:21.107] - Field: 'label' [18:41:21.107] - Field: 'local' [18:41:21.107] - Field: 'owner' [18:41:21.107] - Field: 'envir' [18:41:21.108] - Field: 'packages' [18:41:21.108] - Field: 'gc' [18:41:21.108] - Field: 'conditions' [18:41:21.108] - Field: 'expr' [18:41:21.108] - Field: 'uuid' [18:41:21.109] - Field: 'seed' [18:41:21.109] - Field: 'version' [18:41:21.109] - Field: 'result' [18:41:21.109] - Field: 'asynchronous' [18:41:21.109] - Field: 'calls' [18:41:21.109] - Field: 'globals' [18:41:21.110] - Field: 'stdout' [18:41:21.110] - Field: 'earlySignal' [18:41:21.110] - Field: 'lazy' [18:41:21.110] - Field: 'state' [18:41:21.110] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:21.110] - Launch lazy future ... [18:41:21.111] Packages needed by the future expression (n = 0): [18:41:21.111] Packages needed by future strategies (n = 0): [18:41:21.111] { [18:41:21.111] { [18:41:21.111] { [18:41:21.111] ...future.startTime <- base::Sys.time() [18:41:21.111] { [18:41:21.111] { [18:41:21.111] { [18:41:21.111] base::local({ [18:41:21.111] has_future <- base::requireNamespace("future", [18:41:21.111] quietly = TRUE) [18:41:21.111] if (has_future) { [18:41:21.111] ns <- base::getNamespace("future") [18:41:21.111] version <- ns[[".package"]][["version"]] [18:41:21.111] if (is.null(version)) [18:41:21.111] version <- utils::packageVersion("future") [18:41:21.111] } [18:41:21.111] else { [18:41:21.111] version <- NULL [18:41:21.111] } [18:41:21.111] if (!has_future || version < "1.8.0") { [18:41:21.111] info <- base::c(r_version = base::gsub("R version ", [18:41:21.111] "", base::R.version$version.string), [18:41:21.111] platform = base::sprintf("%s (%s-bit)", [18:41:21.111] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:21.111] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:21.111] "release", "version")], collapse = " "), [18:41:21.111] hostname = base::Sys.info()[["nodename"]]) [18:41:21.111] info <- base::sprintf("%s: %s", base::names(info), [18:41:21.111] info) [18:41:21.111] info <- base::paste(info, collapse = "; ") [18:41:21.111] if (!has_future) { [18:41:21.111] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:21.111] info) [18:41:21.111] } [18:41:21.111] else { [18:41:21.111] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:21.111] info, version) [18:41:21.111] } [18:41:21.111] base::stop(msg) [18:41:21.111] } [18:41:21.111] }) [18:41:21.111] } [18:41:21.111] ...future.strategy.old <- future::plan("list") [18:41:21.111] options(future.plan = NULL) [18:41:21.111] Sys.unsetenv("R_FUTURE_PLAN") [18:41:21.111] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:21.111] } [18:41:21.111] ...future.workdir <- getwd() [18:41:21.111] } [18:41:21.111] ...future.oldOptions <- base::as.list(base::.Options) [18:41:21.111] ...future.oldEnvVars <- base::Sys.getenv() [18:41:21.111] } [18:41:21.111] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:21.111] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:21.111] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:21.111] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:21.111] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:21.111] future.stdout.windows.reencode = NULL, width = 80L) [18:41:21.111] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:21.111] base::names(...future.oldOptions)) [18:41:21.111] } [18:41:21.111] if (FALSE) { [18:41:21.111] } [18:41:21.111] else { [18:41:21.111] if (TRUE) { [18:41:21.111] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:21.111] open = "w") [18:41:21.111] } [18:41:21.111] else { [18:41:21.111] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:21.111] windows = "NUL", "/dev/null"), open = "w") [18:41:21.111] } [18:41:21.111] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:21.111] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:21.111] base::sink(type = "output", split = FALSE) [18:41:21.111] base::close(...future.stdout) [18:41:21.111] }, add = TRUE) [18:41:21.111] } [18:41:21.111] ...future.frame <- base::sys.nframe() [18:41:21.111] ...future.conditions <- base::list() [18:41:21.111] ...future.rng <- base::globalenv()$.Random.seed [18:41:21.111] if (FALSE) { [18:41:21.111] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:21.111] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:21.111] } [18:41:21.111] ...future.result <- base::tryCatch({ [18:41:21.111] base::withCallingHandlers({ [18:41:21.111] ...future.value <- base::withVisible(base::local({ [18:41:21.111] do.call(function(...) { [18:41:21.111] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:21.111] if (!identical(...future.globals.maxSize.org, [18:41:21.111] ...future.globals.maxSize)) { [18:41:21.111] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:21.111] on.exit(options(oopts), add = TRUE) [18:41:21.111] } [18:41:21.111] { [18:41:21.111] lapply(seq_along(...future.elements_ii), [18:41:21.111] FUN = function(jj) { [18:41:21.111] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:21.111] ...future.FUN(...future.X_jj, ...) [18:41:21.111] }) [18:41:21.111] } [18:41:21.111] }, args = future.call.arguments) [18:41:21.111] })) [18:41:21.111] future::FutureResult(value = ...future.value$value, [18:41:21.111] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:21.111] ...future.rng), globalenv = if (FALSE) [18:41:21.111] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:21.111] ...future.globalenv.names)) [18:41:21.111] else NULL, started = ...future.startTime, version = "1.8") [18:41:21.111] }, condition = base::local({ [18:41:21.111] c <- base::c [18:41:21.111] inherits <- base::inherits [18:41:21.111] invokeRestart <- base::invokeRestart [18:41:21.111] length <- base::length [18:41:21.111] list <- base::list [18:41:21.111] seq.int <- base::seq.int [18:41:21.111] signalCondition <- base::signalCondition [18:41:21.111] sys.calls <- base::sys.calls [18:41:21.111] `[[` <- base::`[[` [18:41:21.111] `+` <- base::`+` [18:41:21.111] `<<-` <- base::`<<-` [18:41:21.111] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:21.111] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:21.111] 3L)] [18:41:21.111] } [18:41:21.111] function(cond) { [18:41:21.111] is_error <- inherits(cond, "error") [18:41:21.111] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:21.111] NULL) [18:41:21.111] if (is_error) { [18:41:21.111] sessionInformation <- function() { [18:41:21.111] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:21.111] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:21.111] search = base::search(), system = base::Sys.info()) [18:41:21.111] } [18:41:21.111] ...future.conditions[[length(...future.conditions) + [18:41:21.111] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:21.111] cond$call), session = sessionInformation(), [18:41:21.111] timestamp = base::Sys.time(), signaled = 0L) [18:41:21.111] signalCondition(cond) [18:41:21.111] } [18:41:21.111] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:21.111] "immediateCondition"))) { [18:41:21.111] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:21.111] ...future.conditions[[length(...future.conditions) + [18:41:21.111] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:21.111] if (TRUE && !signal) { [18:41:21.111] muffleCondition <- function (cond, pattern = "^muffle") [18:41:21.111] { [18:41:21.111] inherits <- base::inherits [18:41:21.111] invokeRestart <- base::invokeRestart [18:41:21.111] is.null <- base::is.null [18:41:21.111] muffled <- FALSE [18:41:21.111] if (inherits(cond, "message")) { [18:41:21.111] muffled <- grepl(pattern, "muffleMessage") [18:41:21.111] if (muffled) [18:41:21.111] invokeRestart("muffleMessage") [18:41:21.111] } [18:41:21.111] else if (inherits(cond, "warning")) { [18:41:21.111] muffled <- grepl(pattern, "muffleWarning") [18:41:21.111] if (muffled) [18:41:21.111] invokeRestart("muffleWarning") [18:41:21.111] } [18:41:21.111] else if (inherits(cond, "condition")) { [18:41:21.111] if (!is.null(pattern)) { [18:41:21.111] computeRestarts <- base::computeRestarts [18:41:21.111] grepl <- base::grepl [18:41:21.111] restarts <- computeRestarts(cond) [18:41:21.111] for (restart in restarts) { [18:41:21.111] name <- restart$name [18:41:21.111] if (is.null(name)) [18:41:21.111] next [18:41:21.111] if (!grepl(pattern, name)) [18:41:21.111] next [18:41:21.111] invokeRestart(restart) [18:41:21.111] muffled <- TRUE [18:41:21.111] break [18:41:21.111] } [18:41:21.111] } [18:41:21.111] } [18:41:21.111] invisible(muffled) [18:41:21.111] } [18:41:21.111] muffleCondition(cond, pattern = "^muffle") [18:41:21.111] } [18:41:21.111] } [18:41:21.111] else { [18:41:21.111] if (TRUE) { [18:41:21.111] muffleCondition <- function (cond, pattern = "^muffle") [18:41:21.111] { [18:41:21.111] inherits <- base::inherits [18:41:21.111] invokeRestart <- base::invokeRestart [18:41:21.111] is.null <- base::is.null [18:41:21.111] muffled <- FALSE [18:41:21.111] if (inherits(cond, "message")) { [18:41:21.111] muffled <- grepl(pattern, "muffleMessage") [18:41:21.111] if (muffled) [18:41:21.111] invokeRestart("muffleMessage") [18:41:21.111] } [18:41:21.111] else if (inherits(cond, "warning")) { [18:41:21.111] muffled <- grepl(pattern, "muffleWarning") [18:41:21.111] if (muffled) [18:41:21.111] invokeRestart("muffleWarning") [18:41:21.111] } [18:41:21.111] else if (inherits(cond, "condition")) { [18:41:21.111] if (!is.null(pattern)) { [18:41:21.111] computeRestarts <- base::computeRestarts [18:41:21.111] grepl <- base::grepl [18:41:21.111] restarts <- computeRestarts(cond) [18:41:21.111] for (restart in restarts) { [18:41:21.111] name <- restart$name [18:41:21.111] if (is.null(name)) [18:41:21.111] next [18:41:21.111] if (!grepl(pattern, name)) [18:41:21.111] next [18:41:21.111] invokeRestart(restart) [18:41:21.111] muffled <- TRUE [18:41:21.111] break [18:41:21.111] } [18:41:21.111] } [18:41:21.111] } [18:41:21.111] invisible(muffled) [18:41:21.111] } [18:41:21.111] muffleCondition(cond, pattern = "^muffle") [18:41:21.111] } [18:41:21.111] } [18:41:21.111] } [18:41:21.111] })) [18:41:21.111] }, error = function(ex) { [18:41:21.111] base::structure(base::list(value = NULL, visible = NULL, [18:41:21.111] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:21.111] ...future.rng), started = ...future.startTime, [18:41:21.111] finished = Sys.time(), session_uuid = NA_character_, [18:41:21.111] version = "1.8"), class = "FutureResult") [18:41:21.111] }, finally = { [18:41:21.111] if (!identical(...future.workdir, getwd())) [18:41:21.111] setwd(...future.workdir) [18:41:21.111] { [18:41:21.111] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:21.111] ...future.oldOptions$nwarnings <- NULL [18:41:21.111] } [18:41:21.111] base::options(...future.oldOptions) [18:41:21.111] if (.Platform$OS.type == "windows") { [18:41:21.111] old_names <- names(...future.oldEnvVars) [18:41:21.111] envs <- base::Sys.getenv() [18:41:21.111] names <- names(envs) [18:41:21.111] common <- intersect(names, old_names) [18:41:21.111] added <- setdiff(names, old_names) [18:41:21.111] removed <- setdiff(old_names, names) [18:41:21.111] changed <- common[...future.oldEnvVars[common] != [18:41:21.111] envs[common]] [18:41:21.111] NAMES <- toupper(changed) [18:41:21.111] args <- list() [18:41:21.111] for (kk in seq_along(NAMES)) { [18:41:21.111] name <- changed[[kk]] [18:41:21.111] NAME <- NAMES[[kk]] [18:41:21.111] if (name != NAME && is.element(NAME, old_names)) [18:41:21.111] next [18:41:21.111] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:21.111] } [18:41:21.111] NAMES <- toupper(added) [18:41:21.111] for (kk in seq_along(NAMES)) { [18:41:21.111] name <- added[[kk]] [18:41:21.111] NAME <- NAMES[[kk]] [18:41:21.111] if (name != NAME && is.element(NAME, old_names)) [18:41:21.111] next [18:41:21.111] args[[name]] <- "" [18:41:21.111] } [18:41:21.111] NAMES <- toupper(removed) [18:41:21.111] for (kk in seq_along(NAMES)) { [18:41:21.111] name <- removed[[kk]] [18:41:21.111] NAME <- NAMES[[kk]] [18:41:21.111] if (name != NAME && is.element(NAME, old_names)) [18:41:21.111] next [18:41:21.111] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:21.111] } [18:41:21.111] if (length(args) > 0) [18:41:21.111] base::do.call(base::Sys.setenv, args = args) [18:41:21.111] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:21.111] } [18:41:21.111] else { [18:41:21.111] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:21.111] } [18:41:21.111] { [18:41:21.111] if (base::length(...future.futureOptionsAdded) > [18:41:21.111] 0L) { [18:41:21.111] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:21.111] base::names(opts) <- ...future.futureOptionsAdded [18:41:21.111] base::options(opts) [18:41:21.111] } [18:41:21.111] { [18:41:21.111] { [18:41:21.111] NULL [18:41:21.111] RNGkind("Mersenne-Twister") [18:41:21.111] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:21.111] inherits = FALSE) [18:41:21.111] } [18:41:21.111] options(future.plan = NULL) [18:41:21.111] if (is.na(NA_character_)) [18:41:21.111] Sys.unsetenv("R_FUTURE_PLAN") [18:41:21.111] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:21.111] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:21.111] .init = FALSE) [18:41:21.111] } [18:41:21.111] } [18:41:21.111] } [18:41:21.111] }) [18:41:21.111] if (TRUE) { [18:41:21.111] base::sink(type = "output", split = FALSE) [18:41:21.111] if (TRUE) { [18:41:21.111] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:21.111] } [18:41:21.111] else { [18:41:21.111] ...future.result["stdout"] <- base::list(NULL) [18:41:21.111] } [18:41:21.111] base::close(...future.stdout) [18:41:21.111] ...future.stdout <- NULL [18:41:21.111] } [18:41:21.111] ...future.result$conditions <- ...future.conditions [18:41:21.111] ...future.result$finished <- base::Sys.time() [18:41:21.111] ...future.result [18:41:21.111] } [18:41:21.115] assign_globals() ... [18:41:21.115] List of 5 [18:41:21.115] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:21.115] $ future.call.arguments :List of 1 [18:41:21.115] ..$ length: int 2 [18:41:21.115] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:21.115] $ ...future.elements_ii :List of 4 [18:41:21.115] ..$ a: chr "integer" [18:41:21.115] ..$ c: chr "character" [18:41:21.115] ..$ c: chr "list" [18:41:21.115] ..$ b: chr "numeric" [18:41:21.115] $ ...future.seeds_ii : NULL [18:41:21.115] $ ...future.globals.maxSize: NULL [18:41:21.115] - attr(*, "where")=List of 5 [18:41:21.115] ..$ ...future.FUN : [18:41:21.115] ..$ future.call.arguments : [18:41:21.115] ..$ ...future.elements_ii : [18:41:21.115] ..$ ...future.seeds_ii : [18:41:21.115] ..$ ...future.globals.maxSize: [18:41:21.115] - attr(*, "resolved")= logi FALSE [18:41:21.115] - attr(*, "total_size")= num 4374 [18:41:21.115] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:21.115] - attr(*, "already-done")= logi TRUE [18:41:21.123] - copied '...future.FUN' to environment [18:41:21.123] - copied 'future.call.arguments' to environment [18:41:21.123] - copied '...future.elements_ii' to environment [18:41:21.123] - copied '...future.seeds_ii' to environment [18:41:21.124] - copied '...future.globals.maxSize' to environment [18:41:21.124] assign_globals() ... done [18:41:21.124] plan(): Setting new future strategy stack: [18:41:21.124] List of future strategies: [18:41:21.124] 1. sequential: [18:41:21.124] - args: function (..., envir = parent.frame(), workers = "") [18:41:21.124] - tweaked: FALSE [18:41:21.124] - call: NULL [18:41:21.125] plan(): nbrOfWorkers() = 1 [18:41:21.126] plan(): Setting new future strategy stack: [18:41:21.126] List of future strategies: [18:41:21.126] 1. sequential: [18:41:21.126] - args: function (..., envir = parent.frame(), workers = "") [18:41:21.126] - tweaked: FALSE [18:41:21.126] - call: plan(strategy) [18:41:21.127] plan(): nbrOfWorkers() = 1 [18:41:21.127] SequentialFuture started (and completed) [18:41:21.128] - Launch lazy future ... done [18:41:21.128] run() for 'SequentialFuture' ... done [18:41:21.128] Created future: [18:41:21.128] SequentialFuture: [18:41:21.128] Label: 'future_lapply-1' [18:41:21.128] Expression: [18:41:21.128] { [18:41:21.128] do.call(function(...) { [18:41:21.128] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:21.128] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:21.128] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:21.128] on.exit(options(oopts), add = TRUE) [18:41:21.128] } [18:41:21.128] { [18:41:21.128] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:21.128] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:21.128] ...future.FUN(...future.X_jj, ...) [18:41:21.128] }) [18:41:21.128] } [18:41:21.128] }, args = future.call.arguments) [18:41:21.128] } [18:41:21.128] Lazy evaluation: FALSE [18:41:21.128] Asynchronous evaluation: FALSE [18:41:21.128] Local evaluation: TRUE [18:41:21.128] Environment: R_GlobalEnv [18:41:21.128] Capture standard output: TRUE [18:41:21.128] Capture condition classes: 'condition' (excluding 'nothing') [18:41:21.128] Globals: 5 objects totaling 853 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 191 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:21.128] Packages: [18:41:21.128] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:21.128] Resolved: TRUE [18:41:21.128] Value: 111 bytes of class 'list' [18:41:21.128] Early signaling: FALSE [18:41:21.128] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:21.128] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:21.129] Chunk #1 of 1 ... DONE [18:41:21.130] Launching 1 futures (chunks) ... DONE [18:41:21.130] Resolving 1 futures (chunks) ... [18:41:21.130] resolve() on list ... [18:41:21.130] recursive: 0 [18:41:21.130] length: 1 [18:41:21.130] [18:41:21.131] resolved() for 'SequentialFuture' ... [18:41:21.131] - state: 'finished' [18:41:21.131] - run: TRUE [18:41:21.131] - result: 'FutureResult' [18:41:21.131] resolved() for 'SequentialFuture' ... done [18:41:21.132] Future #1 [18:41:21.132] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:21.132] - nx: 1 [18:41:21.132] - relay: TRUE [18:41:21.132] - stdout: TRUE [18:41:21.132] - signal: TRUE [18:41:21.133] - resignal: FALSE [18:41:21.133] - force: TRUE [18:41:21.133] - relayed: [n=1] FALSE [18:41:21.133] - queued futures: [n=1] FALSE [18:41:21.133] - until=1 [18:41:21.133] - relaying element #1 [18:41:21.134] - relayed: [n=1] TRUE [18:41:21.134] - queued futures: [n=1] TRUE [18:41:21.134] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:21.134] length: 0 (resolved future 1) [18:41:21.134] Relaying remaining futures [18:41:21.135] signalConditionsASAP(NULL, pos=0) ... [18:41:21.135] - nx: 1 [18:41:21.135] - relay: TRUE [18:41:21.135] - stdout: TRUE [18:41:21.135] - signal: TRUE [18:41:21.135] - resignal: FALSE [18:41:21.136] - force: TRUE [18:41:21.136] - relayed: [n=1] TRUE [18:41:21.136] - queued futures: [n=1] TRUE - flush all [18:41:21.136] - relayed: [n=1] TRUE [18:41:21.136] - queued futures: [n=1] TRUE [18:41:21.137] signalConditionsASAP(NULL, pos=0) ... done [18:41:21.137] resolve() on list ... DONE [18:41:21.137] - Number of value chunks collected: 1 [18:41:21.137] Resolving 1 futures (chunks) ... DONE [18:41:21.137] Reducing values from 1 chunks ... [18:41:21.137] - Number of values collected after concatenation: 4 [18:41:21.138] - Number of values expected: 4 [18:41:21.138] Reverse index remapping (attribute 'ordering'): [n = 4] 1, 4, 2, 3 [18:41:21.138] Reducing values from 1 chunks ... DONE [18:41:21.138] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL - future_lapply(x, FUN = base::vector, ...) ... [18:41:21.141] future_lapply() ... [18:41:21.142] Number of chunks: 1 [18:41:21.143] Index remapping (attribute 'ordering'): [n = 4] 3, 2, 4, 1 [18:41:21.143] getGlobalsAndPackagesXApply() ... [18:41:21.143] - future.globals: TRUE [18:41:21.143] getGlobalsAndPackages() ... [18:41:21.143] Searching for globals... [18:41:21.145] - globals found: [2] 'FUN', '.Internal' [18:41:21.145] Searching for globals ... DONE [18:41:21.145] Resolving globals: FALSE [18:41:21.146] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:21.146] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:21.147] - globals: [1] 'FUN' [18:41:21.147] [18:41:21.147] getGlobalsAndPackages() ... DONE [18:41:21.147] - globals found/used: [n=1] 'FUN' [18:41:21.147] - needed namespaces: [n=0] [18:41:21.147] Finding globals ... DONE [18:41:21.148] - use_args: TRUE [18:41:21.148] - Getting '...' globals ... [18:41:21.148] resolve() on list ... [18:41:21.148] recursive: 0 [18:41:21.149] length: 1 [18:41:21.149] elements: '...' [18:41:21.149] length: 0 (resolved future 1) [18:41:21.149] resolve() on list ... DONE [18:41:21.149] - '...' content: [n=1] 'length' [18:41:21.150] List of 1 [18:41:21.150] $ ...:List of 1 [18:41:21.150] ..$ length: int 2 [18:41:21.150] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:21.150] - attr(*, "where")=List of 1 [18:41:21.150] ..$ ...: [18:41:21.150] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:21.150] - attr(*, "resolved")= logi TRUE [18:41:21.150] - attr(*, "total_size")= num NA [18:41:21.153] - Getting '...' globals ... DONE [18:41:21.154] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:21.154] List of 2 [18:41:21.154] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:21.154] $ ... :List of 1 [18:41:21.154] ..$ length: int 2 [18:41:21.154] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:21.154] - attr(*, "where")=List of 2 [18:41:21.154] ..$ ...future.FUN: [18:41:21.154] ..$ ... : [18:41:21.154] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:21.154] - attr(*, "resolved")= logi FALSE [18:41:21.154] - attr(*, "total_size")= int 4456 [18:41:21.159] Packages to be attached in all futures: [n=0] [18:41:21.159] getGlobalsAndPackagesXApply() ... DONE [18:41:21.159] Number of futures (= number of chunks): 1 [18:41:21.159] Launching 1 futures (chunks) ... [18:41:21.159] Chunk #1 of 1 ... [18:41:21.160] - Finding globals in 'X' for chunk #1 ... [18:41:21.160] getGlobalsAndPackages() ... [18:41:21.160] Searching for globals... [18:41:21.160] [18:41:21.161] Searching for globals ... DONE [18:41:21.161] - globals: [0] [18:41:21.161] getGlobalsAndPackages() ... DONE [18:41:21.161] + additional globals found: [n=0] [18:41:21.161] + additional namespaces needed: [n=0] [18:41:21.161] - Finding globals in 'X' for chunk #1 ... DONE [18:41:21.162] - seeds: [18:41:21.162] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:21.162] getGlobalsAndPackages() ... [18:41:21.162] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:21.164] Resolving globals: FALSE [18:41:21.164] Tweak future expression to call with '...' arguments ... [18:41:21.165] { [18:41:21.165] do.call(function(...) { [18:41:21.165] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:21.165] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:21.165] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:21.165] on.exit(options(oopts), add = TRUE) [18:41:21.165] } [18:41:21.165] { [18:41:21.165] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:21.165] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:21.165] ...future.FUN(...future.X_jj, ...) [18:41:21.165] }) [18:41:21.165] } [18:41:21.165] }, args = future.call.arguments) [18:41:21.165] } [18:41:21.165] Tweak future expression to call with '...' arguments ... DONE [18:41:21.165] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:21.166] [18:41:21.166] getGlobalsAndPackages() ... DONE [18:41:21.166] run() for 'Future' ... [18:41:21.166] - state: 'created' [18:41:21.167] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:21.167] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:21.167] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:21.167] - Field: 'label' [18:41:21.168] - Field: 'local' [18:41:21.168] - Field: 'owner' [18:41:21.168] - Field: 'envir' [18:41:21.168] - Field: 'packages' [18:41:21.168] - Field: 'gc' [18:41:21.168] - Field: 'conditions' [18:41:21.169] - Field: 'expr' [18:41:21.169] - Field: 'uuid' [18:41:21.169] - Field: 'seed' [18:41:21.169] - Field: 'version' [18:41:21.169] - Field: 'result' [18:41:21.169] - Field: 'asynchronous' [18:41:21.170] - Field: 'calls' [18:41:21.170] - Field: 'globals' [18:41:21.170] - Field: 'stdout' [18:41:21.170] - Field: 'earlySignal' [18:41:21.170] - Field: 'lazy' [18:41:21.171] - Field: 'state' [18:41:21.171] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:21.171] - Launch lazy future ... [18:41:21.171] Packages needed by the future expression (n = 0): [18:41:21.171] Packages needed by future strategies (n = 0): [18:41:21.172] { [18:41:21.172] { [18:41:21.172] { [18:41:21.172] ...future.startTime <- base::Sys.time() [18:41:21.172] { [18:41:21.172] { [18:41:21.172] { [18:41:21.172] base::local({ [18:41:21.172] has_future <- base::requireNamespace("future", [18:41:21.172] quietly = TRUE) [18:41:21.172] if (has_future) { [18:41:21.172] ns <- base::getNamespace("future") [18:41:21.172] version <- ns[[".package"]][["version"]] [18:41:21.172] if (is.null(version)) [18:41:21.172] version <- utils::packageVersion("future") [18:41:21.172] } [18:41:21.172] else { [18:41:21.172] version <- NULL [18:41:21.172] } [18:41:21.172] if (!has_future || version < "1.8.0") { [18:41:21.172] info <- base::c(r_version = base::gsub("R version ", [18:41:21.172] "", base::R.version$version.string), [18:41:21.172] platform = base::sprintf("%s (%s-bit)", [18:41:21.172] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:21.172] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:21.172] "release", "version")], collapse = " "), [18:41:21.172] hostname = base::Sys.info()[["nodename"]]) [18:41:21.172] info <- base::sprintf("%s: %s", base::names(info), [18:41:21.172] info) [18:41:21.172] info <- base::paste(info, collapse = "; ") [18:41:21.172] if (!has_future) { [18:41:21.172] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:21.172] info) [18:41:21.172] } [18:41:21.172] else { [18:41:21.172] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:21.172] info, version) [18:41:21.172] } [18:41:21.172] base::stop(msg) [18:41:21.172] } [18:41:21.172] }) [18:41:21.172] } [18:41:21.172] ...future.strategy.old <- future::plan("list") [18:41:21.172] options(future.plan = NULL) [18:41:21.172] Sys.unsetenv("R_FUTURE_PLAN") [18:41:21.172] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:21.172] } [18:41:21.172] ...future.workdir <- getwd() [18:41:21.172] } [18:41:21.172] ...future.oldOptions <- base::as.list(base::.Options) [18:41:21.172] ...future.oldEnvVars <- base::Sys.getenv() [18:41:21.172] } [18:41:21.172] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:21.172] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:21.172] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:21.172] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:21.172] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:21.172] future.stdout.windows.reencode = NULL, width = 80L) [18:41:21.172] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:21.172] base::names(...future.oldOptions)) [18:41:21.172] } [18:41:21.172] if (FALSE) { [18:41:21.172] } [18:41:21.172] else { [18:41:21.172] if (TRUE) { [18:41:21.172] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:21.172] open = "w") [18:41:21.172] } [18:41:21.172] else { [18:41:21.172] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:21.172] windows = "NUL", "/dev/null"), open = "w") [18:41:21.172] } [18:41:21.172] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:21.172] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:21.172] base::sink(type = "output", split = FALSE) [18:41:21.172] base::close(...future.stdout) [18:41:21.172] }, add = TRUE) [18:41:21.172] } [18:41:21.172] ...future.frame <- base::sys.nframe() [18:41:21.172] ...future.conditions <- base::list() [18:41:21.172] ...future.rng <- base::globalenv()$.Random.seed [18:41:21.172] if (FALSE) { [18:41:21.172] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:21.172] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:21.172] } [18:41:21.172] ...future.result <- base::tryCatch({ [18:41:21.172] base::withCallingHandlers({ [18:41:21.172] ...future.value <- base::withVisible(base::local({ [18:41:21.172] do.call(function(...) { [18:41:21.172] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:21.172] if (!identical(...future.globals.maxSize.org, [18:41:21.172] ...future.globals.maxSize)) { [18:41:21.172] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:21.172] on.exit(options(oopts), add = TRUE) [18:41:21.172] } [18:41:21.172] { [18:41:21.172] lapply(seq_along(...future.elements_ii), [18:41:21.172] FUN = function(jj) { [18:41:21.172] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:21.172] ...future.FUN(...future.X_jj, ...) [18:41:21.172] }) [18:41:21.172] } [18:41:21.172] }, args = future.call.arguments) [18:41:21.172] })) [18:41:21.172] future::FutureResult(value = ...future.value$value, [18:41:21.172] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:21.172] ...future.rng), globalenv = if (FALSE) [18:41:21.172] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:21.172] ...future.globalenv.names)) [18:41:21.172] else NULL, started = ...future.startTime, version = "1.8") [18:41:21.172] }, condition = base::local({ [18:41:21.172] c <- base::c [18:41:21.172] inherits <- base::inherits [18:41:21.172] invokeRestart <- base::invokeRestart [18:41:21.172] length <- base::length [18:41:21.172] list <- base::list [18:41:21.172] seq.int <- base::seq.int [18:41:21.172] signalCondition <- base::signalCondition [18:41:21.172] sys.calls <- base::sys.calls [18:41:21.172] `[[` <- base::`[[` [18:41:21.172] `+` <- base::`+` [18:41:21.172] `<<-` <- base::`<<-` [18:41:21.172] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:21.172] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:21.172] 3L)] [18:41:21.172] } [18:41:21.172] function(cond) { [18:41:21.172] is_error <- inherits(cond, "error") [18:41:21.172] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:21.172] NULL) [18:41:21.172] if (is_error) { [18:41:21.172] sessionInformation <- function() { [18:41:21.172] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:21.172] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:21.172] search = base::search(), system = base::Sys.info()) [18:41:21.172] } [18:41:21.172] ...future.conditions[[length(...future.conditions) + [18:41:21.172] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:21.172] cond$call), session = sessionInformation(), [18:41:21.172] timestamp = base::Sys.time(), signaled = 0L) [18:41:21.172] signalCondition(cond) [18:41:21.172] } [18:41:21.172] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:21.172] "immediateCondition"))) { [18:41:21.172] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:21.172] ...future.conditions[[length(...future.conditions) + [18:41:21.172] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:21.172] if (TRUE && !signal) { [18:41:21.172] muffleCondition <- function (cond, pattern = "^muffle") [18:41:21.172] { [18:41:21.172] inherits <- base::inherits [18:41:21.172] invokeRestart <- base::invokeRestart [18:41:21.172] is.null <- base::is.null [18:41:21.172] muffled <- FALSE [18:41:21.172] if (inherits(cond, "message")) { [18:41:21.172] muffled <- grepl(pattern, "muffleMessage") [18:41:21.172] if (muffled) [18:41:21.172] invokeRestart("muffleMessage") [18:41:21.172] } [18:41:21.172] else if (inherits(cond, "warning")) { [18:41:21.172] muffled <- grepl(pattern, "muffleWarning") [18:41:21.172] if (muffled) [18:41:21.172] invokeRestart("muffleWarning") [18:41:21.172] } [18:41:21.172] else if (inherits(cond, "condition")) { [18:41:21.172] if (!is.null(pattern)) { [18:41:21.172] computeRestarts <- base::computeRestarts [18:41:21.172] grepl <- base::grepl [18:41:21.172] restarts <- computeRestarts(cond) [18:41:21.172] for (restart in restarts) { [18:41:21.172] name <- restart$name [18:41:21.172] if (is.null(name)) [18:41:21.172] next [18:41:21.172] if (!grepl(pattern, name)) [18:41:21.172] next [18:41:21.172] invokeRestart(restart) [18:41:21.172] muffled <- TRUE [18:41:21.172] break [18:41:21.172] } [18:41:21.172] } [18:41:21.172] } [18:41:21.172] invisible(muffled) [18:41:21.172] } [18:41:21.172] muffleCondition(cond, pattern = "^muffle") [18:41:21.172] } [18:41:21.172] } [18:41:21.172] else { [18:41:21.172] if (TRUE) { [18:41:21.172] muffleCondition <- function (cond, pattern = "^muffle") [18:41:21.172] { [18:41:21.172] inherits <- base::inherits [18:41:21.172] invokeRestart <- base::invokeRestart [18:41:21.172] is.null <- base::is.null [18:41:21.172] muffled <- FALSE [18:41:21.172] if (inherits(cond, "message")) { [18:41:21.172] muffled <- grepl(pattern, "muffleMessage") [18:41:21.172] if (muffled) [18:41:21.172] invokeRestart("muffleMessage") [18:41:21.172] } [18:41:21.172] else if (inherits(cond, "warning")) { [18:41:21.172] muffled <- grepl(pattern, "muffleWarning") [18:41:21.172] if (muffled) [18:41:21.172] invokeRestart("muffleWarning") [18:41:21.172] } [18:41:21.172] else if (inherits(cond, "condition")) { [18:41:21.172] if (!is.null(pattern)) { [18:41:21.172] computeRestarts <- base::computeRestarts [18:41:21.172] grepl <- base::grepl [18:41:21.172] restarts <- computeRestarts(cond) [18:41:21.172] for (restart in restarts) { [18:41:21.172] name <- restart$name [18:41:21.172] if (is.null(name)) [18:41:21.172] next [18:41:21.172] if (!grepl(pattern, name)) [18:41:21.172] next [18:41:21.172] invokeRestart(restart) [18:41:21.172] muffled <- TRUE [18:41:21.172] break [18:41:21.172] } [18:41:21.172] } [18:41:21.172] } [18:41:21.172] invisible(muffled) [18:41:21.172] } [18:41:21.172] muffleCondition(cond, pattern = "^muffle") [18:41:21.172] } [18:41:21.172] } [18:41:21.172] } [18:41:21.172] })) [18:41:21.172] }, error = function(ex) { [18:41:21.172] base::structure(base::list(value = NULL, visible = NULL, [18:41:21.172] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:21.172] ...future.rng), started = ...future.startTime, [18:41:21.172] finished = Sys.time(), session_uuid = NA_character_, [18:41:21.172] version = "1.8"), class = "FutureResult") [18:41:21.172] }, finally = { [18:41:21.172] if (!identical(...future.workdir, getwd())) [18:41:21.172] setwd(...future.workdir) [18:41:21.172] { [18:41:21.172] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:21.172] ...future.oldOptions$nwarnings <- NULL [18:41:21.172] } [18:41:21.172] base::options(...future.oldOptions) [18:41:21.172] if (.Platform$OS.type == "windows") { [18:41:21.172] old_names <- names(...future.oldEnvVars) [18:41:21.172] envs <- base::Sys.getenv() [18:41:21.172] names <- names(envs) [18:41:21.172] common <- intersect(names, old_names) [18:41:21.172] added <- setdiff(names, old_names) [18:41:21.172] removed <- setdiff(old_names, names) [18:41:21.172] changed <- common[...future.oldEnvVars[common] != [18:41:21.172] envs[common]] [18:41:21.172] NAMES <- toupper(changed) [18:41:21.172] args <- list() [18:41:21.172] for (kk in seq_along(NAMES)) { [18:41:21.172] name <- changed[[kk]] [18:41:21.172] NAME <- NAMES[[kk]] [18:41:21.172] if (name != NAME && is.element(NAME, old_names)) [18:41:21.172] next [18:41:21.172] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:21.172] } [18:41:21.172] NAMES <- toupper(added) [18:41:21.172] for (kk in seq_along(NAMES)) { [18:41:21.172] name <- added[[kk]] [18:41:21.172] NAME <- NAMES[[kk]] [18:41:21.172] if (name != NAME && is.element(NAME, old_names)) [18:41:21.172] next [18:41:21.172] args[[name]] <- "" [18:41:21.172] } [18:41:21.172] NAMES <- toupper(removed) [18:41:21.172] for (kk in seq_along(NAMES)) { [18:41:21.172] name <- removed[[kk]] [18:41:21.172] NAME <- NAMES[[kk]] [18:41:21.172] if (name != NAME && is.element(NAME, old_names)) [18:41:21.172] next [18:41:21.172] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:21.172] } [18:41:21.172] if (length(args) > 0) [18:41:21.172] base::do.call(base::Sys.setenv, args = args) [18:41:21.172] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:21.172] } [18:41:21.172] else { [18:41:21.172] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:21.172] } [18:41:21.172] { [18:41:21.172] if (base::length(...future.futureOptionsAdded) > [18:41:21.172] 0L) { [18:41:21.172] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:21.172] base::names(opts) <- ...future.futureOptionsAdded [18:41:21.172] base::options(opts) [18:41:21.172] } [18:41:21.172] { [18:41:21.172] { [18:41:21.172] NULL [18:41:21.172] RNGkind("Mersenne-Twister") [18:41:21.172] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:21.172] inherits = FALSE) [18:41:21.172] } [18:41:21.172] options(future.plan = NULL) [18:41:21.172] if (is.na(NA_character_)) [18:41:21.172] Sys.unsetenv("R_FUTURE_PLAN") [18:41:21.172] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:21.172] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:21.172] .init = FALSE) [18:41:21.172] } [18:41:21.172] } [18:41:21.172] } [18:41:21.172] }) [18:41:21.172] if (TRUE) { [18:41:21.172] base::sink(type = "output", split = FALSE) [18:41:21.172] if (TRUE) { [18:41:21.172] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:21.172] } [18:41:21.172] else { [18:41:21.172] ...future.result["stdout"] <- base::list(NULL) [18:41:21.172] } [18:41:21.172] base::close(...future.stdout) [18:41:21.172] ...future.stdout <- NULL [18:41:21.172] } [18:41:21.172] ...future.result$conditions <- ...future.conditions [18:41:21.172] ...future.result$finished <- base::Sys.time() [18:41:21.172] ...future.result [18:41:21.172] } [18:41:21.176] assign_globals() ... [18:41:21.176] List of 5 [18:41:21.176] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:21.176] $ future.call.arguments :List of 1 [18:41:21.176] ..$ length: int 2 [18:41:21.176] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:21.176] $ ...future.elements_ii :List of 4 [18:41:21.176] ..$ c: chr "character" [18:41:21.176] ..$ b: chr "numeric" [18:41:21.176] ..$ c: chr "list" [18:41:21.176] ..$ a: chr "integer" [18:41:21.176] $ ...future.seeds_ii : NULL [18:41:21.176] $ ...future.globals.maxSize: NULL [18:41:21.176] - attr(*, "where")=List of 5 [18:41:21.176] ..$ ...future.FUN : [18:41:21.176] ..$ future.call.arguments : [18:41:21.176] ..$ ...future.elements_ii : [18:41:21.176] ..$ ...future.seeds_ii : [18:41:21.176] ..$ ...future.globals.maxSize: [18:41:21.176] - attr(*, "resolved")= logi FALSE [18:41:21.176] - attr(*, "total_size")= num 4456 [18:41:21.176] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:21.176] - attr(*, "already-done")= logi TRUE [18:41:21.183] - copied '...future.FUN' to environment [18:41:21.183] - copied 'future.call.arguments' to environment [18:41:21.183] - copied '...future.elements_ii' to environment [18:41:21.183] - copied '...future.seeds_ii' to environment [18:41:21.183] - copied '...future.globals.maxSize' to environment [18:41:21.184] assign_globals() ... done [18:41:21.184] plan(): Setting new future strategy stack: [18:41:21.184] List of future strategies: [18:41:21.184] 1. sequential: [18:41:21.184] - args: function (..., envir = parent.frame(), workers = "") [18:41:21.184] - tweaked: FALSE [18:41:21.184] - call: NULL [18:41:21.185] plan(): nbrOfWorkers() = 1 [18:41:21.186] plan(): Setting new future strategy stack: [18:41:21.186] List of future strategies: [18:41:21.186] 1. sequential: [18:41:21.186] - args: function (..., envir = parent.frame(), workers = "") [18:41:21.186] - tweaked: FALSE [18:41:21.186] - call: plan(strategy) [18:41:21.187] plan(): nbrOfWorkers() = 1 [18:41:21.187] SequentialFuture started (and completed) [18:41:21.188] - Launch lazy future ... done [18:41:21.188] run() for 'SequentialFuture' ... done [18:41:21.188] Created future: [18:41:21.188] SequentialFuture: [18:41:21.188] Label: 'future_lapply-1' [18:41:21.188] Expression: [18:41:21.188] { [18:41:21.188] do.call(function(...) { [18:41:21.188] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:21.188] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:21.188] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:21.188] on.exit(options(oopts), add = TRUE) [18:41:21.188] } [18:41:21.188] { [18:41:21.188] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:21.188] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:21.188] ...future.FUN(...future.X_jj, ...) [18:41:21.188] }) [18:41:21.188] } [18:41:21.188] }, args = future.call.arguments) [18:41:21.188] } [18:41:21.188] Lazy evaluation: FALSE [18:41:21.188] Asynchronous evaluation: FALSE [18:41:21.188] Local evaluation: TRUE [18:41:21.188] Environment: R_GlobalEnv [18:41:21.188] Capture standard output: TRUE [18:41:21.188] Capture condition classes: 'condition' (excluding 'nothing') [18:41:21.188] Globals: 5 objects totaling 853 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 191 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:21.188] Packages: [18:41:21.188] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:21.188] Resolved: TRUE [18:41:21.188] Value: 111 bytes of class 'list' [18:41:21.188] Early signaling: FALSE [18:41:21.188] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:21.188] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:21.189] Chunk #1 of 1 ... DONE [18:41:21.190] Launching 1 futures (chunks) ... DONE [18:41:21.190] Resolving 1 futures (chunks) ... [18:41:21.190] resolve() on list ... [18:41:21.190] recursive: 0 [18:41:21.190] length: 1 [18:41:21.190] [18:41:21.191] resolved() for 'SequentialFuture' ... [18:41:21.191] - state: 'finished' [18:41:21.191] - run: TRUE [18:41:21.191] - result: 'FutureResult' [18:41:21.191] resolved() for 'SequentialFuture' ... done [18:41:21.191] Future #1 [18:41:21.192] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:21.192] - nx: 1 [18:41:21.192] - relay: TRUE [18:41:21.192] - stdout: TRUE [18:41:21.192] - signal: TRUE [18:41:21.193] - resignal: FALSE [18:41:21.193] - force: TRUE [18:41:21.193] - relayed: [n=1] FALSE [18:41:21.193] - queued futures: [n=1] FALSE [18:41:21.193] - until=1 [18:41:21.193] - relaying element #1 [18:41:21.194] - relayed: [n=1] TRUE [18:41:21.194] - queued futures: [n=1] TRUE [18:41:21.194] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:21.194] length: 0 (resolved future 1) [18:41:21.194] Relaying remaining futures [18:41:21.194] signalConditionsASAP(NULL, pos=0) ... [18:41:21.195] - nx: 1 [18:41:21.195] - relay: TRUE [18:41:21.195] - stdout: TRUE [18:41:21.195] - signal: TRUE [18:41:21.195] - resignal: FALSE [18:41:21.195] - force: TRUE [18:41:21.195] - relayed: [n=1] TRUE [18:41:21.196] - queued futures: [n=1] TRUE - flush all [18:41:21.196] - relayed: [n=1] TRUE [18:41:21.196] - queued futures: [n=1] TRUE [18:41:21.196] signalConditionsASAP(NULL, pos=0) ... done [18:41:21.196] resolve() on list ... DONE [18:41:21.197] - Number of value chunks collected: 1 [18:41:21.197] Resolving 1 futures (chunks) ... DONE [18:41:21.197] Reducing values from 1 chunks ... [18:41:21.197] - Number of values collected after concatenation: 4 [18:41:21.197] - Number of values expected: 4 [18:41:21.197] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 2, 1, 3 [18:41:21.198] Reducing values from 1 chunks ... DONE [18:41:21.198] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL - future_lapply(x, FUN = future:::hpaste, ...) ... [18:41:21.200] future_lapply() ... [18:41:21.209] Number of chunks: 1 [18:41:21.209] getGlobalsAndPackagesXApply() ... [18:41:21.209] - future.globals: TRUE [18:41:21.210] getGlobalsAndPackages() ... [18:41:21.210] Searching for globals... [18:41:21.220] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [18:41:21.220] Searching for globals ... DONE [18:41:21.220] Resolving globals: FALSE [18:41:21.221] The total size of the 1 globals is 7.17 KiB (7342 bytes) [18:41:21.222] The total size of the 1 globals exported for future expression ('FUN(collapse = "; ", maxHead = 3L)') is 7.17 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (7.17 KiB of class 'function') [18:41:21.222] - globals: [1] 'FUN' [18:41:21.222] - packages: [1] 'future' [18:41:21.222] getGlobalsAndPackages() ... DONE [18:41:21.222] - globals found/used: [n=1] 'FUN' [18:41:21.223] - needed namespaces: [n=1] 'future' [18:41:21.223] Finding globals ... DONE [18:41:21.223] - use_args: TRUE [18:41:21.223] - Getting '...' globals ... [18:41:21.224] resolve() on list ... [18:41:21.224] recursive: 0 [18:41:21.224] length: 1 [18:41:21.224] elements: '...' [18:41:21.224] length: 0 (resolved future 1) [18:41:21.224] resolve() on list ... DONE [18:41:21.225] - '...' content: [n=2] 'collapse', 'maxHead' [18:41:21.225] List of 1 [18:41:21.225] $ ...:List of 2 [18:41:21.225] ..$ collapse: chr "; " [18:41:21.225] ..$ maxHead : int 3 [18:41:21.225] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:21.225] - attr(*, "where")=List of 1 [18:41:21.225] ..$ ...: [18:41:21.225] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:21.225] - attr(*, "resolved")= logi TRUE [18:41:21.225] - attr(*, "total_size")= num NA [18:41:21.229] - Getting '...' globals ... DONE [18:41:21.229] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:21.229] List of 2 [18:41:21.229] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [18:41:21.229] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [18:41:21.229] $ ... :List of 2 [18:41:21.229] ..$ collapse: chr "; " [18:41:21.229] ..$ maxHead : int 3 [18:41:21.229] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:21.229] - attr(*, "where")=List of 2 [18:41:21.229] ..$ ...future.FUN: [18:41:21.229] ..$ ... : [18:41:21.229] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:21.229] - attr(*, "resolved")= logi FALSE [18:41:21.229] - attr(*, "total_size")= int 20351 [18:41:21.233] Packages to be attached in all futures: [n=1] 'future' [18:41:21.233] getGlobalsAndPackagesXApply() ... DONE [18:41:21.234] Number of futures (= number of chunks): 1 [18:41:21.234] Launching 1 futures (chunks) ... [18:41:21.234] Chunk #1 of 1 ... [18:41:21.234] - Finding globals in 'X' for chunk #1 ... [18:41:21.234] getGlobalsAndPackages() ... [18:41:21.235] Searching for globals... [18:41:21.235] [18:41:21.235] Searching for globals ... DONE [18:41:21.235] - globals: [0] [18:41:21.235] getGlobalsAndPackages() ... DONE [18:41:21.236] + additional globals found: [n=0] [18:41:21.236] + additional namespaces needed: [n=0] [18:41:21.236] - Finding globals in 'X' for chunk #1 ... DONE [18:41:21.236] - seeds: [18:41:21.236] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:21.237] getGlobalsAndPackages() ... [18:41:21.237] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:21.237] Resolving globals: FALSE [18:41:21.237] Tweak future expression to call with '...' arguments ... [18:41:21.237] { [18:41:21.237] do.call(function(...) { [18:41:21.237] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:21.237] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:21.237] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:21.237] on.exit(options(oopts), add = TRUE) [18:41:21.237] } [18:41:21.237] { [18:41:21.237] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:21.237] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:21.237] ...future.FUN(...future.X_jj, ...) [18:41:21.237] }) [18:41:21.237] } [18:41:21.237] }, args = future.call.arguments) [18:41:21.237] } [18:41:21.238] Tweak future expression to call with '...' arguments ... DONE [18:41:21.238] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:21.239] - packages: [1] 'future' [18:41:21.239] getGlobalsAndPackages() ... DONE [18:41:21.239] run() for 'Future' ... [18:41:21.239] - state: 'created' [18:41:21.240] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:21.240] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:21.240] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:21.240] - Field: 'label' [18:41:21.241] - Field: 'local' [18:41:21.241] - Field: 'owner' [18:41:21.241] - Field: 'envir' [18:41:21.241] - Field: 'packages' [18:41:21.241] - Field: 'gc' [18:41:21.242] - Field: 'conditions' [18:41:21.242] - Field: 'expr' [18:41:21.242] - Field: 'uuid' [18:41:21.242] - Field: 'seed' [18:41:21.242] - Field: 'version' [18:41:21.243] - Field: 'result' [18:41:21.243] - Field: 'asynchronous' [18:41:21.243] - Field: 'calls' [18:41:21.243] - Field: 'globals' [18:41:21.243] - Field: 'stdout' [18:41:21.243] - Field: 'earlySignal' [18:41:21.244] - Field: 'lazy' [18:41:21.244] - Field: 'state' [18:41:21.244] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:21.244] - Launch lazy future ... [18:41:21.244] Packages needed by the future expression (n = 1): 'future' [18:41:21.245] Packages needed by future strategies (n = 0): [18:41:21.245] { [18:41:21.245] { [18:41:21.245] { [18:41:21.245] ...future.startTime <- base::Sys.time() [18:41:21.245] { [18:41:21.245] { [18:41:21.245] { [18:41:21.245] { [18:41:21.245] base::local({ [18:41:21.245] has_future <- base::requireNamespace("future", [18:41:21.245] quietly = TRUE) [18:41:21.245] if (has_future) { [18:41:21.245] ns <- base::getNamespace("future") [18:41:21.245] version <- ns[[".package"]][["version"]] [18:41:21.245] if (is.null(version)) [18:41:21.245] version <- utils::packageVersion("future") [18:41:21.245] } [18:41:21.245] else { [18:41:21.245] version <- NULL [18:41:21.245] } [18:41:21.245] if (!has_future || version < "1.8.0") { [18:41:21.245] info <- base::c(r_version = base::gsub("R version ", [18:41:21.245] "", base::R.version$version.string), [18:41:21.245] platform = base::sprintf("%s (%s-bit)", [18:41:21.245] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:21.245] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:21.245] "release", "version")], collapse = " "), [18:41:21.245] hostname = base::Sys.info()[["nodename"]]) [18:41:21.245] info <- base::sprintf("%s: %s", base::names(info), [18:41:21.245] info) [18:41:21.245] info <- base::paste(info, collapse = "; ") [18:41:21.245] if (!has_future) { [18:41:21.245] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:21.245] info) [18:41:21.245] } [18:41:21.245] else { [18:41:21.245] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:21.245] info, version) [18:41:21.245] } [18:41:21.245] base::stop(msg) [18:41:21.245] } [18:41:21.245] }) [18:41:21.245] } [18:41:21.245] base::local({ [18:41:21.245] for (pkg in "future") { [18:41:21.245] base::loadNamespace(pkg) [18:41:21.245] base::library(pkg, character.only = TRUE) [18:41:21.245] } [18:41:21.245] }) [18:41:21.245] } [18:41:21.245] ...future.strategy.old <- future::plan("list") [18:41:21.245] options(future.plan = NULL) [18:41:21.245] Sys.unsetenv("R_FUTURE_PLAN") [18:41:21.245] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:21.245] } [18:41:21.245] ...future.workdir <- getwd() [18:41:21.245] } [18:41:21.245] ...future.oldOptions <- base::as.list(base::.Options) [18:41:21.245] ...future.oldEnvVars <- base::Sys.getenv() [18:41:21.245] } [18:41:21.245] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:21.245] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:21.245] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:21.245] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:21.245] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:21.245] future.stdout.windows.reencode = NULL, width = 80L) [18:41:21.245] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:21.245] base::names(...future.oldOptions)) [18:41:21.245] } [18:41:21.245] if (FALSE) { [18:41:21.245] } [18:41:21.245] else { [18:41:21.245] if (TRUE) { [18:41:21.245] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:21.245] open = "w") [18:41:21.245] } [18:41:21.245] else { [18:41:21.245] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:21.245] windows = "NUL", "/dev/null"), open = "w") [18:41:21.245] } [18:41:21.245] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:21.245] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:21.245] base::sink(type = "output", split = FALSE) [18:41:21.245] base::close(...future.stdout) [18:41:21.245] }, add = TRUE) [18:41:21.245] } [18:41:21.245] ...future.frame <- base::sys.nframe() [18:41:21.245] ...future.conditions <- base::list() [18:41:21.245] ...future.rng <- base::globalenv()$.Random.seed [18:41:21.245] if (FALSE) { [18:41:21.245] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:21.245] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:21.245] } [18:41:21.245] ...future.result <- base::tryCatch({ [18:41:21.245] base::withCallingHandlers({ [18:41:21.245] ...future.value <- base::withVisible(base::local({ [18:41:21.245] do.call(function(...) { [18:41:21.245] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:21.245] if (!identical(...future.globals.maxSize.org, [18:41:21.245] ...future.globals.maxSize)) { [18:41:21.245] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:21.245] on.exit(options(oopts), add = TRUE) [18:41:21.245] } [18:41:21.245] { [18:41:21.245] lapply(seq_along(...future.elements_ii), [18:41:21.245] FUN = function(jj) { [18:41:21.245] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:21.245] ...future.FUN(...future.X_jj, ...) [18:41:21.245] }) [18:41:21.245] } [18:41:21.245] }, args = future.call.arguments) [18:41:21.245] })) [18:41:21.245] future::FutureResult(value = ...future.value$value, [18:41:21.245] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:21.245] ...future.rng), globalenv = if (FALSE) [18:41:21.245] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:21.245] ...future.globalenv.names)) [18:41:21.245] else NULL, started = ...future.startTime, version = "1.8") [18:41:21.245] }, condition = base::local({ [18:41:21.245] c <- base::c [18:41:21.245] inherits <- base::inherits [18:41:21.245] invokeRestart <- base::invokeRestart [18:41:21.245] length <- base::length [18:41:21.245] list <- base::list [18:41:21.245] seq.int <- base::seq.int [18:41:21.245] signalCondition <- base::signalCondition [18:41:21.245] sys.calls <- base::sys.calls [18:41:21.245] `[[` <- base::`[[` [18:41:21.245] `+` <- base::`+` [18:41:21.245] `<<-` <- base::`<<-` [18:41:21.245] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:21.245] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:21.245] 3L)] [18:41:21.245] } [18:41:21.245] function(cond) { [18:41:21.245] is_error <- inherits(cond, "error") [18:41:21.245] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:21.245] NULL) [18:41:21.245] if (is_error) { [18:41:21.245] sessionInformation <- function() { [18:41:21.245] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:21.245] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:21.245] search = base::search(), system = base::Sys.info()) [18:41:21.245] } [18:41:21.245] ...future.conditions[[length(...future.conditions) + [18:41:21.245] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:21.245] cond$call), session = sessionInformation(), [18:41:21.245] timestamp = base::Sys.time(), signaled = 0L) [18:41:21.245] signalCondition(cond) [18:41:21.245] } [18:41:21.245] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:21.245] "immediateCondition"))) { [18:41:21.245] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:21.245] ...future.conditions[[length(...future.conditions) + [18:41:21.245] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:21.245] if (TRUE && !signal) { [18:41:21.245] muffleCondition <- function (cond, pattern = "^muffle") [18:41:21.245] { [18:41:21.245] inherits <- base::inherits [18:41:21.245] invokeRestart <- base::invokeRestart [18:41:21.245] is.null <- base::is.null [18:41:21.245] muffled <- FALSE [18:41:21.245] if (inherits(cond, "message")) { [18:41:21.245] muffled <- grepl(pattern, "muffleMessage") [18:41:21.245] if (muffled) [18:41:21.245] invokeRestart("muffleMessage") [18:41:21.245] } [18:41:21.245] else if (inherits(cond, "warning")) { [18:41:21.245] muffled <- grepl(pattern, "muffleWarning") [18:41:21.245] if (muffled) [18:41:21.245] invokeRestart("muffleWarning") [18:41:21.245] } [18:41:21.245] else if (inherits(cond, "condition")) { [18:41:21.245] if (!is.null(pattern)) { [18:41:21.245] computeRestarts <- base::computeRestarts [18:41:21.245] grepl <- base::grepl [18:41:21.245] restarts <- computeRestarts(cond) [18:41:21.245] for (restart in restarts) { [18:41:21.245] name <- restart$name [18:41:21.245] if (is.null(name)) [18:41:21.245] next [18:41:21.245] if (!grepl(pattern, name)) [18:41:21.245] next [18:41:21.245] invokeRestart(restart) [18:41:21.245] muffled <- TRUE [18:41:21.245] break [18:41:21.245] } [18:41:21.245] } [18:41:21.245] } [18:41:21.245] invisible(muffled) [18:41:21.245] } [18:41:21.245] muffleCondition(cond, pattern = "^muffle") [18:41:21.245] } [18:41:21.245] } [18:41:21.245] else { [18:41:21.245] if (TRUE) { [18:41:21.245] muffleCondition <- function (cond, pattern = "^muffle") [18:41:21.245] { [18:41:21.245] inherits <- base::inherits [18:41:21.245] invokeRestart <- base::invokeRestart [18:41:21.245] is.null <- base::is.null [18:41:21.245] muffled <- FALSE [18:41:21.245] if (inherits(cond, "message")) { [18:41:21.245] muffled <- grepl(pattern, "muffleMessage") [18:41:21.245] if (muffled) [18:41:21.245] invokeRestart("muffleMessage") [18:41:21.245] } [18:41:21.245] else if (inherits(cond, "warning")) { [18:41:21.245] muffled <- grepl(pattern, "muffleWarning") [18:41:21.245] if (muffled) [18:41:21.245] invokeRestart("muffleWarning") [18:41:21.245] } [18:41:21.245] else if (inherits(cond, "condition")) { [18:41:21.245] if (!is.null(pattern)) { [18:41:21.245] computeRestarts <- base::computeRestarts [18:41:21.245] grepl <- base::grepl [18:41:21.245] restarts <- computeRestarts(cond) [18:41:21.245] for (restart in restarts) { [18:41:21.245] name <- restart$name [18:41:21.245] if (is.null(name)) [18:41:21.245] next [18:41:21.245] if (!grepl(pattern, name)) [18:41:21.245] next [18:41:21.245] invokeRestart(restart) [18:41:21.245] muffled <- TRUE [18:41:21.245] break [18:41:21.245] } [18:41:21.245] } [18:41:21.245] } [18:41:21.245] invisible(muffled) [18:41:21.245] } [18:41:21.245] muffleCondition(cond, pattern = "^muffle") [18:41:21.245] } [18:41:21.245] } [18:41:21.245] } [18:41:21.245] })) [18:41:21.245] }, error = function(ex) { [18:41:21.245] base::structure(base::list(value = NULL, visible = NULL, [18:41:21.245] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:21.245] ...future.rng), started = ...future.startTime, [18:41:21.245] finished = Sys.time(), session_uuid = NA_character_, [18:41:21.245] version = "1.8"), class = "FutureResult") [18:41:21.245] }, finally = { [18:41:21.245] if (!identical(...future.workdir, getwd())) [18:41:21.245] setwd(...future.workdir) [18:41:21.245] { [18:41:21.245] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:21.245] ...future.oldOptions$nwarnings <- NULL [18:41:21.245] } [18:41:21.245] base::options(...future.oldOptions) [18:41:21.245] if (.Platform$OS.type == "windows") { [18:41:21.245] old_names <- names(...future.oldEnvVars) [18:41:21.245] envs <- base::Sys.getenv() [18:41:21.245] names <- names(envs) [18:41:21.245] common <- intersect(names, old_names) [18:41:21.245] added <- setdiff(names, old_names) [18:41:21.245] removed <- setdiff(old_names, names) [18:41:21.245] changed <- common[...future.oldEnvVars[common] != [18:41:21.245] envs[common]] [18:41:21.245] NAMES <- toupper(changed) [18:41:21.245] args <- list() [18:41:21.245] for (kk in seq_along(NAMES)) { [18:41:21.245] name <- changed[[kk]] [18:41:21.245] NAME <- NAMES[[kk]] [18:41:21.245] if (name != NAME && is.element(NAME, old_names)) [18:41:21.245] next [18:41:21.245] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:21.245] } [18:41:21.245] NAMES <- toupper(added) [18:41:21.245] for (kk in seq_along(NAMES)) { [18:41:21.245] name <- added[[kk]] [18:41:21.245] NAME <- NAMES[[kk]] [18:41:21.245] if (name != NAME && is.element(NAME, old_names)) [18:41:21.245] next [18:41:21.245] args[[name]] <- "" [18:41:21.245] } [18:41:21.245] NAMES <- toupper(removed) [18:41:21.245] for (kk in seq_along(NAMES)) { [18:41:21.245] name <- removed[[kk]] [18:41:21.245] NAME <- NAMES[[kk]] [18:41:21.245] if (name != NAME && is.element(NAME, old_names)) [18:41:21.245] next [18:41:21.245] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:21.245] } [18:41:21.245] if (length(args) > 0) [18:41:21.245] base::do.call(base::Sys.setenv, args = args) [18:41:21.245] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:21.245] } [18:41:21.245] else { [18:41:21.245] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:21.245] } [18:41:21.245] { [18:41:21.245] if (base::length(...future.futureOptionsAdded) > [18:41:21.245] 0L) { [18:41:21.245] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:21.245] base::names(opts) <- ...future.futureOptionsAdded [18:41:21.245] base::options(opts) [18:41:21.245] } [18:41:21.245] { [18:41:21.245] { [18:41:21.245] NULL [18:41:21.245] RNGkind("Mersenne-Twister") [18:41:21.245] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:21.245] inherits = FALSE) [18:41:21.245] } [18:41:21.245] options(future.plan = NULL) [18:41:21.245] if (is.na(NA_character_)) [18:41:21.245] Sys.unsetenv("R_FUTURE_PLAN") [18:41:21.245] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:21.245] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:21.245] .init = FALSE) [18:41:21.245] } [18:41:21.245] } [18:41:21.245] } [18:41:21.245] }) [18:41:21.245] if (TRUE) { [18:41:21.245] base::sink(type = "output", split = FALSE) [18:41:21.245] if (TRUE) { [18:41:21.245] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:21.245] } [18:41:21.245] else { [18:41:21.245] ...future.result["stdout"] <- base::list(NULL) [18:41:21.245] } [18:41:21.245] base::close(...future.stdout) [18:41:21.245] ...future.stdout <- NULL [18:41:21.245] } [18:41:21.245] ...future.result$conditions <- ...future.conditions [18:41:21.245] ...future.result$finished <- base::Sys.time() [18:41:21.245] ...future.result [18:41:21.245] } [18:41:21.249] assign_globals() ... [18:41:21.249] List of 5 [18:41:21.249] $ ...future.FUN :function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [18:41:21.249] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [18:41:21.249] $ future.call.arguments :List of 2 [18:41:21.249] ..$ collapse: chr "; " [18:41:21.249] ..$ maxHead : int 3 [18:41:21.249] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:21.249] $ ...future.elements_ii :List of 1 [18:41:21.249] ..$ a: Named chr [1:101] "hello" "1" "2" "3" ... [18:41:21.249] .. ..- attr(*, "names")= chr [1:101] "" "b1" "b2" "b3" ... [18:41:21.249] $ ...future.seeds_ii : NULL [18:41:21.249] $ ...future.globals.maxSize: NULL [18:41:21.249] - attr(*, "where")=List of 5 [18:41:21.249] ..$ ...future.FUN : [18:41:21.249] ..$ future.call.arguments : [18:41:21.249] ..$ ...future.elements_ii : [18:41:21.249] ..$ ...future.seeds_ii : [18:41:21.249] ..$ ...future.globals.maxSize: [18:41:21.249] - attr(*, "resolved")= logi FALSE [18:41:21.249] - attr(*, "total_size")= num 20351 [18:41:21.249] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:21.249] - attr(*, "already-done")= logi TRUE [18:41:21.257] - copied '...future.FUN' to environment [18:41:21.258] - copied 'future.call.arguments' to environment [18:41:21.258] - copied '...future.elements_ii' to environment [18:41:21.258] - copied '...future.seeds_ii' to environment [18:41:21.258] - copied '...future.globals.maxSize' to environment [18:41:21.258] assign_globals() ... done [18:41:21.259] plan(): Setting new future strategy stack: [18:41:21.259] List of future strategies: [18:41:21.259] 1. sequential: [18:41:21.259] - args: function (..., envir = parent.frame(), workers = "") [18:41:21.259] - tweaked: FALSE [18:41:21.259] - call: NULL [18:41:21.260] plan(): nbrOfWorkers() = 1 [18:41:21.261] plan(): Setting new future strategy stack: [18:41:21.262] List of future strategies: [18:41:21.262] 1. sequential: [18:41:21.262] - args: function (..., envir = parent.frame(), workers = "") [18:41:21.262] - tweaked: FALSE [18:41:21.262] - call: plan(strategy) [18:41:21.262] plan(): nbrOfWorkers() = 1 [18:41:21.262] SequentialFuture started (and completed) [18:41:21.263] - Launch lazy future ... done [18:41:21.263] run() for 'SequentialFuture' ... done [18:41:21.263] Created future: [18:41:21.263] SequentialFuture: [18:41:21.263] Label: 'future_lapply-1' [18:41:21.263] Expression: [18:41:21.263] { [18:41:21.263] do.call(function(...) { [18:41:21.263] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:21.263] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:21.263] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:21.263] on.exit(options(oopts), add = TRUE) [18:41:21.263] } [18:41:21.263] { [18:41:21.263] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:21.263] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:21.263] ...future.FUN(...future.X_jj, ...) [18:41:21.263] }) [18:41:21.263] } [18:41:21.263] }, args = future.call.arguments) [18:41:21.263] } [18:41:21.263] Lazy evaluation: FALSE [18:41:21.263] Asynchronous evaluation: FALSE [18:41:21.263] Local evaluation: TRUE [18:41:21.263] Environment: R_GlobalEnv [18:41:21.263] Capture standard output: TRUE [18:41:21.263] Capture condition classes: 'condition' (excluding 'nothing') [18:41:21.263] Globals: 5 objects totaling 9.56 KiB (function '...future.FUN' of 7.17 KiB, DotDotDotList 'future.call.arguments' of 187 bytes, list '...future.elements_ii' of 2.15 KiB, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:21.263] Packages: 1 packages ('future') [18:41:21.263] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:21.263] Resolved: TRUE [18:41:21.263] Value: 68 bytes of class 'list' [18:41:21.263] Early signaling: FALSE [18:41:21.263] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:21.263] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:21.265] Chunk #1 of 1 ... DONE [18:41:21.265] Launching 1 futures (chunks) ... DONE [18:41:21.265] Resolving 1 futures (chunks) ... [18:41:21.265] resolve() on list ... [18:41:21.265] recursive: 0 [18:41:21.266] length: 1 [18:41:21.266] [18:41:21.266] resolved() for 'SequentialFuture' ... [18:41:21.266] - state: 'finished' [18:41:21.266] - run: TRUE [18:41:21.266] - result: 'FutureResult' [18:41:21.267] resolved() for 'SequentialFuture' ... done [18:41:21.267] Future #1 [18:41:21.267] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:21.267] - nx: 1 [18:41:21.267] - relay: TRUE [18:41:21.268] - stdout: TRUE [18:41:21.268] - signal: TRUE [18:41:21.268] - resignal: FALSE [18:41:21.268] - force: TRUE [18:41:21.268] - relayed: [n=1] FALSE [18:41:21.268] - queued futures: [n=1] FALSE [18:41:21.269] - until=1 [18:41:21.269] - relaying element #1 [18:41:21.269] - relayed: [n=1] TRUE [18:41:21.269] - queued futures: [n=1] TRUE [18:41:21.270] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:21.270] length: 0 (resolved future 1) [18:41:21.270] Relaying remaining futures [18:41:21.270] signalConditionsASAP(NULL, pos=0) ... [18:41:21.270] - nx: 1 [18:41:21.270] - relay: TRUE [18:41:21.271] - stdout: TRUE [18:41:21.271] - signal: TRUE [18:41:21.271] - resignal: FALSE [18:41:21.271] - force: TRUE [18:41:21.271] - relayed: [n=1] TRUE [18:41:21.271] - queued futures: [n=1] TRUE - flush all [18:41:21.272] - relayed: [n=1] TRUE [18:41:21.272] - queued futures: [n=1] TRUE [18:41:21.272] signalConditionsASAP(NULL, pos=0) ... done [18:41:21.272] resolve() on list ... DONE [18:41:21.272] - Number of value chunks collected: 1 [18:41:21.273] Resolving 1 futures (chunks) ... DONE [18:41:21.273] Reducing values from 1 chunks ... [18:41:21.273] - Number of values collected after concatenation: 1 [18:41:21.273] - Number of values expected: 1 [18:41:21.273] Reducing values from 1 chunks ... DONE [18:41:21.274] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [18:41:21.275] future_lapply() ... [18:41:21.276] Number of chunks: 1 [18:41:21.276] Index remapping (attribute 'ordering'): [n = 2] 1, 2 [18:41:21.276] getGlobalsAndPackagesXApply() ... [18:41:21.276] - future.globals: TRUE [18:41:21.276] getGlobalsAndPackages() ... [18:41:21.276] Searching for globals... [18:41:21.280] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [18:41:21.280] Searching for globals ... DONE [18:41:21.280] Resolving globals: FALSE [18:41:21.281] The total size of the 1 globals is 911 bytes (911 bytes) [18:41:21.281] The total size of the 1 globals exported for future expression ('FUN()') is 911 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (911 bytes of class 'function') [18:41:21.282] - globals: [1] 'FUN' [18:41:21.282] - packages: [1] 'listenv' [18:41:21.282] getGlobalsAndPackages() ... DONE [18:41:21.282] - globals found/used: [n=1] 'FUN' [18:41:21.282] - needed namespaces: [n=1] 'listenv' [18:41:21.282] Finding globals ... DONE [18:41:21.283] - use_args: TRUE [18:41:21.283] - Getting '...' globals ... [18:41:21.283] resolve() on list ... [18:41:21.283] recursive: 0 [18:41:21.284] length: 1 [18:41:21.284] elements: '...' [18:41:21.284] length: 0 (resolved future 1) [18:41:21.284] resolve() on list ... DONE [18:41:21.284] - '...' content: [n=0] [18:41:21.284] List of 1 [18:41:21.284] $ ...: list() [18:41:21.284] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:21.284] - attr(*, "where")=List of 1 [18:41:21.284] ..$ ...: [18:41:21.284] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:21.284] - attr(*, "resolved")= logi TRUE [18:41:21.284] - attr(*, "total_size")= num NA [18:41:21.287] - Getting '...' globals ... DONE [18:41:21.287] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:21.288] List of 2 [18:41:21.288] $ ...future.FUN:function (x, ...) [18:41:21.288] $ ... : list() [18:41:21.288] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:21.288] - attr(*, "where")=List of 2 [18:41:21.288] ..$ ...future.FUN: [18:41:21.288] ..$ ... : [18:41:21.288] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:21.288] - attr(*, "resolved")= logi FALSE [18:41:21.288] - attr(*, "total_size")= int 8195 [18:41:21.291] Packages to be attached in all futures: [n=1] 'listenv' [18:41:21.291] getGlobalsAndPackagesXApply() ... DONE [18:41:21.291] Number of futures (= number of chunks): 1 [18:41:21.291] Launching 1 futures (chunks) ... [18:41:21.292] Chunk #1 of 1 ... [18:41:21.292] - Finding globals in 'X' for chunk #1 ... [18:41:21.292] getGlobalsAndPackages() ... [18:41:21.292] Searching for globals... [18:41:21.293] [18:41:21.293] Searching for globals ... DONE [18:41:21.293] - globals: [0] [18:41:21.293] getGlobalsAndPackages() ... DONE [18:41:21.294] + additional globals found: [n=0] [18:41:21.294] + additional namespaces needed: [n=0] [18:41:21.294] - Finding globals in 'X' for chunk #1 ... DONE [18:41:21.294] - seeds: [18:41:21.294] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:21.294] getGlobalsAndPackages() ... [18:41:21.295] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:21.295] Resolving globals: FALSE [18:41:21.295] Tweak future expression to call with '...' arguments ... [18:41:21.295] { [18:41:21.295] do.call(function(...) { [18:41:21.295] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:21.295] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:21.295] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:21.295] on.exit(options(oopts), add = TRUE) [18:41:21.295] } [18:41:21.295] { [18:41:21.295] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:21.295] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:21.295] ...future.FUN(...future.X_jj, ...) [18:41:21.295] }) [18:41:21.295] } [18:41:21.295] }, args = future.call.arguments) [18:41:21.295] } [18:41:21.296] Tweak future expression to call with '...' arguments ... DONE [18:41:21.296] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:21.296] - packages: [1] 'listenv' [18:41:21.297] getGlobalsAndPackages() ... DONE [18:41:21.297] run() for 'Future' ... [18:41:21.297] - state: 'created' [18:41:21.297] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:21.298] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:21.298] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:21.298] - Field: 'label' [18:41:21.298] - Field: 'local' [18:41:21.299] - Field: 'owner' [18:41:21.299] - Field: 'envir' [18:41:21.299] - Field: 'packages' [18:41:21.299] - Field: 'gc' [18:41:21.299] - Field: 'conditions' [18:41:21.300] - Field: 'expr' [18:41:21.300] - Field: 'uuid' [18:41:21.300] - Field: 'seed' [18:41:21.300] - Field: 'version' [18:41:21.300] - Field: 'result' [18:41:21.300] - Field: 'asynchronous' [18:41:21.301] - Field: 'calls' [18:41:21.301] - Field: 'globals' [18:41:21.301] - Field: 'stdout' [18:41:21.301] - Field: 'earlySignal' [18:41:21.301] - Field: 'lazy' [18:41:21.301] - Field: 'state' [18:41:21.302] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:21.302] - Launch lazy future ... [18:41:21.302] Packages needed by the future expression (n = 1): 'listenv' [18:41:21.302] Packages needed by future strategies (n = 0): [18:41:21.303] { [18:41:21.303] { [18:41:21.303] { [18:41:21.303] ...future.startTime <- base::Sys.time() [18:41:21.303] { [18:41:21.303] { [18:41:21.303] { [18:41:21.303] { [18:41:21.303] base::local({ [18:41:21.303] has_future <- base::requireNamespace("future", [18:41:21.303] quietly = TRUE) [18:41:21.303] if (has_future) { [18:41:21.303] ns <- base::getNamespace("future") [18:41:21.303] version <- ns[[".package"]][["version"]] [18:41:21.303] if (is.null(version)) [18:41:21.303] version <- utils::packageVersion("future") [18:41:21.303] } [18:41:21.303] else { [18:41:21.303] version <- NULL [18:41:21.303] } [18:41:21.303] if (!has_future || version < "1.8.0") { [18:41:21.303] info <- base::c(r_version = base::gsub("R version ", [18:41:21.303] "", base::R.version$version.string), [18:41:21.303] platform = base::sprintf("%s (%s-bit)", [18:41:21.303] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:21.303] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:21.303] "release", "version")], collapse = " "), [18:41:21.303] hostname = base::Sys.info()[["nodename"]]) [18:41:21.303] info <- base::sprintf("%s: %s", base::names(info), [18:41:21.303] info) [18:41:21.303] info <- base::paste(info, collapse = "; ") [18:41:21.303] if (!has_future) { [18:41:21.303] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:21.303] info) [18:41:21.303] } [18:41:21.303] else { [18:41:21.303] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:21.303] info, version) [18:41:21.303] } [18:41:21.303] base::stop(msg) [18:41:21.303] } [18:41:21.303] }) [18:41:21.303] } [18:41:21.303] base::local({ [18:41:21.303] for (pkg in "listenv") { [18:41:21.303] base::loadNamespace(pkg) [18:41:21.303] base::library(pkg, character.only = TRUE) [18:41:21.303] } [18:41:21.303] }) [18:41:21.303] } [18:41:21.303] ...future.strategy.old <- future::plan("list") [18:41:21.303] options(future.plan = NULL) [18:41:21.303] Sys.unsetenv("R_FUTURE_PLAN") [18:41:21.303] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:21.303] } [18:41:21.303] ...future.workdir <- getwd() [18:41:21.303] } [18:41:21.303] ...future.oldOptions <- base::as.list(base::.Options) [18:41:21.303] ...future.oldEnvVars <- base::Sys.getenv() [18:41:21.303] } [18:41:21.303] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:21.303] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:21.303] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:21.303] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:21.303] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:21.303] future.stdout.windows.reencode = NULL, width = 80L) [18:41:21.303] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:21.303] base::names(...future.oldOptions)) [18:41:21.303] } [18:41:21.303] if (FALSE) { [18:41:21.303] } [18:41:21.303] else { [18:41:21.303] if (TRUE) { [18:41:21.303] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:21.303] open = "w") [18:41:21.303] } [18:41:21.303] else { [18:41:21.303] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:21.303] windows = "NUL", "/dev/null"), open = "w") [18:41:21.303] } [18:41:21.303] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:21.303] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:21.303] base::sink(type = "output", split = FALSE) [18:41:21.303] base::close(...future.stdout) [18:41:21.303] }, add = TRUE) [18:41:21.303] } [18:41:21.303] ...future.frame <- base::sys.nframe() [18:41:21.303] ...future.conditions <- base::list() [18:41:21.303] ...future.rng <- base::globalenv()$.Random.seed [18:41:21.303] if (FALSE) { [18:41:21.303] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:21.303] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:21.303] } [18:41:21.303] ...future.result <- base::tryCatch({ [18:41:21.303] base::withCallingHandlers({ [18:41:21.303] ...future.value <- base::withVisible(base::local({ [18:41:21.303] do.call(function(...) { [18:41:21.303] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:21.303] if (!identical(...future.globals.maxSize.org, [18:41:21.303] ...future.globals.maxSize)) { [18:41:21.303] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:21.303] on.exit(options(oopts), add = TRUE) [18:41:21.303] } [18:41:21.303] { [18:41:21.303] lapply(seq_along(...future.elements_ii), [18:41:21.303] FUN = function(jj) { [18:41:21.303] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:21.303] ...future.FUN(...future.X_jj, ...) [18:41:21.303] }) [18:41:21.303] } [18:41:21.303] }, args = future.call.arguments) [18:41:21.303] })) [18:41:21.303] future::FutureResult(value = ...future.value$value, [18:41:21.303] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:21.303] ...future.rng), globalenv = if (FALSE) [18:41:21.303] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:21.303] ...future.globalenv.names)) [18:41:21.303] else NULL, started = ...future.startTime, version = "1.8") [18:41:21.303] }, condition = base::local({ [18:41:21.303] c <- base::c [18:41:21.303] inherits <- base::inherits [18:41:21.303] invokeRestart <- base::invokeRestart [18:41:21.303] length <- base::length [18:41:21.303] list <- base::list [18:41:21.303] seq.int <- base::seq.int [18:41:21.303] signalCondition <- base::signalCondition [18:41:21.303] sys.calls <- base::sys.calls [18:41:21.303] `[[` <- base::`[[` [18:41:21.303] `+` <- base::`+` [18:41:21.303] `<<-` <- base::`<<-` [18:41:21.303] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:21.303] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:21.303] 3L)] [18:41:21.303] } [18:41:21.303] function(cond) { [18:41:21.303] is_error <- inherits(cond, "error") [18:41:21.303] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:21.303] NULL) [18:41:21.303] if (is_error) { [18:41:21.303] sessionInformation <- function() { [18:41:21.303] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:21.303] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:21.303] search = base::search(), system = base::Sys.info()) [18:41:21.303] } [18:41:21.303] ...future.conditions[[length(...future.conditions) + [18:41:21.303] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:21.303] cond$call), session = sessionInformation(), [18:41:21.303] timestamp = base::Sys.time(), signaled = 0L) [18:41:21.303] signalCondition(cond) [18:41:21.303] } [18:41:21.303] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:21.303] "immediateCondition"))) { [18:41:21.303] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:21.303] ...future.conditions[[length(...future.conditions) + [18:41:21.303] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:21.303] if (TRUE && !signal) { [18:41:21.303] muffleCondition <- function (cond, pattern = "^muffle") [18:41:21.303] { [18:41:21.303] inherits <- base::inherits [18:41:21.303] invokeRestart <- base::invokeRestart [18:41:21.303] is.null <- base::is.null [18:41:21.303] muffled <- FALSE [18:41:21.303] if (inherits(cond, "message")) { [18:41:21.303] muffled <- grepl(pattern, "muffleMessage") [18:41:21.303] if (muffled) [18:41:21.303] invokeRestart("muffleMessage") [18:41:21.303] } [18:41:21.303] else if (inherits(cond, "warning")) { [18:41:21.303] muffled <- grepl(pattern, "muffleWarning") [18:41:21.303] if (muffled) [18:41:21.303] invokeRestart("muffleWarning") [18:41:21.303] } [18:41:21.303] else if (inherits(cond, "condition")) { [18:41:21.303] if (!is.null(pattern)) { [18:41:21.303] computeRestarts <- base::computeRestarts [18:41:21.303] grepl <- base::grepl [18:41:21.303] restarts <- computeRestarts(cond) [18:41:21.303] for (restart in restarts) { [18:41:21.303] name <- restart$name [18:41:21.303] if (is.null(name)) [18:41:21.303] next [18:41:21.303] if (!grepl(pattern, name)) [18:41:21.303] next [18:41:21.303] invokeRestart(restart) [18:41:21.303] muffled <- TRUE [18:41:21.303] break [18:41:21.303] } [18:41:21.303] } [18:41:21.303] } [18:41:21.303] invisible(muffled) [18:41:21.303] } [18:41:21.303] muffleCondition(cond, pattern = "^muffle") [18:41:21.303] } [18:41:21.303] } [18:41:21.303] else { [18:41:21.303] if (TRUE) { [18:41:21.303] muffleCondition <- function (cond, pattern = "^muffle") [18:41:21.303] { [18:41:21.303] inherits <- base::inherits [18:41:21.303] invokeRestart <- base::invokeRestart [18:41:21.303] is.null <- base::is.null [18:41:21.303] muffled <- FALSE [18:41:21.303] if (inherits(cond, "message")) { [18:41:21.303] muffled <- grepl(pattern, "muffleMessage") [18:41:21.303] if (muffled) [18:41:21.303] invokeRestart("muffleMessage") [18:41:21.303] } [18:41:21.303] else if (inherits(cond, "warning")) { [18:41:21.303] muffled <- grepl(pattern, "muffleWarning") [18:41:21.303] if (muffled) [18:41:21.303] invokeRestart("muffleWarning") [18:41:21.303] } [18:41:21.303] else if (inherits(cond, "condition")) { [18:41:21.303] if (!is.null(pattern)) { [18:41:21.303] computeRestarts <- base::computeRestarts [18:41:21.303] grepl <- base::grepl [18:41:21.303] restarts <- computeRestarts(cond) [18:41:21.303] for (restart in restarts) { [18:41:21.303] name <- restart$name [18:41:21.303] if (is.null(name)) [18:41:21.303] next [18:41:21.303] if (!grepl(pattern, name)) [18:41:21.303] next [18:41:21.303] invokeRestart(restart) [18:41:21.303] muffled <- TRUE [18:41:21.303] break [18:41:21.303] } [18:41:21.303] } [18:41:21.303] } [18:41:21.303] invisible(muffled) [18:41:21.303] } [18:41:21.303] muffleCondition(cond, pattern = "^muffle") [18:41:21.303] } [18:41:21.303] } [18:41:21.303] } [18:41:21.303] })) [18:41:21.303] }, error = function(ex) { [18:41:21.303] base::structure(base::list(value = NULL, visible = NULL, [18:41:21.303] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:21.303] ...future.rng), started = ...future.startTime, [18:41:21.303] finished = Sys.time(), session_uuid = NA_character_, [18:41:21.303] version = "1.8"), class = "FutureResult") [18:41:21.303] }, finally = { [18:41:21.303] if (!identical(...future.workdir, getwd())) [18:41:21.303] setwd(...future.workdir) [18:41:21.303] { [18:41:21.303] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:21.303] ...future.oldOptions$nwarnings <- NULL [18:41:21.303] } [18:41:21.303] base::options(...future.oldOptions) [18:41:21.303] if (.Platform$OS.type == "windows") { [18:41:21.303] old_names <- names(...future.oldEnvVars) [18:41:21.303] envs <- base::Sys.getenv() [18:41:21.303] names <- names(envs) [18:41:21.303] common <- intersect(names, old_names) [18:41:21.303] added <- setdiff(names, old_names) [18:41:21.303] removed <- setdiff(old_names, names) [18:41:21.303] changed <- common[...future.oldEnvVars[common] != [18:41:21.303] envs[common]] [18:41:21.303] NAMES <- toupper(changed) [18:41:21.303] args <- list() [18:41:21.303] for (kk in seq_along(NAMES)) { [18:41:21.303] name <- changed[[kk]] [18:41:21.303] NAME <- NAMES[[kk]] [18:41:21.303] if (name != NAME && is.element(NAME, old_names)) [18:41:21.303] next [18:41:21.303] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:21.303] } [18:41:21.303] NAMES <- toupper(added) [18:41:21.303] for (kk in seq_along(NAMES)) { [18:41:21.303] name <- added[[kk]] [18:41:21.303] NAME <- NAMES[[kk]] [18:41:21.303] if (name != NAME && is.element(NAME, old_names)) [18:41:21.303] next [18:41:21.303] args[[name]] <- "" [18:41:21.303] } [18:41:21.303] NAMES <- toupper(removed) [18:41:21.303] for (kk in seq_along(NAMES)) { [18:41:21.303] name <- removed[[kk]] [18:41:21.303] NAME <- NAMES[[kk]] [18:41:21.303] if (name != NAME && is.element(NAME, old_names)) [18:41:21.303] next [18:41:21.303] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:21.303] } [18:41:21.303] if (length(args) > 0) [18:41:21.303] base::do.call(base::Sys.setenv, args = args) [18:41:21.303] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:21.303] } [18:41:21.303] else { [18:41:21.303] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:21.303] } [18:41:21.303] { [18:41:21.303] if (base::length(...future.futureOptionsAdded) > [18:41:21.303] 0L) { [18:41:21.303] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:21.303] base::names(opts) <- ...future.futureOptionsAdded [18:41:21.303] base::options(opts) [18:41:21.303] } [18:41:21.303] { [18:41:21.303] { [18:41:21.303] NULL [18:41:21.303] RNGkind("Mersenne-Twister") [18:41:21.303] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:21.303] inherits = FALSE) [18:41:21.303] } [18:41:21.303] options(future.plan = NULL) [18:41:21.303] if (is.na(NA_character_)) [18:41:21.303] Sys.unsetenv("R_FUTURE_PLAN") [18:41:21.303] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:21.303] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:21.303] .init = FALSE) [18:41:21.303] } [18:41:21.303] } [18:41:21.303] } [18:41:21.303] }) [18:41:21.303] if (TRUE) { [18:41:21.303] base::sink(type = "output", split = FALSE) [18:41:21.303] if (TRUE) { [18:41:21.303] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:21.303] } [18:41:21.303] else { [18:41:21.303] ...future.result["stdout"] <- base::list(NULL) [18:41:21.303] } [18:41:21.303] base::close(...future.stdout) [18:41:21.303] ...future.stdout <- NULL [18:41:21.303] } [18:41:21.303] ...future.result$conditions <- ...future.conditions [18:41:21.303] ...future.result$finished <- base::Sys.time() [18:41:21.303] ...future.result [18:41:21.303] } [18:41:21.307] assign_globals() ... [18:41:21.307] List of 5 [18:41:21.307] $ ...future.FUN :function (x, ...) [18:41:21.307] $ future.call.arguments : list() [18:41:21.307] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:21.307] $ ...future.elements_ii :List of 2 [18:41:21.307] ..$ a:Classes 'listenv', 'environment' [18:41:21.307] ..$ b:Classes 'listenv', 'environment' [18:41:21.307] $ ...future.seeds_ii : NULL [18:41:21.307] $ ...future.globals.maxSize: NULL [18:41:21.307] - attr(*, "where")=List of 5 [18:41:21.307] ..$ ...future.FUN : [18:41:21.307] ..$ future.call.arguments : [18:41:21.307] ..$ ...future.elements_ii : [18:41:21.307] ..$ ...future.seeds_ii : [18:41:21.307] ..$ ...future.globals.maxSize: [18:41:21.307] - attr(*, "resolved")= logi FALSE [18:41:21.307] - attr(*, "total_size")= num 8195 [18:41:21.307] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:21.307] - attr(*, "already-done")= logi TRUE [18:41:21.313] - copied '...future.FUN' to environment [18:41:21.313] - copied 'future.call.arguments' to environment [18:41:21.313] - copied '...future.elements_ii' to environment [18:41:21.313] - copied '...future.seeds_ii' to environment [18:41:21.314] - copied '...future.globals.maxSize' to environment [18:41:21.314] assign_globals() ... done [18:41:21.314] plan(): Setting new future strategy stack: [18:41:21.315] List of future strategies: [18:41:21.315] 1. sequential: [18:41:21.315] - args: function (..., envir = parent.frame(), workers = "") [18:41:21.315] - tweaked: FALSE [18:41:21.315] - call: NULL [18:41:21.315] plan(): nbrOfWorkers() = 1 [18:41:21.316] plan(): Setting new future strategy stack: [18:41:21.317] List of future strategies: [18:41:21.317] 1. sequential: [18:41:21.317] - args: function (..., envir = parent.frame(), workers = "") [18:41:21.317] - tweaked: FALSE [18:41:21.317] - call: plan(strategy) [18:41:21.317] plan(): nbrOfWorkers() = 1 [18:41:21.318] SequentialFuture started (and completed) [18:41:21.318] - Launch lazy future ... done [18:41:21.318] run() for 'SequentialFuture' ... done [18:41:21.318] Created future: [18:41:21.318] SequentialFuture: [18:41:21.318] Label: 'future_lapply-1' [18:41:21.318] Expression: [18:41:21.318] { [18:41:21.318] do.call(function(...) { [18:41:21.318] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:21.318] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:21.318] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:21.318] on.exit(options(oopts), add = TRUE) [18:41:21.318] } [18:41:21.318] { [18:41:21.318] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:21.318] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:21.318] ...future.FUN(...future.X_jj, ...) [18:41:21.318] }) [18:41:21.318] } [18:41:21.318] }, args = future.call.arguments) [18:41:21.318] } [18:41:21.318] Lazy evaluation: FALSE [18:41:21.318] Asynchronous evaluation: FALSE [18:41:21.318] Local evaluation: TRUE [18:41:21.318] Environment: R_GlobalEnv [18:41:21.318] Capture standard output: TRUE [18:41:21.318] Capture condition classes: 'condition' (excluding 'nothing') [18:41:21.318] Globals: 5 objects totaling 4.14 KiB (function '...future.FUN' of 911 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 3.10 KiB, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:21.318] Packages: 1 packages ('listenv') [18:41:21.318] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:21.318] Resolved: TRUE [18:41:21.318] Value: 154 bytes of class 'list' [18:41:21.318] Early signaling: FALSE [18:41:21.318] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:21.318] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:21.319] Chunk #1 of 1 ... DONE [18:41:21.320] Launching 1 futures (chunks) ... DONE [18:41:21.320] Resolving 1 futures (chunks) ... [18:41:21.320] resolve() on list ... [18:41:21.320] recursive: 0 [18:41:21.320] length: 1 [18:41:21.320] [18:41:21.321] resolved() for 'SequentialFuture' ... [18:41:21.321] - state: 'finished' [18:41:21.321] - run: TRUE [18:41:21.321] - result: 'FutureResult' [18:41:21.321] resolved() for 'SequentialFuture' ... done [18:41:21.322] Future #1 [18:41:21.322] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:21.322] - nx: 1 [18:41:21.322] - relay: TRUE [18:41:21.322] - stdout: TRUE [18:41:21.322] - signal: TRUE [18:41:21.323] - resignal: FALSE [18:41:21.323] - force: TRUE [18:41:21.323] - relayed: [n=1] FALSE [18:41:21.323] - queued futures: [n=1] FALSE [18:41:21.323] - until=1 [18:41:21.323] - relaying element #1 [18:41:21.324] - relayed: [n=1] TRUE [18:41:21.324] - queued futures: [n=1] TRUE [18:41:21.324] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:21.324] length: 0 (resolved future 1) [18:41:21.324] Relaying remaining futures [18:41:21.324] signalConditionsASAP(NULL, pos=0) ... [18:41:21.325] - nx: 1 [18:41:21.325] - relay: TRUE [18:41:21.325] - stdout: TRUE [18:41:21.325] - signal: TRUE [18:41:21.325] - resignal: FALSE [18:41:21.325] - force: TRUE [18:41:21.325] - relayed: [n=1] TRUE [18:41:21.326] - queued futures: [n=1] TRUE - flush all [18:41:21.326] - relayed: [n=1] TRUE [18:41:21.326] - queued futures: [n=1] TRUE [18:41:21.326] signalConditionsASAP(NULL, pos=0) ... done [18:41:21.326] resolve() on list ... DONE [18:41:21.327] - Number of value chunks collected: 1 [18:41:21.327] Resolving 1 futures (chunks) ... DONE [18:41:21.327] Reducing values from 1 chunks ... [18:41:21.327] - Number of values collected after concatenation: 2 [18:41:21.327] - Number of values expected: 2 [18:41:21.327] Reverse index remapping (attribute 'ordering'): [n = 2] 1, 2 [18:41:21.328] Reducing values from 1 chunks ... DONE [18:41:21.328] future_lapply() ... DONE List of 1 $ y:List of 2 ..$ a: Named chr "A" .. ..- attr(*, "names")= chr "A" ..$ b: Named chr [1:2] "A" "B" .. ..- attr(*, "names")= chr [1:2] "A" "B" - future_lapply(x, FUN = vector, ...) ... [18:41:21.330] future_lapply() ... [18:41:21.331] Number of chunks: 1 [18:41:21.331] Index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [18:41:21.331] getGlobalsAndPackagesXApply() ... [18:41:21.331] - future.globals: TRUE [18:41:21.331] getGlobalsAndPackages() ... [18:41:21.332] Searching for globals... [18:41:21.333] - globals found: [2] 'FUN', '.Internal' [18:41:21.333] Searching for globals ... DONE [18:41:21.333] Resolving globals: FALSE [18:41:21.334] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:21.334] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:21.334] - globals: [1] 'FUN' [18:41:21.335] [18:41:21.335] getGlobalsAndPackages() ... DONE [18:41:21.335] - globals found/used: [n=1] 'FUN' [18:41:21.335] - needed namespaces: [n=0] [18:41:21.335] Finding globals ... DONE [18:41:21.335] - use_args: TRUE [18:41:21.336] - Getting '...' globals ... [18:41:21.336] resolve() on list ... [18:41:21.336] recursive: 0 [18:41:21.336] length: 1 [18:41:21.336] elements: '...' [18:41:21.337] length: 0 (resolved future 1) [18:41:21.337] resolve() on list ... DONE [18:41:21.337] - '...' content: [n=1] 'length' [18:41:21.337] List of 1 [18:41:21.337] $ ...:List of 1 [18:41:21.337] ..$ length: int 2 [18:41:21.337] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:21.337] - attr(*, "where")=List of 1 [18:41:21.337] ..$ ...: [18:41:21.337] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:21.337] - attr(*, "resolved")= logi TRUE [18:41:21.337] - attr(*, "total_size")= num NA [18:41:21.341] - Getting '...' globals ... DONE [18:41:21.341] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:21.341] List of 2 [18:41:21.341] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:21.341] $ ... :List of 1 [18:41:21.341] ..$ length: int 2 [18:41:21.341] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:21.341] - attr(*, "where")=List of 2 [18:41:21.341] ..$ ...future.FUN: [18:41:21.341] ..$ ... : [18:41:21.341] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:21.341] - attr(*, "resolved")= logi FALSE [18:41:21.341] - attr(*, "total_size")= int 4763 [18:41:21.345] Packages to be attached in all futures: [n=0] [18:41:21.345] getGlobalsAndPackagesXApply() ... DONE [18:41:21.345] Number of futures (= number of chunks): 1 [18:41:21.346] Launching 1 futures (chunks) ... [18:41:21.346] Chunk #1 of 1 ... [18:41:21.346] - Finding globals in 'X' for chunk #1 ... [18:41:21.346] getGlobalsAndPackages() ... [18:41:21.346] Searching for globals... [18:41:21.347] [18:41:21.347] Searching for globals ... DONE [18:41:21.347] - globals: [0] [18:41:21.347] getGlobalsAndPackages() ... DONE [18:41:21.347] + additional globals found: [n=0] [18:41:21.348] + additional namespaces needed: [n=0] [18:41:21.348] - Finding globals in 'X' for chunk #1 ... DONE [18:41:21.348] - seeds: [18:41:21.348] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:21.348] getGlobalsAndPackages() ... [18:41:21.348] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:21.348] Resolving globals: FALSE [18:41:21.349] Tweak future expression to call with '...' arguments ... [18:41:21.349] { [18:41:21.349] do.call(function(...) { [18:41:21.349] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:21.349] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:21.349] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:21.349] on.exit(options(oopts), add = TRUE) [18:41:21.349] } [18:41:21.349] { [18:41:21.349] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:21.349] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:21.349] ...future.FUN(...future.X_jj, ...) [18:41:21.349] }) [18:41:21.349] } [18:41:21.349] }, args = future.call.arguments) [18:41:21.349] } [18:41:21.349] Tweak future expression to call with '...' arguments ... DONE [18:41:21.350] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:21.350] [18:41:21.350] getGlobalsAndPackages() ... DONE [18:41:21.351] run() for 'Future' ... [18:41:21.351] - state: 'created' [18:41:21.351] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:21.351] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:21.352] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:21.352] - Field: 'label' [18:41:21.352] - Field: 'local' [18:41:21.352] - Field: 'owner' [18:41:21.352] - Field: 'envir' [18:41:21.352] - Field: 'packages' [18:41:21.353] - Field: 'gc' [18:41:21.353] - Field: 'conditions' [18:41:21.353] - Field: 'expr' [18:41:21.353] - Field: 'uuid' [18:41:21.353] - Field: 'seed' [18:41:21.353] - Field: 'version' [18:41:21.354] - Field: 'result' [18:41:21.354] - Field: 'asynchronous' [18:41:21.354] - Field: 'calls' [18:41:21.354] - Field: 'globals' [18:41:21.354] - Field: 'stdout' [18:41:21.355] - Field: 'earlySignal' [18:41:21.355] - Field: 'lazy' [18:41:21.355] - Field: 'state' [18:41:21.355] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:21.355] - Launch lazy future ... [18:41:21.356] Packages needed by the future expression (n = 0): [18:41:21.356] Packages needed by future strategies (n = 0): [18:41:21.356] { [18:41:21.356] { [18:41:21.356] { [18:41:21.356] ...future.startTime <- base::Sys.time() [18:41:21.356] { [18:41:21.356] { [18:41:21.356] { [18:41:21.356] base::local({ [18:41:21.356] has_future <- base::requireNamespace("future", [18:41:21.356] quietly = TRUE) [18:41:21.356] if (has_future) { [18:41:21.356] ns <- base::getNamespace("future") [18:41:21.356] version <- ns[[".package"]][["version"]] [18:41:21.356] if (is.null(version)) [18:41:21.356] version <- utils::packageVersion("future") [18:41:21.356] } [18:41:21.356] else { [18:41:21.356] version <- NULL [18:41:21.356] } [18:41:21.356] if (!has_future || version < "1.8.0") { [18:41:21.356] info <- base::c(r_version = base::gsub("R version ", [18:41:21.356] "", base::R.version$version.string), [18:41:21.356] platform = base::sprintf("%s (%s-bit)", [18:41:21.356] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:21.356] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:21.356] "release", "version")], collapse = " "), [18:41:21.356] hostname = base::Sys.info()[["nodename"]]) [18:41:21.356] info <- base::sprintf("%s: %s", base::names(info), [18:41:21.356] info) [18:41:21.356] info <- base::paste(info, collapse = "; ") [18:41:21.356] if (!has_future) { [18:41:21.356] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:21.356] info) [18:41:21.356] } [18:41:21.356] else { [18:41:21.356] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:21.356] info, version) [18:41:21.356] } [18:41:21.356] base::stop(msg) [18:41:21.356] } [18:41:21.356] }) [18:41:21.356] } [18:41:21.356] ...future.strategy.old <- future::plan("list") [18:41:21.356] options(future.plan = NULL) [18:41:21.356] Sys.unsetenv("R_FUTURE_PLAN") [18:41:21.356] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:21.356] } [18:41:21.356] ...future.workdir <- getwd() [18:41:21.356] } [18:41:21.356] ...future.oldOptions <- base::as.list(base::.Options) [18:41:21.356] ...future.oldEnvVars <- base::Sys.getenv() [18:41:21.356] } [18:41:21.356] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:21.356] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:21.356] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:21.356] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:21.356] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:21.356] future.stdout.windows.reencode = NULL, width = 80L) [18:41:21.356] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:21.356] base::names(...future.oldOptions)) [18:41:21.356] } [18:41:21.356] if (FALSE) { [18:41:21.356] } [18:41:21.356] else { [18:41:21.356] if (TRUE) { [18:41:21.356] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:21.356] open = "w") [18:41:21.356] } [18:41:21.356] else { [18:41:21.356] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:21.356] windows = "NUL", "/dev/null"), open = "w") [18:41:21.356] } [18:41:21.356] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:21.356] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:21.356] base::sink(type = "output", split = FALSE) [18:41:21.356] base::close(...future.stdout) [18:41:21.356] }, add = TRUE) [18:41:21.356] } [18:41:21.356] ...future.frame <- base::sys.nframe() [18:41:21.356] ...future.conditions <- base::list() [18:41:21.356] ...future.rng <- base::globalenv()$.Random.seed [18:41:21.356] if (FALSE) { [18:41:21.356] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:21.356] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:21.356] } [18:41:21.356] ...future.result <- base::tryCatch({ [18:41:21.356] base::withCallingHandlers({ [18:41:21.356] ...future.value <- base::withVisible(base::local({ [18:41:21.356] do.call(function(...) { [18:41:21.356] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:21.356] if (!identical(...future.globals.maxSize.org, [18:41:21.356] ...future.globals.maxSize)) { [18:41:21.356] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:21.356] on.exit(options(oopts), add = TRUE) [18:41:21.356] } [18:41:21.356] { [18:41:21.356] lapply(seq_along(...future.elements_ii), [18:41:21.356] FUN = function(jj) { [18:41:21.356] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:21.356] ...future.FUN(...future.X_jj, ...) [18:41:21.356] }) [18:41:21.356] } [18:41:21.356] }, args = future.call.arguments) [18:41:21.356] })) [18:41:21.356] future::FutureResult(value = ...future.value$value, [18:41:21.356] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:21.356] ...future.rng), globalenv = if (FALSE) [18:41:21.356] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:21.356] ...future.globalenv.names)) [18:41:21.356] else NULL, started = ...future.startTime, version = "1.8") [18:41:21.356] }, condition = base::local({ [18:41:21.356] c <- base::c [18:41:21.356] inherits <- base::inherits [18:41:21.356] invokeRestart <- base::invokeRestart [18:41:21.356] length <- base::length [18:41:21.356] list <- base::list [18:41:21.356] seq.int <- base::seq.int [18:41:21.356] signalCondition <- base::signalCondition [18:41:21.356] sys.calls <- base::sys.calls [18:41:21.356] `[[` <- base::`[[` [18:41:21.356] `+` <- base::`+` [18:41:21.356] `<<-` <- base::`<<-` [18:41:21.356] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:21.356] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:21.356] 3L)] [18:41:21.356] } [18:41:21.356] function(cond) { [18:41:21.356] is_error <- inherits(cond, "error") [18:41:21.356] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:21.356] NULL) [18:41:21.356] if (is_error) { [18:41:21.356] sessionInformation <- function() { [18:41:21.356] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:21.356] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:21.356] search = base::search(), system = base::Sys.info()) [18:41:21.356] } [18:41:21.356] ...future.conditions[[length(...future.conditions) + [18:41:21.356] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:21.356] cond$call), session = sessionInformation(), [18:41:21.356] timestamp = base::Sys.time(), signaled = 0L) [18:41:21.356] signalCondition(cond) [18:41:21.356] } [18:41:21.356] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:21.356] "immediateCondition"))) { [18:41:21.356] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:21.356] ...future.conditions[[length(...future.conditions) + [18:41:21.356] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:21.356] if (TRUE && !signal) { [18:41:21.356] muffleCondition <- function (cond, pattern = "^muffle") [18:41:21.356] { [18:41:21.356] inherits <- base::inherits [18:41:21.356] invokeRestart <- base::invokeRestart [18:41:21.356] is.null <- base::is.null [18:41:21.356] muffled <- FALSE [18:41:21.356] if (inherits(cond, "message")) { [18:41:21.356] muffled <- grepl(pattern, "muffleMessage") [18:41:21.356] if (muffled) [18:41:21.356] invokeRestart("muffleMessage") [18:41:21.356] } [18:41:21.356] else if (inherits(cond, "warning")) { [18:41:21.356] muffled <- grepl(pattern, "muffleWarning") [18:41:21.356] if (muffled) [18:41:21.356] invokeRestart("muffleWarning") [18:41:21.356] } [18:41:21.356] else if (inherits(cond, "condition")) { [18:41:21.356] if (!is.null(pattern)) { [18:41:21.356] computeRestarts <- base::computeRestarts [18:41:21.356] grepl <- base::grepl [18:41:21.356] restarts <- computeRestarts(cond) [18:41:21.356] for (restart in restarts) { [18:41:21.356] name <- restart$name [18:41:21.356] if (is.null(name)) [18:41:21.356] next [18:41:21.356] if (!grepl(pattern, name)) [18:41:21.356] next [18:41:21.356] invokeRestart(restart) [18:41:21.356] muffled <- TRUE [18:41:21.356] break [18:41:21.356] } [18:41:21.356] } [18:41:21.356] } [18:41:21.356] invisible(muffled) [18:41:21.356] } [18:41:21.356] muffleCondition(cond, pattern = "^muffle") [18:41:21.356] } [18:41:21.356] } [18:41:21.356] else { [18:41:21.356] if (TRUE) { [18:41:21.356] muffleCondition <- function (cond, pattern = "^muffle") [18:41:21.356] { [18:41:21.356] inherits <- base::inherits [18:41:21.356] invokeRestart <- base::invokeRestart [18:41:21.356] is.null <- base::is.null [18:41:21.356] muffled <- FALSE [18:41:21.356] if (inherits(cond, "message")) { [18:41:21.356] muffled <- grepl(pattern, "muffleMessage") [18:41:21.356] if (muffled) [18:41:21.356] invokeRestart("muffleMessage") [18:41:21.356] } [18:41:21.356] else if (inherits(cond, "warning")) { [18:41:21.356] muffled <- grepl(pattern, "muffleWarning") [18:41:21.356] if (muffled) [18:41:21.356] invokeRestart("muffleWarning") [18:41:21.356] } [18:41:21.356] else if (inherits(cond, "condition")) { [18:41:21.356] if (!is.null(pattern)) { [18:41:21.356] computeRestarts <- base::computeRestarts [18:41:21.356] grepl <- base::grepl [18:41:21.356] restarts <- computeRestarts(cond) [18:41:21.356] for (restart in restarts) { [18:41:21.356] name <- restart$name [18:41:21.356] if (is.null(name)) [18:41:21.356] next [18:41:21.356] if (!grepl(pattern, name)) [18:41:21.356] next [18:41:21.356] invokeRestart(restart) [18:41:21.356] muffled <- TRUE [18:41:21.356] break [18:41:21.356] } [18:41:21.356] } [18:41:21.356] } [18:41:21.356] invisible(muffled) [18:41:21.356] } [18:41:21.356] muffleCondition(cond, pattern = "^muffle") [18:41:21.356] } [18:41:21.356] } [18:41:21.356] } [18:41:21.356] })) [18:41:21.356] }, error = function(ex) { [18:41:21.356] base::structure(base::list(value = NULL, visible = NULL, [18:41:21.356] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:21.356] ...future.rng), started = ...future.startTime, [18:41:21.356] finished = Sys.time(), session_uuid = NA_character_, [18:41:21.356] version = "1.8"), class = "FutureResult") [18:41:21.356] }, finally = { [18:41:21.356] if (!identical(...future.workdir, getwd())) [18:41:21.356] setwd(...future.workdir) [18:41:21.356] { [18:41:21.356] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:21.356] ...future.oldOptions$nwarnings <- NULL [18:41:21.356] } [18:41:21.356] base::options(...future.oldOptions) [18:41:21.356] if (.Platform$OS.type == "windows") { [18:41:21.356] old_names <- names(...future.oldEnvVars) [18:41:21.356] envs <- base::Sys.getenv() [18:41:21.356] names <- names(envs) [18:41:21.356] common <- intersect(names, old_names) [18:41:21.356] added <- setdiff(names, old_names) [18:41:21.356] removed <- setdiff(old_names, names) [18:41:21.356] changed <- common[...future.oldEnvVars[common] != [18:41:21.356] envs[common]] [18:41:21.356] NAMES <- toupper(changed) [18:41:21.356] args <- list() [18:41:21.356] for (kk in seq_along(NAMES)) { [18:41:21.356] name <- changed[[kk]] [18:41:21.356] NAME <- NAMES[[kk]] [18:41:21.356] if (name != NAME && is.element(NAME, old_names)) [18:41:21.356] next [18:41:21.356] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:21.356] } [18:41:21.356] NAMES <- toupper(added) [18:41:21.356] for (kk in seq_along(NAMES)) { [18:41:21.356] name <- added[[kk]] [18:41:21.356] NAME <- NAMES[[kk]] [18:41:21.356] if (name != NAME && is.element(NAME, old_names)) [18:41:21.356] next [18:41:21.356] args[[name]] <- "" [18:41:21.356] } [18:41:21.356] NAMES <- toupper(removed) [18:41:21.356] for (kk in seq_along(NAMES)) { [18:41:21.356] name <- removed[[kk]] [18:41:21.356] NAME <- NAMES[[kk]] [18:41:21.356] if (name != NAME && is.element(NAME, old_names)) [18:41:21.356] next [18:41:21.356] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:21.356] } [18:41:21.356] if (length(args) > 0) [18:41:21.356] base::do.call(base::Sys.setenv, args = args) [18:41:21.356] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:21.356] } [18:41:21.356] else { [18:41:21.356] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:21.356] } [18:41:21.356] { [18:41:21.356] if (base::length(...future.futureOptionsAdded) > [18:41:21.356] 0L) { [18:41:21.356] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:21.356] base::names(opts) <- ...future.futureOptionsAdded [18:41:21.356] base::options(opts) [18:41:21.356] } [18:41:21.356] { [18:41:21.356] { [18:41:21.356] NULL [18:41:21.356] RNGkind("Mersenne-Twister") [18:41:21.356] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:21.356] inherits = FALSE) [18:41:21.356] } [18:41:21.356] options(future.plan = NULL) [18:41:21.356] if (is.na(NA_character_)) [18:41:21.356] Sys.unsetenv("R_FUTURE_PLAN") [18:41:21.356] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:21.356] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:21.356] .init = FALSE) [18:41:21.356] } [18:41:21.356] } [18:41:21.356] } [18:41:21.356] }) [18:41:21.356] if (TRUE) { [18:41:21.356] base::sink(type = "output", split = FALSE) [18:41:21.356] if (TRUE) { [18:41:21.356] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:21.356] } [18:41:21.356] else { [18:41:21.356] ...future.result["stdout"] <- base::list(NULL) [18:41:21.356] } [18:41:21.356] base::close(...future.stdout) [18:41:21.356] ...future.stdout <- NULL [18:41:21.356] } [18:41:21.356] ...future.result$conditions <- ...future.conditions [18:41:21.356] ...future.result$finished <- base::Sys.time() [18:41:21.356] ...future.result [18:41:21.356] } [18:41:21.360] assign_globals() ... [18:41:21.361] List of 5 [18:41:21.361] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:21.361] $ future.call.arguments :List of 1 [18:41:21.361] ..$ length: int 2 [18:41:21.361] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:21.361] $ ...future.elements_ii :List of 4 [18:41:21.361] ..$ c: chr "list" [18:41:21.361] ..$ c: chr "character" [18:41:21.361] ..$ b: chr "numeric" [18:41:21.361] ..$ a: chr "integer" [18:41:21.361] $ ...future.seeds_ii : NULL [18:41:21.361] $ ...future.globals.maxSize: NULL [18:41:21.361] - attr(*, "where")=List of 5 [18:41:21.361] ..$ ...future.FUN : [18:41:21.361] ..$ future.call.arguments : [18:41:21.361] ..$ ...future.elements_ii : [18:41:21.361] ..$ ...future.seeds_ii : [18:41:21.361] ..$ ...future.globals.maxSize: [18:41:21.361] - attr(*, "resolved")= logi FALSE [18:41:21.361] - attr(*, "total_size")= num 4763 [18:41:21.361] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:21.361] - attr(*, "already-done")= logi TRUE [18:41:21.368] - copied '...future.FUN' to environment [18:41:21.368] - copied 'future.call.arguments' to environment [18:41:21.369] - copied '...future.elements_ii' to environment [18:41:21.369] - copied '...future.seeds_ii' to environment [18:41:21.369] - copied '...future.globals.maxSize' to environment [18:41:21.369] assign_globals() ... done [18:41:21.369] plan(): Setting new future strategy stack: [18:41:21.370] List of future strategies: [18:41:21.370] 1. sequential: [18:41:21.370] - args: function (..., envir = parent.frame(), workers = "") [18:41:21.370] - tweaked: FALSE [18:41:21.370] - call: NULL [18:41:21.370] plan(): nbrOfWorkers() = 1 [18:41:21.372] plan(): Setting new future strategy stack: [18:41:21.372] List of future strategies: [18:41:21.372] 1. sequential: [18:41:21.372] - args: function (..., envir = parent.frame(), workers = "") [18:41:21.372] - tweaked: FALSE [18:41:21.372] - call: plan(strategy) [18:41:21.373] plan(): nbrOfWorkers() = 1 [18:41:21.373] SequentialFuture started (and completed) [18:41:21.373] - Launch lazy future ... done [18:41:21.373] run() for 'SequentialFuture' ... done [18:41:21.374] Created future: [18:41:21.374] SequentialFuture: [18:41:21.374] Label: 'future_lapply-1' [18:41:21.374] Expression: [18:41:21.374] { [18:41:21.374] do.call(function(...) { [18:41:21.374] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:21.374] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:21.374] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:21.374] on.exit(options(oopts), add = TRUE) [18:41:21.374] } [18:41:21.374] { [18:41:21.374] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:21.374] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:21.374] ...future.FUN(...future.X_jj, ...) [18:41:21.374] }) [18:41:21.374] } [18:41:21.374] }, args = future.call.arguments) [18:41:21.374] } [18:41:21.374] Lazy evaluation: FALSE [18:41:21.374] Asynchronous evaluation: FALSE [18:41:21.374] Local evaluation: TRUE [18:41:21.374] Environment: R_GlobalEnv [18:41:21.374] Capture standard output: TRUE [18:41:21.374] Capture condition classes: 'condition' (excluding 'nothing') [18:41:21.374] Globals: 5 objects totaling 853 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 191 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:21.374] Packages: [18:41:21.374] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:21.374] Resolved: TRUE [18:41:21.374] Value: 111 bytes of class 'list' [18:41:21.374] Early signaling: FALSE [18:41:21.374] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:21.374] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:21.375] Chunk #1 of 1 ... DONE [18:41:21.375] Launching 1 futures (chunks) ... DONE [18:41:21.375] Resolving 1 futures (chunks) ... [18:41:21.375] resolve() on list ... [18:41:21.376] recursive: 0 [18:41:21.376] length: 1 [18:41:21.376] [18:41:21.376] resolved() for 'SequentialFuture' ... [18:41:21.376] - state: 'finished' [18:41:21.377] - run: TRUE [18:41:21.377] - result: 'FutureResult' [18:41:21.377] resolved() for 'SequentialFuture' ... done [18:41:21.377] Future #1 [18:41:21.377] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:21.378] - nx: 1 [18:41:21.378] - relay: TRUE [18:41:21.378] - stdout: TRUE [18:41:21.378] - signal: TRUE [18:41:21.378] - resignal: FALSE [18:41:21.378] - force: TRUE [18:41:21.379] - relayed: [n=1] FALSE [18:41:21.379] - queued futures: [n=1] FALSE [18:41:21.379] - until=1 [18:41:21.379] - relaying element #1 [18:41:21.379] - relayed: [n=1] TRUE [18:41:21.380] - queued futures: [n=1] TRUE [18:41:21.380] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:21.380] length: 0 (resolved future 1) [18:41:21.380] Relaying remaining futures [18:41:21.380] signalConditionsASAP(NULL, pos=0) ... [18:41:21.381] - nx: 1 [18:41:21.381] - relay: TRUE [18:41:21.381] - stdout: TRUE [18:41:21.381] - signal: TRUE [18:41:21.381] - resignal: FALSE [18:41:21.381] - force: TRUE [18:41:21.381] - relayed: [n=1] TRUE [18:41:21.382] - queued futures: [n=1] TRUE - flush all [18:41:21.382] - relayed: [n=1] TRUE [18:41:21.382] - queued futures: [n=1] TRUE [18:41:21.382] signalConditionsASAP(NULL, pos=0) ... done [18:41:21.382] resolve() on list ... DONE [18:41:21.383] - Number of value chunks collected: 1 [18:41:21.383] Resolving 1 futures (chunks) ... DONE [18:41:21.383] Reducing values from 1 chunks ... [18:41:21.383] - Number of values collected after concatenation: 4 [18:41:21.383] - Number of values expected: 4 [18:41:21.384] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [18:41:21.384] Reducing values from 1 chunks ... DONE [18:41:21.384] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL [18:41:21.387] future_lapply() ... [18:41:21.388] Number of chunks: 1 [18:41:21.388] Index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [18:41:21.388] getGlobalsAndPackagesXApply() ... [18:41:21.388] - future.globals: TRUE [18:41:21.389] getGlobalsAndPackages() ... [18:41:21.389] Searching for globals... [18:41:21.390] - globals found: [2] 'FUN', '.Internal' [18:41:21.391] Searching for globals ... DONE [18:41:21.391] Resolving globals: FALSE [18:41:21.391] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:21.392] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:21.392] - globals: [1] 'FUN' [18:41:21.392] [18:41:21.393] getGlobalsAndPackages() ... DONE [18:41:21.393] - globals found/used: [n=1] 'FUN' [18:41:21.393] - needed namespaces: [n=0] [18:41:21.393] Finding globals ... DONE [18:41:21.393] - use_args: TRUE [18:41:21.393] - Getting '...' globals ... [18:41:21.394] resolve() on list ... [18:41:21.394] recursive: 0 [18:41:21.394] length: 1 [18:41:21.394] elements: '...' [18:41:21.395] length: 0 (resolved future 1) [18:41:21.395] resolve() on list ... DONE [18:41:21.395] - '...' content: [n=1] 'length' [18:41:21.395] List of 1 [18:41:21.395] $ ...:List of 1 [18:41:21.395] ..$ length: int 2 [18:41:21.395] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:21.395] - attr(*, "where")=List of 1 [18:41:21.395] ..$ ...: [18:41:21.395] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:21.395] - attr(*, "resolved")= logi TRUE [18:41:21.395] - attr(*, "total_size")= num NA [18:41:21.401] - Getting '...' globals ... DONE [18:41:21.401] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:21.402] List of 2 [18:41:21.402] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:21.402] $ ... :List of 1 [18:41:21.402] ..$ length: int 2 [18:41:21.402] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:21.402] - attr(*, "where")=List of 2 [18:41:21.402] ..$ ...future.FUN: [18:41:21.402] ..$ ... : [18:41:21.402] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:21.402] - attr(*, "resolved")= logi FALSE [18:41:21.402] - attr(*, "total_size")= int 4799 [18:41:21.405] Packages to be attached in all futures: [n=0] [18:41:21.405] getGlobalsAndPackagesXApply() ... DONE [18:41:21.406] Number of futures (= number of chunks): 1 [18:41:21.406] Launching 1 futures (chunks) ... [18:41:21.406] Chunk #1 of 1 ... [18:41:21.406] - Finding globals in 'X' for chunk #1 ... [18:41:21.406] getGlobalsAndPackages() ... [18:41:21.407] Searching for globals... [18:41:21.407] [18:41:21.407] Searching for globals ... DONE [18:41:21.407] - globals: [0] [18:41:21.407] getGlobalsAndPackages() ... DONE [18:41:21.407] + additional globals found: [n=0] [18:41:21.408] + additional namespaces needed: [n=0] [18:41:21.408] - Finding globals in 'X' for chunk #1 ... DONE [18:41:21.408] - seeds: [18:41:21.408] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:21.408] getGlobalsAndPackages() ... [18:41:21.408] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:21.409] Resolving globals: FALSE [18:41:21.409] Tweak future expression to call with '...' arguments ... [18:41:21.409] { [18:41:21.409] do.call(function(...) { [18:41:21.409] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:21.409] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:21.409] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:21.409] on.exit(options(oopts), add = TRUE) [18:41:21.409] } [18:41:21.409] { [18:41:21.409] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:21.409] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:21.409] ...future.FUN(...future.X_jj, ...) [18:41:21.409] }) [18:41:21.409] } [18:41:21.409] }, args = future.call.arguments) [18:41:21.409] } [18:41:21.409] Tweak future expression to call with '...' arguments ... DONE [18:41:21.410] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:21.410] [18:41:21.410] getGlobalsAndPackages() ... DONE [18:41:21.411] run() for 'Future' ... [18:41:21.411] - state: 'created' [18:41:21.411] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:21.411] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:21.412] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:21.412] - Field: 'label' [18:41:21.412] - Field: 'local' [18:41:21.412] - Field: 'owner' [18:41:21.412] - Field: 'envir' [18:41:21.413] - Field: 'packages' [18:41:21.413] - Field: 'gc' [18:41:21.413] - Field: 'conditions' [18:41:21.413] - Field: 'expr' [18:41:21.413] - Field: 'uuid' [18:41:21.413] - Field: 'seed' [18:41:21.414] - Field: 'version' [18:41:21.414] - Field: 'result' [18:41:21.414] - Field: 'asynchronous' [18:41:21.414] - Field: 'calls' [18:41:21.414] - Field: 'globals' [18:41:21.414] - Field: 'stdout' [18:41:21.415] - Field: 'earlySignal' [18:41:21.415] - Field: 'lazy' [18:41:21.415] - Field: 'state' [18:41:21.415] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:21.415] - Launch lazy future ... [18:41:21.415] Packages needed by the future expression (n = 0): [18:41:21.416] Packages needed by future strategies (n = 0): [18:41:21.416] { [18:41:21.416] { [18:41:21.416] { [18:41:21.416] ...future.startTime <- base::Sys.time() [18:41:21.416] { [18:41:21.416] { [18:41:21.416] { [18:41:21.416] base::local({ [18:41:21.416] has_future <- base::requireNamespace("future", [18:41:21.416] quietly = TRUE) [18:41:21.416] if (has_future) { [18:41:21.416] ns <- base::getNamespace("future") [18:41:21.416] version <- ns[[".package"]][["version"]] [18:41:21.416] if (is.null(version)) [18:41:21.416] version <- utils::packageVersion("future") [18:41:21.416] } [18:41:21.416] else { [18:41:21.416] version <- NULL [18:41:21.416] } [18:41:21.416] if (!has_future || version < "1.8.0") { [18:41:21.416] info <- base::c(r_version = base::gsub("R version ", [18:41:21.416] "", base::R.version$version.string), [18:41:21.416] platform = base::sprintf("%s (%s-bit)", [18:41:21.416] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:21.416] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:21.416] "release", "version")], collapse = " "), [18:41:21.416] hostname = base::Sys.info()[["nodename"]]) [18:41:21.416] info <- base::sprintf("%s: %s", base::names(info), [18:41:21.416] info) [18:41:21.416] info <- base::paste(info, collapse = "; ") [18:41:21.416] if (!has_future) { [18:41:21.416] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:21.416] info) [18:41:21.416] } [18:41:21.416] else { [18:41:21.416] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:21.416] info, version) [18:41:21.416] } [18:41:21.416] base::stop(msg) [18:41:21.416] } [18:41:21.416] }) [18:41:21.416] } [18:41:21.416] ...future.strategy.old <- future::plan("list") [18:41:21.416] options(future.plan = NULL) [18:41:21.416] Sys.unsetenv("R_FUTURE_PLAN") [18:41:21.416] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:21.416] } [18:41:21.416] ...future.workdir <- getwd() [18:41:21.416] } [18:41:21.416] ...future.oldOptions <- base::as.list(base::.Options) [18:41:21.416] ...future.oldEnvVars <- base::Sys.getenv() [18:41:21.416] } [18:41:21.416] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:21.416] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:21.416] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:21.416] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:21.416] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:21.416] future.stdout.windows.reencode = NULL, width = 80L) [18:41:21.416] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:21.416] base::names(...future.oldOptions)) [18:41:21.416] } [18:41:21.416] if (FALSE) { [18:41:21.416] } [18:41:21.416] else { [18:41:21.416] if (TRUE) { [18:41:21.416] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:21.416] open = "w") [18:41:21.416] } [18:41:21.416] else { [18:41:21.416] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:21.416] windows = "NUL", "/dev/null"), open = "w") [18:41:21.416] } [18:41:21.416] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:21.416] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:21.416] base::sink(type = "output", split = FALSE) [18:41:21.416] base::close(...future.stdout) [18:41:21.416] }, add = TRUE) [18:41:21.416] } [18:41:21.416] ...future.frame <- base::sys.nframe() [18:41:21.416] ...future.conditions <- base::list() [18:41:21.416] ...future.rng <- base::globalenv()$.Random.seed [18:41:21.416] if (FALSE) { [18:41:21.416] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:21.416] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:21.416] } [18:41:21.416] ...future.result <- base::tryCatch({ [18:41:21.416] base::withCallingHandlers({ [18:41:21.416] ...future.value <- base::withVisible(base::local({ [18:41:21.416] do.call(function(...) { [18:41:21.416] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:21.416] if (!identical(...future.globals.maxSize.org, [18:41:21.416] ...future.globals.maxSize)) { [18:41:21.416] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:21.416] on.exit(options(oopts), add = TRUE) [18:41:21.416] } [18:41:21.416] { [18:41:21.416] lapply(seq_along(...future.elements_ii), [18:41:21.416] FUN = function(jj) { [18:41:21.416] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:21.416] ...future.FUN(...future.X_jj, ...) [18:41:21.416] }) [18:41:21.416] } [18:41:21.416] }, args = future.call.arguments) [18:41:21.416] })) [18:41:21.416] future::FutureResult(value = ...future.value$value, [18:41:21.416] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:21.416] ...future.rng), globalenv = if (FALSE) [18:41:21.416] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:21.416] ...future.globalenv.names)) [18:41:21.416] else NULL, started = ...future.startTime, version = "1.8") [18:41:21.416] }, condition = base::local({ [18:41:21.416] c <- base::c [18:41:21.416] inherits <- base::inherits [18:41:21.416] invokeRestart <- base::invokeRestart [18:41:21.416] length <- base::length [18:41:21.416] list <- base::list [18:41:21.416] seq.int <- base::seq.int [18:41:21.416] signalCondition <- base::signalCondition [18:41:21.416] sys.calls <- base::sys.calls [18:41:21.416] `[[` <- base::`[[` [18:41:21.416] `+` <- base::`+` [18:41:21.416] `<<-` <- base::`<<-` [18:41:21.416] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:21.416] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:21.416] 3L)] [18:41:21.416] } [18:41:21.416] function(cond) { [18:41:21.416] is_error <- inherits(cond, "error") [18:41:21.416] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:21.416] NULL) [18:41:21.416] if (is_error) { [18:41:21.416] sessionInformation <- function() { [18:41:21.416] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:21.416] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:21.416] search = base::search(), system = base::Sys.info()) [18:41:21.416] } [18:41:21.416] ...future.conditions[[length(...future.conditions) + [18:41:21.416] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:21.416] cond$call), session = sessionInformation(), [18:41:21.416] timestamp = base::Sys.time(), signaled = 0L) [18:41:21.416] signalCondition(cond) [18:41:21.416] } [18:41:21.416] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:21.416] "immediateCondition"))) { [18:41:21.416] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:21.416] ...future.conditions[[length(...future.conditions) + [18:41:21.416] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:21.416] if (TRUE && !signal) { [18:41:21.416] muffleCondition <- function (cond, pattern = "^muffle") [18:41:21.416] { [18:41:21.416] inherits <- base::inherits [18:41:21.416] invokeRestart <- base::invokeRestart [18:41:21.416] is.null <- base::is.null [18:41:21.416] muffled <- FALSE [18:41:21.416] if (inherits(cond, "message")) { [18:41:21.416] muffled <- grepl(pattern, "muffleMessage") [18:41:21.416] if (muffled) [18:41:21.416] invokeRestart("muffleMessage") [18:41:21.416] } [18:41:21.416] else if (inherits(cond, "warning")) { [18:41:21.416] muffled <- grepl(pattern, "muffleWarning") [18:41:21.416] if (muffled) [18:41:21.416] invokeRestart("muffleWarning") [18:41:21.416] } [18:41:21.416] else if (inherits(cond, "condition")) { [18:41:21.416] if (!is.null(pattern)) { [18:41:21.416] computeRestarts <- base::computeRestarts [18:41:21.416] grepl <- base::grepl [18:41:21.416] restarts <- computeRestarts(cond) [18:41:21.416] for (restart in restarts) { [18:41:21.416] name <- restart$name [18:41:21.416] if (is.null(name)) [18:41:21.416] next [18:41:21.416] if (!grepl(pattern, name)) [18:41:21.416] next [18:41:21.416] invokeRestart(restart) [18:41:21.416] muffled <- TRUE [18:41:21.416] break [18:41:21.416] } [18:41:21.416] } [18:41:21.416] } [18:41:21.416] invisible(muffled) [18:41:21.416] } [18:41:21.416] muffleCondition(cond, pattern = "^muffle") [18:41:21.416] } [18:41:21.416] } [18:41:21.416] else { [18:41:21.416] if (TRUE) { [18:41:21.416] muffleCondition <- function (cond, pattern = "^muffle") [18:41:21.416] { [18:41:21.416] inherits <- base::inherits [18:41:21.416] invokeRestart <- base::invokeRestart [18:41:21.416] is.null <- base::is.null [18:41:21.416] muffled <- FALSE [18:41:21.416] if (inherits(cond, "message")) { [18:41:21.416] muffled <- grepl(pattern, "muffleMessage") [18:41:21.416] if (muffled) [18:41:21.416] invokeRestart("muffleMessage") [18:41:21.416] } [18:41:21.416] else if (inherits(cond, "warning")) { [18:41:21.416] muffled <- grepl(pattern, "muffleWarning") [18:41:21.416] if (muffled) [18:41:21.416] invokeRestart("muffleWarning") [18:41:21.416] } [18:41:21.416] else if (inherits(cond, "condition")) { [18:41:21.416] if (!is.null(pattern)) { [18:41:21.416] computeRestarts <- base::computeRestarts [18:41:21.416] grepl <- base::grepl [18:41:21.416] restarts <- computeRestarts(cond) [18:41:21.416] for (restart in restarts) { [18:41:21.416] name <- restart$name [18:41:21.416] if (is.null(name)) [18:41:21.416] next [18:41:21.416] if (!grepl(pattern, name)) [18:41:21.416] next [18:41:21.416] invokeRestart(restart) [18:41:21.416] muffled <- TRUE [18:41:21.416] break [18:41:21.416] } [18:41:21.416] } [18:41:21.416] } [18:41:21.416] invisible(muffled) [18:41:21.416] } [18:41:21.416] muffleCondition(cond, pattern = "^muffle") [18:41:21.416] } [18:41:21.416] } [18:41:21.416] } [18:41:21.416] })) [18:41:21.416] }, error = function(ex) { [18:41:21.416] base::structure(base::list(value = NULL, visible = NULL, [18:41:21.416] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:21.416] ...future.rng), started = ...future.startTime, [18:41:21.416] finished = Sys.time(), session_uuid = NA_character_, [18:41:21.416] version = "1.8"), class = "FutureResult") [18:41:21.416] }, finally = { [18:41:21.416] if (!identical(...future.workdir, getwd())) [18:41:21.416] setwd(...future.workdir) [18:41:21.416] { [18:41:21.416] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:21.416] ...future.oldOptions$nwarnings <- NULL [18:41:21.416] } [18:41:21.416] base::options(...future.oldOptions) [18:41:21.416] if (.Platform$OS.type == "windows") { [18:41:21.416] old_names <- names(...future.oldEnvVars) [18:41:21.416] envs <- base::Sys.getenv() [18:41:21.416] names <- names(envs) [18:41:21.416] common <- intersect(names, old_names) [18:41:21.416] added <- setdiff(names, old_names) [18:41:21.416] removed <- setdiff(old_names, names) [18:41:21.416] changed <- common[...future.oldEnvVars[common] != [18:41:21.416] envs[common]] [18:41:21.416] NAMES <- toupper(changed) [18:41:21.416] args <- list() [18:41:21.416] for (kk in seq_along(NAMES)) { [18:41:21.416] name <- changed[[kk]] [18:41:21.416] NAME <- NAMES[[kk]] [18:41:21.416] if (name != NAME && is.element(NAME, old_names)) [18:41:21.416] next [18:41:21.416] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:21.416] } [18:41:21.416] NAMES <- toupper(added) [18:41:21.416] for (kk in seq_along(NAMES)) { [18:41:21.416] name <- added[[kk]] [18:41:21.416] NAME <- NAMES[[kk]] [18:41:21.416] if (name != NAME && is.element(NAME, old_names)) [18:41:21.416] next [18:41:21.416] args[[name]] <- "" [18:41:21.416] } [18:41:21.416] NAMES <- toupper(removed) [18:41:21.416] for (kk in seq_along(NAMES)) { [18:41:21.416] name <- removed[[kk]] [18:41:21.416] NAME <- NAMES[[kk]] [18:41:21.416] if (name != NAME && is.element(NAME, old_names)) [18:41:21.416] next [18:41:21.416] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:21.416] } [18:41:21.416] if (length(args) > 0) [18:41:21.416] base::do.call(base::Sys.setenv, args = args) [18:41:21.416] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:21.416] } [18:41:21.416] else { [18:41:21.416] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:21.416] } [18:41:21.416] { [18:41:21.416] if (base::length(...future.futureOptionsAdded) > [18:41:21.416] 0L) { [18:41:21.416] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:21.416] base::names(opts) <- ...future.futureOptionsAdded [18:41:21.416] base::options(opts) [18:41:21.416] } [18:41:21.416] { [18:41:21.416] { [18:41:21.416] NULL [18:41:21.416] RNGkind("Mersenne-Twister") [18:41:21.416] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:21.416] inherits = FALSE) [18:41:21.416] } [18:41:21.416] options(future.plan = NULL) [18:41:21.416] if (is.na(NA_character_)) [18:41:21.416] Sys.unsetenv("R_FUTURE_PLAN") [18:41:21.416] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:21.416] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:21.416] .init = FALSE) [18:41:21.416] } [18:41:21.416] } [18:41:21.416] } [18:41:21.416] }) [18:41:21.416] if (TRUE) { [18:41:21.416] base::sink(type = "output", split = FALSE) [18:41:21.416] if (TRUE) { [18:41:21.416] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:21.416] } [18:41:21.416] else { [18:41:21.416] ...future.result["stdout"] <- base::list(NULL) [18:41:21.416] } [18:41:21.416] base::close(...future.stdout) [18:41:21.416] ...future.stdout <- NULL [18:41:21.416] } [18:41:21.416] ...future.result$conditions <- ...future.conditions [18:41:21.416] ...future.result$finished <- base::Sys.time() [18:41:21.416] ...future.result [18:41:21.416] } [18:41:21.420] assign_globals() ... [18:41:21.420] List of 5 [18:41:21.420] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:21.420] $ future.call.arguments :List of 1 [18:41:21.420] ..$ length: int 2 [18:41:21.420] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:21.420] $ ...future.elements_ii :List of 4 [18:41:21.420] ..$ c: chr "list" [18:41:21.420] ..$ c: chr "character" [18:41:21.420] ..$ b: chr "numeric" [18:41:21.420] ..$ a: chr "integer" [18:41:21.420] $ ...future.seeds_ii : NULL [18:41:21.420] $ ...future.globals.maxSize: NULL [18:41:21.420] - attr(*, "where")=List of 5 [18:41:21.420] ..$ ...future.FUN : [18:41:21.420] ..$ future.call.arguments : [18:41:21.420] ..$ ...future.elements_ii : [18:41:21.420] ..$ ...future.seeds_ii : [18:41:21.420] ..$ ...future.globals.maxSize: [18:41:21.420] - attr(*, "resolved")= logi FALSE [18:41:21.420] - attr(*, "total_size")= num 4799 [18:41:21.420] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:21.420] - attr(*, "already-done")= logi TRUE [18:41:21.427] - copied '...future.FUN' to environment [18:41:21.428] - copied 'future.call.arguments' to environment [18:41:21.428] - copied '...future.elements_ii' to environment [18:41:21.428] - copied '...future.seeds_ii' to environment [18:41:21.428] - copied '...future.globals.maxSize' to environment [18:41:21.428] assign_globals() ... done [18:41:21.429] plan(): Setting new future strategy stack: [18:41:21.429] List of future strategies: [18:41:21.429] 1. sequential: [18:41:21.429] - args: function (..., envir = parent.frame(), workers = "") [18:41:21.429] - tweaked: FALSE [18:41:21.429] - call: NULL [18:41:21.429] plan(): nbrOfWorkers() = 1 [18:41:21.431] plan(): Setting new future strategy stack: [18:41:21.431] List of future strategies: [18:41:21.431] 1. sequential: [18:41:21.431] - args: function (..., envir = parent.frame(), workers = "") [18:41:21.431] - tweaked: FALSE [18:41:21.431] - call: plan(strategy) [18:41:21.431] plan(): nbrOfWorkers() = 1 [18:41:21.432] SequentialFuture started (and completed) [18:41:21.432] - Launch lazy future ... done [18:41:21.432] run() for 'SequentialFuture' ... done [18:41:21.432] Created future: [18:41:21.432] SequentialFuture: [18:41:21.432] Label: 'future_lapply-1' [18:41:21.432] Expression: [18:41:21.432] { [18:41:21.432] do.call(function(...) { [18:41:21.432] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:21.432] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:21.432] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:21.432] on.exit(options(oopts), add = TRUE) [18:41:21.432] } [18:41:21.432] { [18:41:21.432] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:21.432] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:21.432] ...future.FUN(...future.X_jj, ...) [18:41:21.432] }) [18:41:21.432] } [18:41:21.432] }, args = future.call.arguments) [18:41:21.432] } [18:41:21.432] Lazy evaluation: FALSE [18:41:21.432] Asynchronous evaluation: FALSE [18:41:21.432] Local evaluation: TRUE [18:41:21.432] Environment: R_GlobalEnv [18:41:21.432] Capture standard output: TRUE [18:41:21.432] Capture condition classes: 'condition' (excluding 'nothing') [18:41:21.432] Globals: 5 objects totaling 853 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 191 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:21.432] Packages: [18:41:21.432] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:21.432] Resolved: TRUE [18:41:21.432] Value: 111 bytes of class 'list' [18:41:21.432] Early signaling: FALSE [18:41:21.432] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:21.432] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:21.434] Chunk #1 of 1 ... DONE [18:41:21.434] Launching 1 futures (chunks) ... DONE [18:41:21.434] Resolving 1 futures (chunks) ... [18:41:21.434] resolve() on list ... [18:41:21.434] recursive: 0 [18:41:21.434] length: 1 [18:41:21.435] [18:41:21.435] resolved() for 'SequentialFuture' ... [18:41:21.435] - state: 'finished' [18:41:21.435] - run: TRUE [18:41:21.435] - result: 'FutureResult' [18:41:21.435] resolved() for 'SequentialFuture' ... done [18:41:21.436] Future #1 [18:41:21.436] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:21.436] - nx: 1 [18:41:21.436] - relay: TRUE [18:41:21.436] - stdout: TRUE [18:41:21.437] - signal: TRUE [18:41:21.437] - resignal: FALSE [18:41:21.437] - force: TRUE [18:41:21.437] - relayed: [n=1] FALSE [18:41:21.437] - queued futures: [n=1] FALSE [18:41:21.437] - until=1 [18:41:21.437] - relaying element #1 [18:41:21.438] - relayed: [n=1] TRUE [18:41:21.438] - queued futures: [n=1] TRUE [18:41:21.438] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:21.438] length: 0 (resolved future 1) [18:41:21.438] Relaying remaining futures [18:41:21.439] signalConditionsASAP(NULL, pos=0) ... [18:41:21.439] - nx: 1 [18:41:21.439] - relay: TRUE [18:41:21.439] - stdout: TRUE [18:41:21.439] - signal: TRUE [18:41:21.439] - resignal: FALSE [18:41:21.440] - force: TRUE [18:41:21.440] - relayed: [n=1] TRUE [18:41:21.440] - queued futures: [n=1] TRUE - flush all [18:41:21.440] - relayed: [n=1] TRUE [18:41:21.440] - queued futures: [n=1] TRUE [18:41:21.440] signalConditionsASAP(NULL, pos=0) ... done [18:41:21.441] resolve() on list ... DONE [18:41:21.441] - Number of value chunks collected: 1 [18:41:21.441] Resolving 1 futures (chunks) ... DONE [18:41:21.441] Reducing values from 1 chunks ... [18:41:21.441] - Number of values collected after concatenation: 4 [18:41:21.441] - Number of values expected: 4 [18:41:21.442] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [18:41:21.442] Reducing values from 1 chunks ... DONE [18:41:21.442] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL - future_lapply(x, FUN = base::vector, ...) ... [18:41:21.445] future_lapply() ... [18:41:21.446] Number of chunks: 1 [18:41:21.446] Index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [18:41:21.446] getGlobalsAndPackagesXApply() ... [18:41:21.446] - future.globals: TRUE [18:41:21.446] getGlobalsAndPackages() ... [18:41:21.446] Searching for globals... [18:41:21.448] - globals found: [2] 'FUN', '.Internal' [18:41:21.448] Searching for globals ... DONE [18:41:21.448] Resolving globals: FALSE [18:41:21.449] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:21.449] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:21.449] - globals: [1] 'FUN' [18:41:21.449] [18:41:21.450] getGlobalsAndPackages() ... DONE [18:41:21.450] - globals found/used: [n=1] 'FUN' [18:41:21.450] - needed namespaces: [n=0] [18:41:21.450] Finding globals ... DONE [18:41:21.450] - use_args: TRUE [18:41:21.450] - Getting '...' globals ... [18:41:21.451] resolve() on list ... [18:41:21.451] recursive: 0 [18:41:21.451] length: 1 [18:41:21.451] elements: '...' [18:41:21.452] length: 0 (resolved future 1) [18:41:21.452] resolve() on list ... DONE [18:41:21.452] - '...' content: [n=1] 'length' [18:41:21.452] List of 1 [18:41:21.452] $ ...:List of 1 [18:41:21.452] ..$ length: int 2 [18:41:21.452] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:21.452] - attr(*, "where")=List of 1 [18:41:21.452] ..$ ...: [18:41:21.452] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:21.452] - attr(*, "resolved")= logi TRUE [18:41:21.452] - attr(*, "total_size")= num NA [18:41:21.455] - Getting '...' globals ... DONE [18:41:21.456] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:21.456] List of 2 [18:41:21.456] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:21.456] $ ... :List of 1 [18:41:21.456] ..$ length: int 2 [18:41:21.456] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:21.456] - attr(*, "where")=List of 2 [18:41:21.456] ..$ ...future.FUN: [18:41:21.456] ..$ ... : [18:41:21.456] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:21.456] - attr(*, "resolved")= logi FALSE [18:41:21.456] - attr(*, "total_size")= int 4881 [18:41:21.460] Packages to be attached in all futures: [n=0] [18:41:21.460] getGlobalsAndPackagesXApply() ... DONE [18:41:21.460] Number of futures (= number of chunks): 1 [18:41:21.460] Launching 1 futures (chunks) ... [18:41:21.460] Chunk #1 of 1 ... [18:41:21.461] - Finding globals in 'X' for chunk #1 ... [18:41:21.461] getGlobalsAndPackages() ... [18:41:21.461] Searching for globals... [18:41:21.461] [18:41:21.461] Searching for globals ... DONE [18:41:21.461] - globals: [0] [18:41:21.462] getGlobalsAndPackages() ... DONE [18:41:21.462] + additional globals found: [n=0] [18:41:21.462] + additional namespaces needed: [n=0] [18:41:21.462] - Finding globals in 'X' for chunk #1 ... DONE [18:41:21.462] - seeds: [18:41:21.462] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:21.463] getGlobalsAndPackages() ... [18:41:21.463] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:21.463] Resolving globals: FALSE [18:41:21.463] Tweak future expression to call with '...' arguments ... [18:41:21.463] { [18:41:21.463] do.call(function(...) { [18:41:21.463] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:21.463] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:21.463] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:21.463] on.exit(options(oopts), add = TRUE) [18:41:21.463] } [18:41:21.463] { [18:41:21.463] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:21.463] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:21.463] ...future.FUN(...future.X_jj, ...) [18:41:21.463] }) [18:41:21.463] } [18:41:21.463] }, args = future.call.arguments) [18:41:21.463] } [18:41:21.464] Tweak future expression to call with '...' arguments ... DONE [18:41:21.464] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:21.464] [18:41:21.465] getGlobalsAndPackages() ... DONE [18:41:21.465] run() for 'Future' ... [18:41:21.465] - state: 'created' [18:41:21.465] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:21.466] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:21.466] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:21.466] - Field: 'label' [18:41:21.466] - Field: 'local' [18:41:21.466] - Field: 'owner' [18:41:21.467] - Field: 'envir' [18:41:21.467] - Field: 'packages' [18:41:21.467] - Field: 'gc' [18:41:21.467] - Field: 'conditions' [18:41:21.467] - Field: 'expr' [18:41:21.467] - Field: 'uuid' [18:41:21.468] - Field: 'seed' [18:41:21.468] - Field: 'version' [18:41:21.468] - Field: 'result' [18:41:21.468] - Field: 'asynchronous' [18:41:21.468] - Field: 'calls' [18:41:21.468] - Field: 'globals' [18:41:21.469] - Field: 'stdout' [18:41:21.469] - Field: 'earlySignal' [18:41:21.469] - Field: 'lazy' [18:41:21.469] - Field: 'state' [18:41:21.469] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:21.469] - Launch lazy future ... [18:41:21.470] Packages needed by the future expression (n = 0): [18:41:21.470] Packages needed by future strategies (n = 0): [18:41:21.471] { [18:41:21.471] { [18:41:21.471] { [18:41:21.471] ...future.startTime <- base::Sys.time() [18:41:21.471] { [18:41:21.471] { [18:41:21.471] { [18:41:21.471] base::local({ [18:41:21.471] has_future <- base::requireNamespace("future", [18:41:21.471] quietly = TRUE) [18:41:21.471] if (has_future) { [18:41:21.471] ns <- base::getNamespace("future") [18:41:21.471] version <- ns[[".package"]][["version"]] [18:41:21.471] if (is.null(version)) [18:41:21.471] version <- utils::packageVersion("future") [18:41:21.471] } [18:41:21.471] else { [18:41:21.471] version <- NULL [18:41:21.471] } [18:41:21.471] if (!has_future || version < "1.8.0") { [18:41:21.471] info <- base::c(r_version = base::gsub("R version ", [18:41:21.471] "", base::R.version$version.string), [18:41:21.471] platform = base::sprintf("%s (%s-bit)", [18:41:21.471] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:21.471] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:21.471] "release", "version")], collapse = " "), [18:41:21.471] hostname = base::Sys.info()[["nodename"]]) [18:41:21.471] info <- base::sprintf("%s: %s", base::names(info), [18:41:21.471] info) [18:41:21.471] info <- base::paste(info, collapse = "; ") [18:41:21.471] if (!has_future) { [18:41:21.471] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:21.471] info) [18:41:21.471] } [18:41:21.471] else { [18:41:21.471] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:21.471] info, version) [18:41:21.471] } [18:41:21.471] base::stop(msg) [18:41:21.471] } [18:41:21.471] }) [18:41:21.471] } [18:41:21.471] ...future.strategy.old <- future::plan("list") [18:41:21.471] options(future.plan = NULL) [18:41:21.471] Sys.unsetenv("R_FUTURE_PLAN") [18:41:21.471] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:21.471] } [18:41:21.471] ...future.workdir <- getwd() [18:41:21.471] } [18:41:21.471] ...future.oldOptions <- base::as.list(base::.Options) [18:41:21.471] ...future.oldEnvVars <- base::Sys.getenv() [18:41:21.471] } [18:41:21.471] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:21.471] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:21.471] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:21.471] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:21.471] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:21.471] future.stdout.windows.reencode = NULL, width = 80L) [18:41:21.471] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:21.471] base::names(...future.oldOptions)) [18:41:21.471] } [18:41:21.471] if (FALSE) { [18:41:21.471] } [18:41:21.471] else { [18:41:21.471] if (TRUE) { [18:41:21.471] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:21.471] open = "w") [18:41:21.471] } [18:41:21.471] else { [18:41:21.471] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:21.471] windows = "NUL", "/dev/null"), open = "w") [18:41:21.471] } [18:41:21.471] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:21.471] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:21.471] base::sink(type = "output", split = FALSE) [18:41:21.471] base::close(...future.stdout) [18:41:21.471] }, add = TRUE) [18:41:21.471] } [18:41:21.471] ...future.frame <- base::sys.nframe() [18:41:21.471] ...future.conditions <- base::list() [18:41:21.471] ...future.rng <- base::globalenv()$.Random.seed [18:41:21.471] if (FALSE) { [18:41:21.471] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:21.471] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:21.471] } [18:41:21.471] ...future.result <- base::tryCatch({ [18:41:21.471] base::withCallingHandlers({ [18:41:21.471] ...future.value <- base::withVisible(base::local({ [18:41:21.471] do.call(function(...) { [18:41:21.471] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:21.471] if (!identical(...future.globals.maxSize.org, [18:41:21.471] ...future.globals.maxSize)) { [18:41:21.471] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:21.471] on.exit(options(oopts), add = TRUE) [18:41:21.471] } [18:41:21.471] { [18:41:21.471] lapply(seq_along(...future.elements_ii), [18:41:21.471] FUN = function(jj) { [18:41:21.471] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:21.471] ...future.FUN(...future.X_jj, ...) [18:41:21.471] }) [18:41:21.471] } [18:41:21.471] }, args = future.call.arguments) [18:41:21.471] })) [18:41:21.471] future::FutureResult(value = ...future.value$value, [18:41:21.471] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:21.471] ...future.rng), globalenv = if (FALSE) [18:41:21.471] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:21.471] ...future.globalenv.names)) [18:41:21.471] else NULL, started = ...future.startTime, version = "1.8") [18:41:21.471] }, condition = base::local({ [18:41:21.471] c <- base::c [18:41:21.471] inherits <- base::inherits [18:41:21.471] invokeRestart <- base::invokeRestart [18:41:21.471] length <- base::length [18:41:21.471] list <- base::list [18:41:21.471] seq.int <- base::seq.int [18:41:21.471] signalCondition <- base::signalCondition [18:41:21.471] sys.calls <- base::sys.calls [18:41:21.471] `[[` <- base::`[[` [18:41:21.471] `+` <- base::`+` [18:41:21.471] `<<-` <- base::`<<-` [18:41:21.471] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:21.471] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:21.471] 3L)] [18:41:21.471] } [18:41:21.471] function(cond) { [18:41:21.471] is_error <- inherits(cond, "error") [18:41:21.471] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:21.471] NULL) [18:41:21.471] if (is_error) { [18:41:21.471] sessionInformation <- function() { [18:41:21.471] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:21.471] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:21.471] search = base::search(), system = base::Sys.info()) [18:41:21.471] } [18:41:21.471] ...future.conditions[[length(...future.conditions) + [18:41:21.471] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:21.471] cond$call), session = sessionInformation(), [18:41:21.471] timestamp = base::Sys.time(), signaled = 0L) [18:41:21.471] signalCondition(cond) [18:41:21.471] } [18:41:21.471] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:21.471] "immediateCondition"))) { [18:41:21.471] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:21.471] ...future.conditions[[length(...future.conditions) + [18:41:21.471] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:21.471] if (TRUE && !signal) { [18:41:21.471] muffleCondition <- function (cond, pattern = "^muffle") [18:41:21.471] { [18:41:21.471] inherits <- base::inherits [18:41:21.471] invokeRestart <- base::invokeRestart [18:41:21.471] is.null <- base::is.null [18:41:21.471] muffled <- FALSE [18:41:21.471] if (inherits(cond, "message")) { [18:41:21.471] muffled <- grepl(pattern, "muffleMessage") [18:41:21.471] if (muffled) [18:41:21.471] invokeRestart("muffleMessage") [18:41:21.471] } [18:41:21.471] else if (inherits(cond, "warning")) { [18:41:21.471] muffled <- grepl(pattern, "muffleWarning") [18:41:21.471] if (muffled) [18:41:21.471] invokeRestart("muffleWarning") [18:41:21.471] } [18:41:21.471] else if (inherits(cond, "condition")) { [18:41:21.471] if (!is.null(pattern)) { [18:41:21.471] computeRestarts <- base::computeRestarts [18:41:21.471] grepl <- base::grepl [18:41:21.471] restarts <- computeRestarts(cond) [18:41:21.471] for (restart in restarts) { [18:41:21.471] name <- restart$name [18:41:21.471] if (is.null(name)) [18:41:21.471] next [18:41:21.471] if (!grepl(pattern, name)) [18:41:21.471] next [18:41:21.471] invokeRestart(restart) [18:41:21.471] muffled <- TRUE [18:41:21.471] break [18:41:21.471] } [18:41:21.471] } [18:41:21.471] } [18:41:21.471] invisible(muffled) [18:41:21.471] } [18:41:21.471] muffleCondition(cond, pattern = "^muffle") [18:41:21.471] } [18:41:21.471] } [18:41:21.471] else { [18:41:21.471] if (TRUE) { [18:41:21.471] muffleCondition <- function (cond, pattern = "^muffle") [18:41:21.471] { [18:41:21.471] inherits <- base::inherits [18:41:21.471] invokeRestart <- base::invokeRestart [18:41:21.471] is.null <- base::is.null [18:41:21.471] muffled <- FALSE [18:41:21.471] if (inherits(cond, "message")) { [18:41:21.471] muffled <- grepl(pattern, "muffleMessage") [18:41:21.471] if (muffled) [18:41:21.471] invokeRestart("muffleMessage") [18:41:21.471] } [18:41:21.471] else if (inherits(cond, "warning")) { [18:41:21.471] muffled <- grepl(pattern, "muffleWarning") [18:41:21.471] if (muffled) [18:41:21.471] invokeRestart("muffleWarning") [18:41:21.471] } [18:41:21.471] else if (inherits(cond, "condition")) { [18:41:21.471] if (!is.null(pattern)) { [18:41:21.471] computeRestarts <- base::computeRestarts [18:41:21.471] grepl <- base::grepl [18:41:21.471] restarts <- computeRestarts(cond) [18:41:21.471] for (restart in restarts) { [18:41:21.471] name <- restart$name [18:41:21.471] if (is.null(name)) [18:41:21.471] next [18:41:21.471] if (!grepl(pattern, name)) [18:41:21.471] next [18:41:21.471] invokeRestart(restart) [18:41:21.471] muffled <- TRUE [18:41:21.471] break [18:41:21.471] } [18:41:21.471] } [18:41:21.471] } [18:41:21.471] invisible(muffled) [18:41:21.471] } [18:41:21.471] muffleCondition(cond, pattern = "^muffle") [18:41:21.471] } [18:41:21.471] } [18:41:21.471] } [18:41:21.471] })) [18:41:21.471] }, error = function(ex) { [18:41:21.471] base::structure(base::list(value = NULL, visible = NULL, [18:41:21.471] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:21.471] ...future.rng), started = ...future.startTime, [18:41:21.471] finished = Sys.time(), session_uuid = NA_character_, [18:41:21.471] version = "1.8"), class = "FutureResult") [18:41:21.471] }, finally = { [18:41:21.471] if (!identical(...future.workdir, getwd())) [18:41:21.471] setwd(...future.workdir) [18:41:21.471] { [18:41:21.471] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:21.471] ...future.oldOptions$nwarnings <- NULL [18:41:21.471] } [18:41:21.471] base::options(...future.oldOptions) [18:41:21.471] if (.Platform$OS.type == "windows") { [18:41:21.471] old_names <- names(...future.oldEnvVars) [18:41:21.471] envs <- base::Sys.getenv() [18:41:21.471] names <- names(envs) [18:41:21.471] common <- intersect(names, old_names) [18:41:21.471] added <- setdiff(names, old_names) [18:41:21.471] removed <- setdiff(old_names, names) [18:41:21.471] changed <- common[...future.oldEnvVars[common] != [18:41:21.471] envs[common]] [18:41:21.471] NAMES <- toupper(changed) [18:41:21.471] args <- list() [18:41:21.471] for (kk in seq_along(NAMES)) { [18:41:21.471] name <- changed[[kk]] [18:41:21.471] NAME <- NAMES[[kk]] [18:41:21.471] if (name != NAME && is.element(NAME, old_names)) [18:41:21.471] next [18:41:21.471] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:21.471] } [18:41:21.471] NAMES <- toupper(added) [18:41:21.471] for (kk in seq_along(NAMES)) { [18:41:21.471] name <- added[[kk]] [18:41:21.471] NAME <- NAMES[[kk]] [18:41:21.471] if (name != NAME && is.element(NAME, old_names)) [18:41:21.471] next [18:41:21.471] args[[name]] <- "" [18:41:21.471] } [18:41:21.471] NAMES <- toupper(removed) [18:41:21.471] for (kk in seq_along(NAMES)) { [18:41:21.471] name <- removed[[kk]] [18:41:21.471] NAME <- NAMES[[kk]] [18:41:21.471] if (name != NAME && is.element(NAME, old_names)) [18:41:21.471] next [18:41:21.471] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:21.471] } [18:41:21.471] if (length(args) > 0) [18:41:21.471] base::do.call(base::Sys.setenv, args = args) [18:41:21.471] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:21.471] } [18:41:21.471] else { [18:41:21.471] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:21.471] } [18:41:21.471] { [18:41:21.471] if (base::length(...future.futureOptionsAdded) > [18:41:21.471] 0L) { [18:41:21.471] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:21.471] base::names(opts) <- ...future.futureOptionsAdded [18:41:21.471] base::options(opts) [18:41:21.471] } [18:41:21.471] { [18:41:21.471] { [18:41:21.471] NULL [18:41:21.471] RNGkind("Mersenne-Twister") [18:41:21.471] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:21.471] inherits = FALSE) [18:41:21.471] } [18:41:21.471] options(future.plan = NULL) [18:41:21.471] if (is.na(NA_character_)) [18:41:21.471] Sys.unsetenv("R_FUTURE_PLAN") [18:41:21.471] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:21.471] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:21.471] .init = FALSE) [18:41:21.471] } [18:41:21.471] } [18:41:21.471] } [18:41:21.471] }) [18:41:21.471] if (TRUE) { [18:41:21.471] base::sink(type = "output", split = FALSE) [18:41:21.471] if (TRUE) { [18:41:21.471] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:21.471] } [18:41:21.471] else { [18:41:21.471] ...future.result["stdout"] <- base::list(NULL) [18:41:21.471] } [18:41:21.471] base::close(...future.stdout) [18:41:21.471] ...future.stdout <- NULL [18:41:21.471] } [18:41:21.471] ...future.result$conditions <- ...future.conditions [18:41:21.471] ...future.result$finished <- base::Sys.time() [18:41:21.471] ...future.result [18:41:21.471] } [18:41:21.474] assign_globals() ... [18:41:21.475] List of 5 [18:41:21.475] $ ...future.FUN :function (mode = "logical", length = 0L) [18:41:21.475] $ future.call.arguments :List of 1 [18:41:21.475] ..$ length: int 2 [18:41:21.475] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:21.475] $ ...future.elements_ii :List of 4 [18:41:21.475] ..$ c: chr "list" [18:41:21.475] ..$ c: chr "character" [18:41:21.475] ..$ b: chr "numeric" [18:41:21.475] ..$ a: chr "integer" [18:41:21.475] $ ...future.seeds_ii : NULL [18:41:21.475] $ ...future.globals.maxSize: NULL [18:41:21.475] - attr(*, "where")=List of 5 [18:41:21.475] ..$ ...future.FUN : [18:41:21.475] ..$ future.call.arguments : [18:41:21.475] ..$ ...future.elements_ii : [18:41:21.475] ..$ ...future.seeds_ii : [18:41:21.475] ..$ ...future.globals.maxSize: [18:41:21.475] - attr(*, "resolved")= logi FALSE [18:41:21.475] - attr(*, "total_size")= num 4881 [18:41:21.475] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:21.475] - attr(*, "already-done")= logi TRUE [18:41:21.482] - copied '...future.FUN' to environment [18:41:21.482] - copied 'future.call.arguments' to environment [18:41:21.482] - copied '...future.elements_ii' to environment [18:41:21.482] - copied '...future.seeds_ii' to environment [18:41:21.482] - copied '...future.globals.maxSize' to environment [18:41:21.483] assign_globals() ... done [18:41:21.483] plan(): Setting new future strategy stack: [18:41:21.483] List of future strategies: [18:41:21.483] 1. sequential: [18:41:21.483] - args: function (..., envir = parent.frame(), workers = "") [18:41:21.483] - tweaked: FALSE [18:41:21.483] - call: NULL [18:41:21.484] plan(): nbrOfWorkers() = 1 [18:41:21.485] plan(): Setting new future strategy stack: [18:41:21.485] List of future strategies: [18:41:21.485] 1. sequential: [18:41:21.485] - args: function (..., envir = parent.frame(), workers = "") [18:41:21.485] - tweaked: FALSE [18:41:21.485] - call: plan(strategy) [18:41:21.486] plan(): nbrOfWorkers() = 1 [18:41:21.486] SequentialFuture started (and completed) [18:41:21.487] - Launch lazy future ... done [18:41:21.487] run() for 'SequentialFuture' ... done [18:41:21.487] Created future: [18:41:21.487] SequentialFuture: [18:41:21.487] Label: 'future_lapply-1' [18:41:21.487] Expression: [18:41:21.487] { [18:41:21.487] do.call(function(...) { [18:41:21.487] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:21.487] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:21.487] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:21.487] on.exit(options(oopts), add = TRUE) [18:41:21.487] } [18:41:21.487] { [18:41:21.487] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:21.487] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:21.487] ...future.FUN(...future.X_jj, ...) [18:41:21.487] }) [18:41:21.487] } [18:41:21.487] }, args = future.call.arguments) [18:41:21.487] } [18:41:21.487] Lazy evaluation: FALSE [18:41:21.487] Asynchronous evaluation: FALSE [18:41:21.487] Local evaluation: TRUE [18:41:21.487] Environment: R_GlobalEnv [18:41:21.487] Capture standard output: TRUE [18:41:21.487] Capture condition classes: 'condition' (excluding 'nothing') [18:41:21.487] Globals: 5 objects totaling 853 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 191 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:21.487] Packages: [18:41:21.487] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:21.487] Resolved: TRUE [18:41:21.487] Value: 111 bytes of class 'list' [18:41:21.487] Early signaling: FALSE [18:41:21.487] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:21.487] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:21.488] Chunk #1 of 1 ... DONE [18:41:21.489] Launching 1 futures (chunks) ... DONE [18:41:21.489] Resolving 1 futures (chunks) ... [18:41:21.489] resolve() on list ... [18:41:21.489] recursive: 0 [18:41:21.489] length: 1 [18:41:21.489] [18:41:21.490] resolved() for 'SequentialFuture' ... [18:41:21.490] - state: 'finished' [18:41:21.490] - run: TRUE [18:41:21.490] - result: 'FutureResult' [18:41:21.490] resolved() for 'SequentialFuture' ... done [18:41:21.491] Future #1 [18:41:21.491] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:21.491] - nx: 1 [18:41:21.491] - relay: TRUE [18:41:21.491] - stdout: TRUE [18:41:21.491] - signal: TRUE [18:41:21.492] - resignal: FALSE [18:41:21.492] - force: TRUE [18:41:21.492] - relayed: [n=1] FALSE [18:41:21.492] - queued futures: [n=1] FALSE [18:41:21.492] - until=1 [18:41:21.492] - relaying element #1 [18:41:21.493] - relayed: [n=1] TRUE [18:41:21.493] - queued futures: [n=1] TRUE [18:41:21.493] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:21.493] length: 0 (resolved future 1) [18:41:21.494] Relaying remaining futures [18:41:21.494] signalConditionsASAP(NULL, pos=0) ... [18:41:21.494] - nx: 1 [18:41:21.494] - relay: TRUE [18:41:21.494] - stdout: TRUE [18:41:21.494] - signal: TRUE [18:41:21.495] - resignal: FALSE [18:41:21.495] - force: TRUE [18:41:21.495] - relayed: [n=1] TRUE [18:41:21.495] - queued futures: [n=1] TRUE - flush all [18:41:21.495] - relayed: [n=1] TRUE [18:41:21.495] - queued futures: [n=1] TRUE [18:41:21.496] signalConditionsASAP(NULL, pos=0) ... done [18:41:21.496] resolve() on list ... DONE [18:41:21.496] - Number of value chunks collected: 1 [18:41:21.496] Resolving 1 futures (chunks) ... DONE [18:41:21.496] Reducing values from 1 chunks ... [18:41:21.497] - Number of values collected after concatenation: 4 [18:41:21.497] - Number of values expected: 4 [18:41:21.497] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [18:41:21.497] Reducing values from 1 chunks ... DONE [18:41:21.497] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL - future_lapply(x, FUN = future:::hpaste, ...) ... [18:41:21.500] future_lapply() ... [18:41:21.512] Number of chunks: 1 [18:41:21.512] getGlobalsAndPackagesXApply() ... [18:41:21.512] - future.globals: TRUE [18:41:21.513] getGlobalsAndPackages() ... [18:41:21.513] Searching for globals... [18:41:21.522] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [18:41:21.522] Searching for globals ... DONE [18:41:21.523] Resolving globals: FALSE [18:41:21.524] The total size of the 1 globals is 7.17 KiB (7342 bytes) [18:41:21.524] The total size of the 1 globals exported for future expression ('FUN(collapse = "; ", maxHead = 3L)') is 7.17 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (7.17 KiB of class 'function') [18:41:21.524] - globals: [1] 'FUN' [18:41:21.525] - packages: [1] 'future' [18:41:21.525] getGlobalsAndPackages() ... DONE [18:41:21.525] - globals found/used: [n=1] 'FUN' [18:41:21.525] - needed namespaces: [n=1] 'future' [18:41:21.525] Finding globals ... DONE [18:41:21.526] - use_args: TRUE [18:41:21.526] - Getting '...' globals ... [18:41:21.526] resolve() on list ... [18:41:21.526] recursive: 0 [18:41:21.526] length: 1 [18:41:21.527] elements: '...' [18:41:21.527] length: 0 (resolved future 1) [18:41:21.527] resolve() on list ... DONE [18:41:21.527] - '...' content: [n=2] 'collapse', 'maxHead' [18:41:21.527] List of 1 [18:41:21.527] $ ...:List of 2 [18:41:21.527] ..$ collapse: chr "; " [18:41:21.527] ..$ maxHead : int 3 [18:41:21.527] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:21.527] - attr(*, "where")=List of 1 [18:41:21.527] ..$ ...: [18:41:21.527] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:21.527] - attr(*, "resolved")= logi TRUE [18:41:21.527] - attr(*, "total_size")= num NA [18:41:21.531] - Getting '...' globals ... DONE [18:41:21.531] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:21.532] List of 2 [18:41:21.532] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [18:41:21.532] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [18:41:21.532] $ ... :List of 2 [18:41:21.532] ..$ collapse: chr "; " [18:41:21.532] ..$ maxHead : int 3 [18:41:21.532] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:21.532] - attr(*, "where")=List of 2 [18:41:21.532] ..$ ...future.FUN: [18:41:21.532] ..$ ... : [18:41:21.532] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:21.532] - attr(*, "resolved")= logi FALSE [18:41:21.532] - attr(*, "total_size")= int 20741 [18:41:21.536] Packages to be attached in all futures: [n=1] 'future' [18:41:21.536] getGlobalsAndPackagesXApply() ... DONE [18:41:21.536] Number of futures (= number of chunks): 1 [18:41:21.536] Launching 1 futures (chunks) ... [18:41:21.537] Chunk #1 of 1 ... [18:41:21.537] - Finding globals in 'X' for chunk #1 ... [18:41:21.537] getGlobalsAndPackages() ... [18:41:21.537] Searching for globals... [18:41:21.537] [18:41:21.538] Searching for globals ... DONE [18:41:21.538] - globals: [0] [18:41:21.538] getGlobalsAndPackages() ... DONE [18:41:21.538] + additional globals found: [n=0] [18:41:21.538] + additional namespaces needed: [n=0] [18:41:21.538] - Finding globals in 'X' for chunk #1 ... DONE [18:41:21.539] - seeds: [18:41:21.539] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:21.539] getGlobalsAndPackages() ... [18:41:21.539] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:21.539] Resolving globals: FALSE [18:41:21.539] Tweak future expression to call with '...' arguments ... [18:41:21.540] { [18:41:21.540] do.call(function(...) { [18:41:21.540] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:21.540] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:21.540] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:21.540] on.exit(options(oopts), add = TRUE) [18:41:21.540] } [18:41:21.540] { [18:41:21.540] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:21.540] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:21.540] ...future.FUN(...future.X_jj, ...) [18:41:21.540] }) [18:41:21.540] } [18:41:21.540] }, args = future.call.arguments) [18:41:21.540] } [18:41:21.540] Tweak future expression to call with '...' arguments ... DONE [18:41:21.541] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:21.541] - packages: [1] 'future' [18:41:21.541] getGlobalsAndPackages() ... DONE [18:41:21.541] run() for 'Future' ... [18:41:21.541] - state: 'created' [18:41:21.542] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:21.542] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:21.542] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:21.542] - Field: 'label' [18:41:21.543] - Field: 'local' [18:41:21.543] - Field: 'owner' [18:41:21.543] - Field: 'envir' [18:41:21.543] - Field: 'packages' [18:41:21.543] - Field: 'gc' [18:41:21.544] - Field: 'conditions' [18:41:21.544] - Field: 'expr' [18:41:21.544] - Field: 'uuid' [18:41:21.544] - Field: 'seed' [18:41:21.544] - Field: 'version' [18:41:21.545] - Field: 'result' [18:41:21.545] - Field: 'asynchronous' [18:41:21.545] - Field: 'calls' [18:41:21.545] - Field: 'globals' [18:41:21.545] - Field: 'stdout' [18:41:21.545] - Field: 'earlySignal' [18:41:21.546] - Field: 'lazy' [18:41:21.546] - Field: 'state' [18:41:21.546] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:21.546] - Launch lazy future ... [18:41:21.546] Packages needed by the future expression (n = 1): 'future' [18:41:21.547] Packages needed by future strategies (n = 0): [18:41:21.547] { [18:41:21.547] { [18:41:21.547] { [18:41:21.547] ...future.startTime <- base::Sys.time() [18:41:21.547] { [18:41:21.547] { [18:41:21.547] { [18:41:21.547] { [18:41:21.547] base::local({ [18:41:21.547] has_future <- base::requireNamespace("future", [18:41:21.547] quietly = TRUE) [18:41:21.547] if (has_future) { [18:41:21.547] ns <- base::getNamespace("future") [18:41:21.547] version <- ns[[".package"]][["version"]] [18:41:21.547] if (is.null(version)) [18:41:21.547] version <- utils::packageVersion("future") [18:41:21.547] } [18:41:21.547] else { [18:41:21.547] version <- NULL [18:41:21.547] } [18:41:21.547] if (!has_future || version < "1.8.0") { [18:41:21.547] info <- base::c(r_version = base::gsub("R version ", [18:41:21.547] "", base::R.version$version.string), [18:41:21.547] platform = base::sprintf("%s (%s-bit)", [18:41:21.547] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:21.547] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:21.547] "release", "version")], collapse = " "), [18:41:21.547] hostname = base::Sys.info()[["nodename"]]) [18:41:21.547] info <- base::sprintf("%s: %s", base::names(info), [18:41:21.547] info) [18:41:21.547] info <- base::paste(info, collapse = "; ") [18:41:21.547] if (!has_future) { [18:41:21.547] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:21.547] info) [18:41:21.547] } [18:41:21.547] else { [18:41:21.547] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:21.547] info, version) [18:41:21.547] } [18:41:21.547] base::stop(msg) [18:41:21.547] } [18:41:21.547] }) [18:41:21.547] } [18:41:21.547] base::local({ [18:41:21.547] for (pkg in "future") { [18:41:21.547] base::loadNamespace(pkg) [18:41:21.547] base::library(pkg, character.only = TRUE) [18:41:21.547] } [18:41:21.547] }) [18:41:21.547] } [18:41:21.547] ...future.strategy.old <- future::plan("list") [18:41:21.547] options(future.plan = NULL) [18:41:21.547] Sys.unsetenv("R_FUTURE_PLAN") [18:41:21.547] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:21.547] } [18:41:21.547] ...future.workdir <- getwd() [18:41:21.547] } [18:41:21.547] ...future.oldOptions <- base::as.list(base::.Options) [18:41:21.547] ...future.oldEnvVars <- base::Sys.getenv() [18:41:21.547] } [18:41:21.547] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:21.547] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:21.547] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:21.547] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:21.547] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:21.547] future.stdout.windows.reencode = NULL, width = 80L) [18:41:21.547] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:21.547] base::names(...future.oldOptions)) [18:41:21.547] } [18:41:21.547] if (FALSE) { [18:41:21.547] } [18:41:21.547] else { [18:41:21.547] if (TRUE) { [18:41:21.547] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:21.547] open = "w") [18:41:21.547] } [18:41:21.547] else { [18:41:21.547] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:21.547] windows = "NUL", "/dev/null"), open = "w") [18:41:21.547] } [18:41:21.547] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:21.547] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:21.547] base::sink(type = "output", split = FALSE) [18:41:21.547] base::close(...future.stdout) [18:41:21.547] }, add = TRUE) [18:41:21.547] } [18:41:21.547] ...future.frame <- base::sys.nframe() [18:41:21.547] ...future.conditions <- base::list() [18:41:21.547] ...future.rng <- base::globalenv()$.Random.seed [18:41:21.547] if (FALSE) { [18:41:21.547] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:21.547] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:21.547] } [18:41:21.547] ...future.result <- base::tryCatch({ [18:41:21.547] base::withCallingHandlers({ [18:41:21.547] ...future.value <- base::withVisible(base::local({ [18:41:21.547] do.call(function(...) { [18:41:21.547] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:21.547] if (!identical(...future.globals.maxSize.org, [18:41:21.547] ...future.globals.maxSize)) { [18:41:21.547] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:21.547] on.exit(options(oopts), add = TRUE) [18:41:21.547] } [18:41:21.547] { [18:41:21.547] lapply(seq_along(...future.elements_ii), [18:41:21.547] FUN = function(jj) { [18:41:21.547] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:21.547] ...future.FUN(...future.X_jj, ...) [18:41:21.547] }) [18:41:21.547] } [18:41:21.547] }, args = future.call.arguments) [18:41:21.547] })) [18:41:21.547] future::FutureResult(value = ...future.value$value, [18:41:21.547] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:21.547] ...future.rng), globalenv = if (FALSE) [18:41:21.547] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:21.547] ...future.globalenv.names)) [18:41:21.547] else NULL, started = ...future.startTime, version = "1.8") [18:41:21.547] }, condition = base::local({ [18:41:21.547] c <- base::c [18:41:21.547] inherits <- base::inherits [18:41:21.547] invokeRestart <- base::invokeRestart [18:41:21.547] length <- base::length [18:41:21.547] list <- base::list [18:41:21.547] seq.int <- base::seq.int [18:41:21.547] signalCondition <- base::signalCondition [18:41:21.547] sys.calls <- base::sys.calls [18:41:21.547] `[[` <- base::`[[` [18:41:21.547] `+` <- base::`+` [18:41:21.547] `<<-` <- base::`<<-` [18:41:21.547] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:21.547] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:21.547] 3L)] [18:41:21.547] } [18:41:21.547] function(cond) { [18:41:21.547] is_error <- inherits(cond, "error") [18:41:21.547] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:21.547] NULL) [18:41:21.547] if (is_error) { [18:41:21.547] sessionInformation <- function() { [18:41:21.547] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:21.547] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:21.547] search = base::search(), system = base::Sys.info()) [18:41:21.547] } [18:41:21.547] ...future.conditions[[length(...future.conditions) + [18:41:21.547] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:21.547] cond$call), session = sessionInformation(), [18:41:21.547] timestamp = base::Sys.time(), signaled = 0L) [18:41:21.547] signalCondition(cond) [18:41:21.547] } [18:41:21.547] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:21.547] "immediateCondition"))) { [18:41:21.547] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:21.547] ...future.conditions[[length(...future.conditions) + [18:41:21.547] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:21.547] if (TRUE && !signal) { [18:41:21.547] muffleCondition <- function (cond, pattern = "^muffle") [18:41:21.547] { [18:41:21.547] inherits <- base::inherits [18:41:21.547] invokeRestart <- base::invokeRestart [18:41:21.547] is.null <- base::is.null [18:41:21.547] muffled <- FALSE [18:41:21.547] if (inherits(cond, "message")) { [18:41:21.547] muffled <- grepl(pattern, "muffleMessage") [18:41:21.547] if (muffled) [18:41:21.547] invokeRestart("muffleMessage") [18:41:21.547] } [18:41:21.547] else if (inherits(cond, "warning")) { [18:41:21.547] muffled <- grepl(pattern, "muffleWarning") [18:41:21.547] if (muffled) [18:41:21.547] invokeRestart("muffleWarning") [18:41:21.547] } [18:41:21.547] else if (inherits(cond, "condition")) { [18:41:21.547] if (!is.null(pattern)) { [18:41:21.547] computeRestarts <- base::computeRestarts [18:41:21.547] grepl <- base::grepl [18:41:21.547] restarts <- computeRestarts(cond) [18:41:21.547] for (restart in restarts) { [18:41:21.547] name <- restart$name [18:41:21.547] if (is.null(name)) [18:41:21.547] next [18:41:21.547] if (!grepl(pattern, name)) [18:41:21.547] next [18:41:21.547] invokeRestart(restart) [18:41:21.547] muffled <- TRUE [18:41:21.547] break [18:41:21.547] } [18:41:21.547] } [18:41:21.547] } [18:41:21.547] invisible(muffled) [18:41:21.547] } [18:41:21.547] muffleCondition(cond, pattern = "^muffle") [18:41:21.547] } [18:41:21.547] } [18:41:21.547] else { [18:41:21.547] if (TRUE) { [18:41:21.547] muffleCondition <- function (cond, pattern = "^muffle") [18:41:21.547] { [18:41:21.547] inherits <- base::inherits [18:41:21.547] invokeRestart <- base::invokeRestart [18:41:21.547] is.null <- base::is.null [18:41:21.547] muffled <- FALSE [18:41:21.547] if (inherits(cond, "message")) { [18:41:21.547] muffled <- grepl(pattern, "muffleMessage") [18:41:21.547] if (muffled) [18:41:21.547] invokeRestart("muffleMessage") [18:41:21.547] } [18:41:21.547] else if (inherits(cond, "warning")) { [18:41:21.547] muffled <- grepl(pattern, "muffleWarning") [18:41:21.547] if (muffled) [18:41:21.547] invokeRestart("muffleWarning") [18:41:21.547] } [18:41:21.547] else if (inherits(cond, "condition")) { [18:41:21.547] if (!is.null(pattern)) { [18:41:21.547] computeRestarts <- base::computeRestarts [18:41:21.547] grepl <- base::grepl [18:41:21.547] restarts <- computeRestarts(cond) [18:41:21.547] for (restart in restarts) { [18:41:21.547] name <- restart$name [18:41:21.547] if (is.null(name)) [18:41:21.547] next [18:41:21.547] if (!grepl(pattern, name)) [18:41:21.547] next [18:41:21.547] invokeRestart(restart) [18:41:21.547] muffled <- TRUE [18:41:21.547] break [18:41:21.547] } [18:41:21.547] } [18:41:21.547] } [18:41:21.547] invisible(muffled) [18:41:21.547] } [18:41:21.547] muffleCondition(cond, pattern = "^muffle") [18:41:21.547] } [18:41:21.547] } [18:41:21.547] } [18:41:21.547] })) [18:41:21.547] }, error = function(ex) { [18:41:21.547] base::structure(base::list(value = NULL, visible = NULL, [18:41:21.547] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:21.547] ...future.rng), started = ...future.startTime, [18:41:21.547] finished = Sys.time(), session_uuid = NA_character_, [18:41:21.547] version = "1.8"), class = "FutureResult") [18:41:21.547] }, finally = { [18:41:21.547] if (!identical(...future.workdir, getwd())) [18:41:21.547] setwd(...future.workdir) [18:41:21.547] { [18:41:21.547] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:21.547] ...future.oldOptions$nwarnings <- NULL [18:41:21.547] } [18:41:21.547] base::options(...future.oldOptions) [18:41:21.547] if (.Platform$OS.type == "windows") { [18:41:21.547] old_names <- names(...future.oldEnvVars) [18:41:21.547] envs <- base::Sys.getenv() [18:41:21.547] names <- names(envs) [18:41:21.547] common <- intersect(names, old_names) [18:41:21.547] added <- setdiff(names, old_names) [18:41:21.547] removed <- setdiff(old_names, names) [18:41:21.547] changed <- common[...future.oldEnvVars[common] != [18:41:21.547] envs[common]] [18:41:21.547] NAMES <- toupper(changed) [18:41:21.547] args <- list() [18:41:21.547] for (kk in seq_along(NAMES)) { [18:41:21.547] name <- changed[[kk]] [18:41:21.547] NAME <- NAMES[[kk]] [18:41:21.547] if (name != NAME && is.element(NAME, old_names)) [18:41:21.547] next [18:41:21.547] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:21.547] } [18:41:21.547] NAMES <- toupper(added) [18:41:21.547] for (kk in seq_along(NAMES)) { [18:41:21.547] name <- added[[kk]] [18:41:21.547] NAME <- NAMES[[kk]] [18:41:21.547] if (name != NAME && is.element(NAME, old_names)) [18:41:21.547] next [18:41:21.547] args[[name]] <- "" [18:41:21.547] } [18:41:21.547] NAMES <- toupper(removed) [18:41:21.547] for (kk in seq_along(NAMES)) { [18:41:21.547] name <- removed[[kk]] [18:41:21.547] NAME <- NAMES[[kk]] [18:41:21.547] if (name != NAME && is.element(NAME, old_names)) [18:41:21.547] next [18:41:21.547] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:21.547] } [18:41:21.547] if (length(args) > 0) [18:41:21.547] base::do.call(base::Sys.setenv, args = args) [18:41:21.547] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:21.547] } [18:41:21.547] else { [18:41:21.547] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:21.547] } [18:41:21.547] { [18:41:21.547] if (base::length(...future.futureOptionsAdded) > [18:41:21.547] 0L) { [18:41:21.547] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:21.547] base::names(opts) <- ...future.futureOptionsAdded [18:41:21.547] base::options(opts) [18:41:21.547] } [18:41:21.547] { [18:41:21.547] { [18:41:21.547] NULL [18:41:21.547] RNGkind("Mersenne-Twister") [18:41:21.547] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:21.547] inherits = FALSE) [18:41:21.547] } [18:41:21.547] options(future.plan = NULL) [18:41:21.547] if (is.na(NA_character_)) [18:41:21.547] Sys.unsetenv("R_FUTURE_PLAN") [18:41:21.547] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:21.547] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:21.547] .init = FALSE) [18:41:21.547] } [18:41:21.547] } [18:41:21.547] } [18:41:21.547] }) [18:41:21.547] if (TRUE) { [18:41:21.547] base::sink(type = "output", split = FALSE) [18:41:21.547] if (TRUE) { [18:41:21.547] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:21.547] } [18:41:21.547] else { [18:41:21.547] ...future.result["stdout"] <- base::list(NULL) [18:41:21.547] } [18:41:21.547] base::close(...future.stdout) [18:41:21.547] ...future.stdout <- NULL [18:41:21.547] } [18:41:21.547] ...future.result$conditions <- ...future.conditions [18:41:21.547] ...future.result$finished <- base::Sys.time() [18:41:21.547] ...future.result [18:41:21.547] } [18:41:21.551] assign_globals() ... [18:41:21.551] List of 5 [18:41:21.551] $ ...future.FUN :function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [18:41:21.551] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [18:41:21.551] $ future.call.arguments :List of 2 [18:41:21.551] ..$ collapse: chr "; " [18:41:21.551] ..$ maxHead : int 3 [18:41:21.551] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:21.551] $ ...future.elements_ii :List of 1 [18:41:21.551] ..$ a: Named chr [1:101] "hello" "1" "2" "3" ... [18:41:21.551] .. ..- attr(*, "names")= chr [1:101] "" "b1" "b2" "b3" ... [18:41:21.551] $ ...future.seeds_ii : NULL [18:41:21.551] $ ...future.globals.maxSize: NULL [18:41:21.551] - attr(*, "where")=List of 5 [18:41:21.551] ..$ ...future.FUN : [18:41:21.551] ..$ future.call.arguments : [18:41:21.551] ..$ ...future.elements_ii : [18:41:21.551] ..$ ...future.seeds_ii : [18:41:21.551] ..$ ...future.globals.maxSize: [18:41:21.551] - attr(*, "resolved")= logi FALSE [18:41:21.551] - attr(*, "total_size")= num 20741 [18:41:21.551] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:21.551] - attr(*, "already-done")= logi TRUE [18:41:21.558] - copied '...future.FUN' to environment [18:41:21.559] - copied 'future.call.arguments' to environment [18:41:21.559] - copied '...future.elements_ii' to environment [18:41:21.559] - copied '...future.seeds_ii' to environment [18:41:21.559] - copied '...future.globals.maxSize' to environment [18:41:21.559] assign_globals() ... done [18:41:21.560] plan(): Setting new future strategy stack: [18:41:21.560] List of future strategies: [18:41:21.560] 1. sequential: [18:41:21.560] - args: function (..., envir = parent.frame(), workers = "") [18:41:21.560] - tweaked: FALSE [18:41:21.560] - call: NULL [18:41:21.561] plan(): nbrOfWorkers() = 1 [18:41:21.562] plan(): Setting new future strategy stack: [18:41:21.562] List of future strategies: [18:41:21.562] 1. sequential: [18:41:21.562] - args: function (..., envir = parent.frame(), workers = "") [18:41:21.562] - tweaked: FALSE [18:41:21.562] - call: plan(strategy) [18:41:21.563] plan(): nbrOfWorkers() = 1 [18:41:21.563] SequentialFuture started (and completed) [18:41:21.563] - Launch lazy future ... done [18:41:21.564] run() for 'SequentialFuture' ... done [18:41:21.564] Created future: [18:41:21.564] SequentialFuture: [18:41:21.564] Label: 'future_lapply-1' [18:41:21.564] Expression: [18:41:21.564] { [18:41:21.564] do.call(function(...) { [18:41:21.564] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:21.564] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:21.564] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:21.564] on.exit(options(oopts), add = TRUE) [18:41:21.564] } [18:41:21.564] { [18:41:21.564] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:21.564] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:21.564] ...future.FUN(...future.X_jj, ...) [18:41:21.564] }) [18:41:21.564] } [18:41:21.564] }, args = future.call.arguments) [18:41:21.564] } [18:41:21.564] Lazy evaluation: FALSE [18:41:21.564] Asynchronous evaluation: FALSE [18:41:21.564] Local evaluation: TRUE [18:41:21.564] Environment: R_GlobalEnv [18:41:21.564] Capture standard output: TRUE [18:41:21.564] Capture condition classes: 'condition' (excluding 'nothing') [18:41:21.564] Globals: 5 objects totaling 9.56 KiB (function '...future.FUN' of 7.17 KiB, DotDotDotList 'future.call.arguments' of 187 bytes, list '...future.elements_ii' of 2.15 KiB, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:21.564] Packages: 1 packages ('future') [18:41:21.564] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:21.564] Resolved: TRUE [18:41:21.564] Value: 68 bytes of class 'list' [18:41:21.564] Early signaling: FALSE [18:41:21.564] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:21.564] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:21.565] Chunk #1 of 1 ... DONE [18:41:21.565] Launching 1 futures (chunks) ... DONE [18:41:21.565] Resolving 1 futures (chunks) ... [18:41:21.566] resolve() on list ... [18:41:21.566] recursive: 0 [18:41:21.566] length: 1 [18:41:21.566] [18:41:21.566] resolved() for 'SequentialFuture' ... [18:41:21.567] - state: 'finished' [18:41:21.567] - run: TRUE [18:41:21.567] - result: 'FutureResult' [18:41:21.567] resolved() for 'SequentialFuture' ... done [18:41:21.567] Future #1 [18:41:21.567] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:21.568] - nx: 1 [18:41:21.568] - relay: TRUE [18:41:21.568] - stdout: TRUE [18:41:21.568] - signal: TRUE [18:41:21.568] - resignal: FALSE [18:41:21.568] - force: TRUE [18:41:21.569] - relayed: [n=1] FALSE [18:41:21.569] - queued futures: [n=1] FALSE [18:41:21.569] - until=1 [18:41:21.569] - relaying element #1 [18:41:21.569] - relayed: [n=1] TRUE [18:41:21.569] - queued futures: [n=1] TRUE [18:41:21.570] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:21.570] length: 0 (resolved future 1) [18:41:21.570] Relaying remaining futures [18:41:21.570] signalConditionsASAP(NULL, pos=0) ... [18:41:21.570] - nx: 1 [18:41:21.570] - relay: TRUE [18:41:21.571] - stdout: TRUE [18:41:21.571] - signal: TRUE [18:41:21.571] - resignal: FALSE [18:41:21.571] - force: TRUE [18:41:21.571] - relayed: [n=1] TRUE [18:41:21.571] - queued futures: [n=1] TRUE - flush all [18:41:21.572] - relayed: [n=1] TRUE [18:41:21.572] - queued futures: [n=1] TRUE [18:41:21.572] signalConditionsASAP(NULL, pos=0) ... done [18:41:21.572] resolve() on list ... DONE [18:41:21.572] - Number of value chunks collected: 1 [18:41:21.572] Resolving 1 futures (chunks) ... DONE [18:41:21.573] Reducing values from 1 chunks ... [18:41:21.573] - Number of values collected after concatenation: 1 [18:41:21.573] - Number of values expected: 1 [18:41:21.573] Reducing values from 1 chunks ... DONE [18:41:21.573] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [18:41:21.574] future_lapply() ... [18:41:21.575] Number of chunks: 1 [18:41:21.575] Index remapping (attribute 'ordering'): [n = 2] 2, 1 [18:41:21.575] getGlobalsAndPackagesXApply() ... [18:41:21.576] - future.globals: TRUE [18:41:21.576] getGlobalsAndPackages() ... [18:41:21.576] Searching for globals... [18:41:21.577] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [18:41:21.578] Searching for globals ... DONE [18:41:21.578] Resolving globals: FALSE [18:41:21.578] The total size of the 1 globals is 911 bytes (911 bytes) [18:41:21.579] The total size of the 1 globals exported for future expression ('FUN()') is 911 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (911 bytes of class 'function') [18:41:21.579] - globals: [1] 'FUN' [18:41:21.579] - packages: [1] 'listenv' [18:41:21.579] getGlobalsAndPackages() ... DONE [18:41:21.580] - globals found/used: [n=1] 'FUN' [18:41:21.580] - needed namespaces: [n=1] 'listenv' [18:41:21.580] Finding globals ... DONE [18:41:21.580] - use_args: TRUE [18:41:21.580] - Getting '...' globals ... [18:41:21.581] resolve() on list ... [18:41:21.581] recursive: 0 [18:41:21.581] length: 1 [18:41:21.581] elements: '...' [18:41:21.581] length: 0 (resolved future 1) [18:41:21.582] resolve() on list ... DONE [18:41:21.582] - '...' content: [n=0] [18:41:21.582] List of 1 [18:41:21.582] $ ...: list() [18:41:21.582] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:21.582] - attr(*, "where")=List of 1 [18:41:21.582] ..$ ...: [18:41:21.582] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:21.582] - attr(*, "resolved")= logi TRUE [18:41:21.582] - attr(*, "total_size")= num NA [18:41:21.585] - Getting '...' globals ... DONE [18:41:21.585] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:21.585] List of 2 [18:41:21.585] $ ...future.FUN:function (x, ...) [18:41:21.585] $ ... : list() [18:41:21.585] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:21.585] - attr(*, "where")=List of 2 [18:41:21.585] ..$ ...future.FUN: [18:41:21.585] ..$ ... : [18:41:21.585] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:21.585] - attr(*, "resolved")= logi FALSE [18:41:21.585] - attr(*, "total_size")= int 8620 [18:41:21.589] Packages to be attached in all futures: [n=1] 'listenv' [18:41:21.589] getGlobalsAndPackagesXApply() ... DONE [18:41:21.589] Number of futures (= number of chunks): 1 [18:41:21.589] Launching 1 futures (chunks) ... [18:41:21.589] Chunk #1 of 1 ... [18:41:21.590] - Finding globals in 'X' for chunk #1 ... [18:41:21.590] getGlobalsAndPackages() ... [18:41:21.590] Searching for globals... [18:41:21.591] [18:41:21.591] Searching for globals ... DONE [18:41:21.591] - globals: [0] [18:41:21.591] getGlobalsAndPackages() ... DONE [18:41:21.591] + additional globals found: [n=0] [18:41:21.592] + additional namespaces needed: [n=0] [18:41:21.592] - Finding globals in 'X' for chunk #1 ... DONE [18:41:21.592] - seeds: [18:41:21.592] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:21.592] getGlobalsAndPackages() ... [18:41:21.592] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:21.593] Resolving globals: FALSE [18:41:21.593] Tweak future expression to call with '...' arguments ... [18:41:21.593] { [18:41:21.593] do.call(function(...) { [18:41:21.593] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:21.593] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:21.593] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:21.593] on.exit(options(oopts), add = TRUE) [18:41:21.593] } [18:41:21.593] { [18:41:21.593] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:21.593] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:21.593] ...future.FUN(...future.X_jj, ...) [18:41:21.593] }) [18:41:21.593] } [18:41:21.593] }, args = future.call.arguments) [18:41:21.593] } [18:41:21.593] Tweak future expression to call with '...' arguments ... DONE [18:41:21.594] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:21.594] - packages: [1] 'listenv' [18:41:21.594] getGlobalsAndPackages() ... DONE [18:41:21.595] run() for 'Future' ... [18:41:21.595] - state: 'created' [18:41:21.595] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:21.596] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:21.596] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:21.596] - Field: 'label' [18:41:21.596] - Field: 'local' [18:41:21.597] - Field: 'owner' [18:41:21.597] - Field: 'envir' [18:41:21.597] - Field: 'packages' [18:41:21.597] - Field: 'gc' [18:41:21.597] - Field: 'conditions' [18:41:21.597] - Field: 'expr' [18:41:21.598] - Field: 'uuid' [18:41:21.598] - Field: 'seed' [18:41:21.598] - Field: 'version' [18:41:21.598] - Field: 'result' [18:41:21.598] - Field: 'asynchronous' [18:41:21.598] - Field: 'calls' [18:41:21.599] - Field: 'globals' [18:41:21.599] - Field: 'stdout' [18:41:21.599] - Field: 'earlySignal' [18:41:21.599] - Field: 'lazy' [18:41:21.599] - Field: 'state' [18:41:21.600] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:21.600] - Launch lazy future ... [18:41:21.600] Packages needed by the future expression (n = 1): 'listenv' [18:41:21.600] Packages needed by future strategies (n = 0): [18:41:21.601] { [18:41:21.601] { [18:41:21.601] { [18:41:21.601] ...future.startTime <- base::Sys.time() [18:41:21.601] { [18:41:21.601] { [18:41:21.601] { [18:41:21.601] { [18:41:21.601] base::local({ [18:41:21.601] has_future <- base::requireNamespace("future", [18:41:21.601] quietly = TRUE) [18:41:21.601] if (has_future) { [18:41:21.601] ns <- base::getNamespace("future") [18:41:21.601] version <- ns[[".package"]][["version"]] [18:41:21.601] if (is.null(version)) [18:41:21.601] version <- utils::packageVersion("future") [18:41:21.601] } [18:41:21.601] else { [18:41:21.601] version <- NULL [18:41:21.601] } [18:41:21.601] if (!has_future || version < "1.8.0") { [18:41:21.601] info <- base::c(r_version = base::gsub("R version ", [18:41:21.601] "", base::R.version$version.string), [18:41:21.601] platform = base::sprintf("%s (%s-bit)", [18:41:21.601] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:21.601] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:21.601] "release", "version")], collapse = " "), [18:41:21.601] hostname = base::Sys.info()[["nodename"]]) [18:41:21.601] info <- base::sprintf("%s: %s", base::names(info), [18:41:21.601] info) [18:41:21.601] info <- base::paste(info, collapse = "; ") [18:41:21.601] if (!has_future) { [18:41:21.601] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:21.601] info) [18:41:21.601] } [18:41:21.601] else { [18:41:21.601] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:21.601] info, version) [18:41:21.601] } [18:41:21.601] base::stop(msg) [18:41:21.601] } [18:41:21.601] }) [18:41:21.601] } [18:41:21.601] base::local({ [18:41:21.601] for (pkg in "listenv") { [18:41:21.601] base::loadNamespace(pkg) [18:41:21.601] base::library(pkg, character.only = TRUE) [18:41:21.601] } [18:41:21.601] }) [18:41:21.601] } [18:41:21.601] ...future.strategy.old <- future::plan("list") [18:41:21.601] options(future.plan = NULL) [18:41:21.601] Sys.unsetenv("R_FUTURE_PLAN") [18:41:21.601] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:21.601] } [18:41:21.601] ...future.workdir <- getwd() [18:41:21.601] } [18:41:21.601] ...future.oldOptions <- base::as.list(base::.Options) [18:41:21.601] ...future.oldEnvVars <- base::Sys.getenv() [18:41:21.601] } [18:41:21.601] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:21.601] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:21.601] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:21.601] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:21.601] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:21.601] future.stdout.windows.reencode = NULL, width = 80L) [18:41:21.601] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:21.601] base::names(...future.oldOptions)) [18:41:21.601] } [18:41:21.601] if (FALSE) { [18:41:21.601] } [18:41:21.601] else { [18:41:21.601] if (TRUE) { [18:41:21.601] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:21.601] open = "w") [18:41:21.601] } [18:41:21.601] else { [18:41:21.601] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:21.601] windows = "NUL", "/dev/null"), open = "w") [18:41:21.601] } [18:41:21.601] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:21.601] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:21.601] base::sink(type = "output", split = FALSE) [18:41:21.601] base::close(...future.stdout) [18:41:21.601] }, add = TRUE) [18:41:21.601] } [18:41:21.601] ...future.frame <- base::sys.nframe() [18:41:21.601] ...future.conditions <- base::list() [18:41:21.601] ...future.rng <- base::globalenv()$.Random.seed [18:41:21.601] if (FALSE) { [18:41:21.601] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:21.601] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:21.601] } [18:41:21.601] ...future.result <- base::tryCatch({ [18:41:21.601] base::withCallingHandlers({ [18:41:21.601] ...future.value <- base::withVisible(base::local({ [18:41:21.601] do.call(function(...) { [18:41:21.601] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:21.601] if (!identical(...future.globals.maxSize.org, [18:41:21.601] ...future.globals.maxSize)) { [18:41:21.601] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:21.601] on.exit(options(oopts), add = TRUE) [18:41:21.601] } [18:41:21.601] { [18:41:21.601] lapply(seq_along(...future.elements_ii), [18:41:21.601] FUN = function(jj) { [18:41:21.601] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:21.601] ...future.FUN(...future.X_jj, ...) [18:41:21.601] }) [18:41:21.601] } [18:41:21.601] }, args = future.call.arguments) [18:41:21.601] })) [18:41:21.601] future::FutureResult(value = ...future.value$value, [18:41:21.601] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:21.601] ...future.rng), globalenv = if (FALSE) [18:41:21.601] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:21.601] ...future.globalenv.names)) [18:41:21.601] else NULL, started = ...future.startTime, version = "1.8") [18:41:21.601] }, condition = base::local({ [18:41:21.601] c <- base::c [18:41:21.601] inherits <- base::inherits [18:41:21.601] invokeRestart <- base::invokeRestart [18:41:21.601] length <- base::length [18:41:21.601] list <- base::list [18:41:21.601] seq.int <- base::seq.int [18:41:21.601] signalCondition <- base::signalCondition [18:41:21.601] sys.calls <- base::sys.calls [18:41:21.601] `[[` <- base::`[[` [18:41:21.601] `+` <- base::`+` [18:41:21.601] `<<-` <- base::`<<-` [18:41:21.601] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:21.601] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:21.601] 3L)] [18:41:21.601] } [18:41:21.601] function(cond) { [18:41:21.601] is_error <- inherits(cond, "error") [18:41:21.601] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:21.601] NULL) [18:41:21.601] if (is_error) { [18:41:21.601] sessionInformation <- function() { [18:41:21.601] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:21.601] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:21.601] search = base::search(), system = base::Sys.info()) [18:41:21.601] } [18:41:21.601] ...future.conditions[[length(...future.conditions) + [18:41:21.601] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:21.601] cond$call), session = sessionInformation(), [18:41:21.601] timestamp = base::Sys.time(), signaled = 0L) [18:41:21.601] signalCondition(cond) [18:41:21.601] } [18:41:21.601] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:21.601] "immediateCondition"))) { [18:41:21.601] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:21.601] ...future.conditions[[length(...future.conditions) + [18:41:21.601] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:21.601] if (TRUE && !signal) { [18:41:21.601] muffleCondition <- function (cond, pattern = "^muffle") [18:41:21.601] { [18:41:21.601] inherits <- base::inherits [18:41:21.601] invokeRestart <- base::invokeRestart [18:41:21.601] is.null <- base::is.null [18:41:21.601] muffled <- FALSE [18:41:21.601] if (inherits(cond, "message")) { [18:41:21.601] muffled <- grepl(pattern, "muffleMessage") [18:41:21.601] if (muffled) [18:41:21.601] invokeRestart("muffleMessage") [18:41:21.601] } [18:41:21.601] else if (inherits(cond, "warning")) { [18:41:21.601] muffled <- grepl(pattern, "muffleWarning") [18:41:21.601] if (muffled) [18:41:21.601] invokeRestart("muffleWarning") [18:41:21.601] } [18:41:21.601] else if (inherits(cond, "condition")) { [18:41:21.601] if (!is.null(pattern)) { [18:41:21.601] computeRestarts <- base::computeRestarts [18:41:21.601] grepl <- base::grepl [18:41:21.601] restarts <- computeRestarts(cond) [18:41:21.601] for (restart in restarts) { [18:41:21.601] name <- restart$name [18:41:21.601] if (is.null(name)) [18:41:21.601] next [18:41:21.601] if (!grepl(pattern, name)) [18:41:21.601] next [18:41:21.601] invokeRestart(restart) [18:41:21.601] muffled <- TRUE [18:41:21.601] break [18:41:21.601] } [18:41:21.601] } [18:41:21.601] } [18:41:21.601] invisible(muffled) [18:41:21.601] } [18:41:21.601] muffleCondition(cond, pattern = "^muffle") [18:41:21.601] } [18:41:21.601] } [18:41:21.601] else { [18:41:21.601] if (TRUE) { [18:41:21.601] muffleCondition <- function (cond, pattern = "^muffle") [18:41:21.601] { [18:41:21.601] inherits <- base::inherits [18:41:21.601] invokeRestart <- base::invokeRestart [18:41:21.601] is.null <- base::is.null [18:41:21.601] muffled <- FALSE [18:41:21.601] if (inherits(cond, "message")) { [18:41:21.601] muffled <- grepl(pattern, "muffleMessage") [18:41:21.601] if (muffled) [18:41:21.601] invokeRestart("muffleMessage") [18:41:21.601] } [18:41:21.601] else if (inherits(cond, "warning")) { [18:41:21.601] muffled <- grepl(pattern, "muffleWarning") [18:41:21.601] if (muffled) [18:41:21.601] invokeRestart("muffleWarning") [18:41:21.601] } [18:41:21.601] else if (inherits(cond, "condition")) { [18:41:21.601] if (!is.null(pattern)) { [18:41:21.601] computeRestarts <- base::computeRestarts [18:41:21.601] grepl <- base::grepl [18:41:21.601] restarts <- computeRestarts(cond) [18:41:21.601] for (restart in restarts) { [18:41:21.601] name <- restart$name [18:41:21.601] if (is.null(name)) [18:41:21.601] next [18:41:21.601] if (!grepl(pattern, name)) [18:41:21.601] next [18:41:21.601] invokeRestart(restart) [18:41:21.601] muffled <- TRUE [18:41:21.601] break [18:41:21.601] } [18:41:21.601] } [18:41:21.601] } [18:41:21.601] invisible(muffled) [18:41:21.601] } [18:41:21.601] muffleCondition(cond, pattern = "^muffle") [18:41:21.601] } [18:41:21.601] } [18:41:21.601] } [18:41:21.601] })) [18:41:21.601] }, error = function(ex) { [18:41:21.601] base::structure(base::list(value = NULL, visible = NULL, [18:41:21.601] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:21.601] ...future.rng), started = ...future.startTime, [18:41:21.601] finished = Sys.time(), session_uuid = NA_character_, [18:41:21.601] version = "1.8"), class = "FutureResult") [18:41:21.601] }, finally = { [18:41:21.601] if (!identical(...future.workdir, getwd())) [18:41:21.601] setwd(...future.workdir) [18:41:21.601] { [18:41:21.601] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:21.601] ...future.oldOptions$nwarnings <- NULL [18:41:21.601] } [18:41:21.601] base::options(...future.oldOptions) [18:41:21.601] if (.Platform$OS.type == "windows") { [18:41:21.601] old_names <- names(...future.oldEnvVars) [18:41:21.601] envs <- base::Sys.getenv() [18:41:21.601] names <- names(envs) [18:41:21.601] common <- intersect(names, old_names) [18:41:21.601] added <- setdiff(names, old_names) [18:41:21.601] removed <- setdiff(old_names, names) [18:41:21.601] changed <- common[...future.oldEnvVars[common] != [18:41:21.601] envs[common]] [18:41:21.601] NAMES <- toupper(changed) [18:41:21.601] args <- list() [18:41:21.601] for (kk in seq_along(NAMES)) { [18:41:21.601] name <- changed[[kk]] [18:41:21.601] NAME <- NAMES[[kk]] [18:41:21.601] if (name != NAME && is.element(NAME, old_names)) [18:41:21.601] next [18:41:21.601] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:21.601] } [18:41:21.601] NAMES <- toupper(added) [18:41:21.601] for (kk in seq_along(NAMES)) { [18:41:21.601] name <- added[[kk]] [18:41:21.601] NAME <- NAMES[[kk]] [18:41:21.601] if (name != NAME && is.element(NAME, old_names)) [18:41:21.601] next [18:41:21.601] args[[name]] <- "" [18:41:21.601] } [18:41:21.601] NAMES <- toupper(removed) [18:41:21.601] for (kk in seq_along(NAMES)) { [18:41:21.601] name <- removed[[kk]] [18:41:21.601] NAME <- NAMES[[kk]] [18:41:21.601] if (name != NAME && is.element(NAME, old_names)) [18:41:21.601] next [18:41:21.601] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:21.601] } [18:41:21.601] if (length(args) > 0) [18:41:21.601] base::do.call(base::Sys.setenv, args = args) [18:41:21.601] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:21.601] } [18:41:21.601] else { [18:41:21.601] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:21.601] } [18:41:21.601] { [18:41:21.601] if (base::length(...future.futureOptionsAdded) > [18:41:21.601] 0L) { [18:41:21.601] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:21.601] base::names(opts) <- ...future.futureOptionsAdded [18:41:21.601] base::options(opts) [18:41:21.601] } [18:41:21.601] { [18:41:21.601] { [18:41:21.601] NULL [18:41:21.601] RNGkind("Mersenne-Twister") [18:41:21.601] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:21.601] inherits = FALSE) [18:41:21.601] } [18:41:21.601] options(future.plan = NULL) [18:41:21.601] if (is.na(NA_character_)) [18:41:21.601] Sys.unsetenv("R_FUTURE_PLAN") [18:41:21.601] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:21.601] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:21.601] .init = FALSE) [18:41:21.601] } [18:41:21.601] } [18:41:21.601] } [18:41:21.601] }) [18:41:21.601] if (TRUE) { [18:41:21.601] base::sink(type = "output", split = FALSE) [18:41:21.601] if (TRUE) { [18:41:21.601] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:21.601] } [18:41:21.601] else { [18:41:21.601] ...future.result["stdout"] <- base::list(NULL) [18:41:21.601] } [18:41:21.601] base::close(...future.stdout) [18:41:21.601] ...future.stdout <- NULL [18:41:21.601] } [18:41:21.601] ...future.result$conditions <- ...future.conditions [18:41:21.601] ...future.result$finished <- base::Sys.time() [18:41:21.601] ...future.result [18:41:21.601] } [18:41:21.605] assign_globals() ... [18:41:21.605] List of 5 [18:41:21.605] $ ...future.FUN :function (x, ...) [18:41:21.605] $ future.call.arguments : list() [18:41:21.605] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:21.605] $ ...future.elements_ii :List of 2 [18:41:21.605] ..$ b:Classes 'listenv', 'environment' [18:41:21.605] ..$ a:Classes 'listenv', 'environment' [18:41:21.605] $ ...future.seeds_ii : NULL [18:41:21.605] $ ...future.globals.maxSize: NULL [18:41:21.605] - attr(*, "where")=List of 5 [18:41:21.605] ..$ ...future.FUN : [18:41:21.605] ..$ future.call.arguments : [18:41:21.605] ..$ ...future.elements_ii : [18:41:21.605] ..$ ...future.seeds_ii : [18:41:21.605] ..$ ...future.globals.maxSize: [18:41:21.605] - attr(*, "resolved")= logi FALSE [18:41:21.605] - attr(*, "total_size")= num 8620 [18:41:21.605] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:21.605] - attr(*, "already-done")= logi TRUE [18:41:21.611] - copied '...future.FUN' to environment [18:41:21.611] - copied 'future.call.arguments' to environment [18:41:21.611] - copied '...future.elements_ii' to environment [18:41:21.612] - copied '...future.seeds_ii' to environment [18:41:21.612] - copied '...future.globals.maxSize' to environment [18:41:21.612] assign_globals() ... done [18:41:21.613] plan(): Setting new future strategy stack: [18:41:21.613] List of future strategies: [18:41:21.613] 1. sequential: [18:41:21.613] - args: function (..., envir = parent.frame(), workers = "") [18:41:21.613] - tweaked: FALSE [18:41:21.613] - call: NULL [18:41:21.613] plan(): nbrOfWorkers() = 1 [18:41:21.615] plan(): Setting new future strategy stack: [18:41:21.615] List of future strategies: [18:41:21.615] 1. sequential: [18:41:21.615] - args: function (..., envir = parent.frame(), workers = "") [18:41:21.615] - tweaked: FALSE [18:41:21.615] - call: plan(strategy) [18:41:21.616] plan(): nbrOfWorkers() = 1 [18:41:21.616] SequentialFuture started (and completed) [18:41:21.616] - Launch lazy future ... done [18:41:21.616] run() for 'SequentialFuture' ... done [18:41:21.616] Created future: [18:41:21.617] SequentialFuture: [18:41:21.617] Label: 'future_lapply-1' [18:41:21.617] Expression: [18:41:21.617] { [18:41:21.617] do.call(function(...) { [18:41:21.617] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:21.617] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:21.617] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:21.617] on.exit(options(oopts), add = TRUE) [18:41:21.617] } [18:41:21.617] { [18:41:21.617] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:21.617] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:21.617] ...future.FUN(...future.X_jj, ...) [18:41:21.617] }) [18:41:21.617] } [18:41:21.617] }, args = future.call.arguments) [18:41:21.617] } [18:41:21.617] Lazy evaluation: FALSE [18:41:21.617] Asynchronous evaluation: FALSE [18:41:21.617] Local evaluation: TRUE [18:41:21.617] Environment: R_GlobalEnv [18:41:21.617] Capture standard output: TRUE [18:41:21.617] Capture condition classes: 'condition' (excluding 'nothing') [18:41:21.617] Globals: 5 objects totaling 4.14 KiB (function '...future.FUN' of 911 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 3.10 KiB, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:21.617] Packages: 1 packages ('listenv') [18:41:21.617] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:21.617] Resolved: TRUE [18:41:21.617] Value: 154 bytes of class 'list' [18:41:21.617] Early signaling: FALSE [18:41:21.617] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:21.617] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:21.618] Chunk #1 of 1 ... DONE [18:41:21.618] Launching 1 futures (chunks) ... DONE [18:41:21.618] Resolving 1 futures (chunks) ... [18:41:21.618] resolve() on list ... [18:41:21.619] recursive: 0 [18:41:21.619] length: 1 [18:41:21.619] [18:41:21.619] resolved() for 'SequentialFuture' ... [18:41:21.619] - state: 'finished' [18:41:21.619] - run: TRUE [18:41:21.620] - result: 'FutureResult' [18:41:21.620] resolved() for 'SequentialFuture' ... done [18:41:21.620] Future #1 [18:41:21.620] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:21.620] - nx: 1 [18:41:21.620] - relay: TRUE [18:41:21.621] - stdout: TRUE [18:41:21.621] - signal: TRUE [18:41:21.621] - resignal: FALSE [18:41:21.621] - force: TRUE [18:41:21.624] - relayed: [n=1] FALSE [18:41:21.624] - queued futures: [n=1] FALSE [18:41:21.624] - until=1 [18:41:21.624] - relaying element #1 [18:41:21.624] - relayed: [n=1] TRUE [18:41:21.624] - queued futures: [n=1] TRUE [18:41:21.625] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:21.625] length: 0 (resolved future 1) [18:41:21.625] Relaying remaining futures [18:41:21.625] signalConditionsASAP(NULL, pos=0) ... [18:41:21.625] - nx: 1 [18:41:21.625] - relay: TRUE [18:41:21.626] - stdout: TRUE [18:41:21.626] - signal: TRUE [18:41:21.626] - resignal: FALSE [18:41:21.626] - force: TRUE [18:41:21.626] - relayed: [n=1] TRUE [18:41:21.626] - queued futures: [n=1] TRUE - flush all [18:41:21.626] - relayed: [n=1] TRUE [18:41:21.627] - queued futures: [n=1] TRUE [18:41:21.627] signalConditionsASAP(NULL, pos=0) ... done [18:41:21.627] resolve() on list ... DONE [18:41:21.627] - Number of value chunks collected: 1 [18:41:21.627] Resolving 1 futures (chunks) ... DONE [18:41:21.627] Reducing values from 1 chunks ... [18:41:21.628] - Number of values collected after concatenation: 2 [18:41:21.628] - Number of values expected: 2 [18:41:21.628] Reverse index remapping (attribute 'ordering'): [n = 2] 2, 1 [18:41:21.628] Reducing values from 1 chunks ... DONE [18:41:21.628] future_lapply() ... DONE List of 1 $ y:List of 2 ..$ a: Named chr "A" .. ..- attr(*, "names")= chr "A" ..$ b: Named chr [1:2] "A" "B" .. ..- attr(*, "names")= chr [1:2] "A" "B" - future_lapply(x, FUN, ...) for large length(x) ... [18:41:21.630] future_lapply() ... [18:41:21.631] Number of chunks: 1 [18:41:21.631] getGlobalsAndPackagesXApply() ... [18:41:21.631] - future.globals: TRUE [18:41:21.631] getGlobalsAndPackages() ... [18:41:21.631] Searching for globals... [18:41:21.633] - globals found: [4] 'FUN', 'sqrt', '+', 'a' [18:41:21.633] Searching for globals ... DONE [18:41:21.633] Resolving globals: FALSE [18:41:21.634] The total size of the 2 globals is 438 bytes (438 bytes) [18:41:21.634] The total size of the 2 globals exported for future expression ('FUN()') is 438 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There are two globals: 'FUN' (399 bytes of class 'function') and 'a' (39 bytes of class 'numeric') [18:41:21.634] - globals: [2] 'FUN', 'a' [18:41:21.635] [18:41:21.635] getGlobalsAndPackages() ... DONE [18:41:21.635] - globals found/used: [n=2] 'FUN', 'a' [18:41:21.635] - needed namespaces: [n=0] [18:41:21.635] Finding globals ... DONE [18:41:21.635] - use_args: TRUE [18:41:21.635] - Getting '...' globals ... [18:41:21.636] resolve() on list ... [18:41:21.636] recursive: 0 [18:41:21.636] length: 1 [18:41:21.636] elements: '...' [18:41:21.637] length: 0 (resolved future 1) [18:41:21.637] resolve() on list ... DONE [18:41:21.637] - '...' content: [n=0] [18:41:21.637] List of 1 [18:41:21.637] $ ...: list() [18:41:21.637] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:21.637] - attr(*, "where")=List of 1 [18:41:21.637] ..$ ...: [18:41:21.637] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:21.637] - attr(*, "resolved")= logi TRUE [18:41:21.637] - attr(*, "total_size")= num NA [18:41:21.640] - Getting '...' globals ... DONE [18:41:21.640] Globals to be used in all futures (chunks): [n=3] '...future.FUN', 'a', '...' [18:41:21.640] List of 3 [18:41:21.640] $ ...future.FUN:function (z) [18:41:21.640] $ a : num 3.14 [18:41:21.640] $ ... : list() [18:41:21.640] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:21.640] - attr(*, "where")=List of 3 [18:41:21.640] ..$ ...future.FUN: [18:41:21.640] ..$ a : [18:41:21.640] ..$ ... : [18:41:21.640] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:21.640] - attr(*, "resolved")= logi FALSE [18:41:21.640] - attr(*, "total_size")= int 4016 [18:41:21.644] Packages to be attached in all futures: [n=0] [18:41:21.644] getGlobalsAndPackagesXApply() ... DONE [18:41:21.644] Number of futures (= number of chunks): 1 [18:41:21.645] Launching 1 futures (chunks) ... [18:41:21.645] Chunk #1 of 1 ... [18:41:21.646] - Finding globals in 'X' for chunk #1 ... [18:41:21.647] getGlobalsAndPackages() ... [18:41:21.647] Searching for globals... [18:41:21.652] [18:41:21.652] Searching for globals ... DONE [18:41:21.653] - globals: [0] [18:41:21.653] getGlobalsAndPackages() ... DONE [18:41:21.653] + additional globals found: [n=0] [18:41:21.653] + additional namespaces needed: [n=0] [18:41:21.653] - Finding globals in 'X' for chunk #1 ... DONE [18:41:21.653] - seeds: [18:41:21.653] - All globals exported: [n=6] '...future.FUN', 'a', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:21.654] getGlobalsAndPackages() ... [18:41:21.654] - globals passed as-is: [6] '...future.FUN', 'a', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:21.654] Resolving globals: FALSE [18:41:21.654] Tweak future expression to call with '...' arguments ... [18:41:21.654] { [18:41:21.654] do.call(function(...) { [18:41:21.654] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:21.654] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:21.654] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:21.654] on.exit(options(oopts), add = TRUE) [18:41:21.654] } [18:41:21.654] { [18:41:21.654] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:21.654] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:21.654] ...future.FUN(...future.X_jj, ...) [18:41:21.654] }) [18:41:21.654] } [18:41:21.654] }, args = future.call.arguments) [18:41:21.654] } [18:41:21.655] Tweak future expression to call with '...' arguments ... DONE [18:41:21.655] - globals: [6] '...future.FUN', 'a', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:21.655] [18:41:21.655] getGlobalsAndPackages() ... DONE [18:41:21.656] run() for 'Future' ... [18:41:21.656] - state: 'created' [18:41:21.656] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:21.656] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:21.657] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:21.657] - Field: 'label' [18:41:21.657] - Field: 'local' [18:41:21.657] - Field: 'owner' [18:41:21.657] - Field: 'envir' [18:41:21.657] - Field: 'packages' [18:41:21.657] - Field: 'gc' [18:41:21.658] - Field: 'conditions' [18:41:21.658] - Field: 'expr' [18:41:21.658] - Field: 'uuid' [18:41:21.658] - Field: 'seed' [18:41:21.658] - Field: 'version' [18:41:21.659] - Field: 'result' [18:41:21.659] - Field: 'asynchronous' [18:41:21.659] - Field: 'calls' [18:41:21.659] - Field: 'globals' [18:41:21.659] - Field: 'stdout' [18:41:21.659] - Field: 'earlySignal' [18:41:21.659] - Field: 'lazy' [18:41:21.660] - Field: 'state' [18:41:21.660] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:21.660] - Launch lazy future ... [18:41:21.660] Packages needed by the future expression (n = 0): [18:41:21.660] Packages needed by future strategies (n = 0): [18:41:21.661] { [18:41:21.661] { [18:41:21.661] { [18:41:21.661] ...future.startTime <- base::Sys.time() [18:41:21.661] { [18:41:21.661] { [18:41:21.661] { [18:41:21.661] base::local({ [18:41:21.661] has_future <- base::requireNamespace("future", [18:41:21.661] quietly = TRUE) [18:41:21.661] if (has_future) { [18:41:21.661] ns <- base::getNamespace("future") [18:41:21.661] version <- ns[[".package"]][["version"]] [18:41:21.661] if (is.null(version)) [18:41:21.661] version <- utils::packageVersion("future") [18:41:21.661] } [18:41:21.661] else { [18:41:21.661] version <- NULL [18:41:21.661] } [18:41:21.661] if (!has_future || version < "1.8.0") { [18:41:21.661] info <- base::c(r_version = base::gsub("R version ", [18:41:21.661] "", base::R.version$version.string), [18:41:21.661] platform = base::sprintf("%s (%s-bit)", [18:41:21.661] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:21.661] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:21.661] "release", "version")], collapse = " "), [18:41:21.661] hostname = base::Sys.info()[["nodename"]]) [18:41:21.661] info <- base::sprintf("%s: %s", base::names(info), [18:41:21.661] info) [18:41:21.661] info <- base::paste(info, collapse = "; ") [18:41:21.661] if (!has_future) { [18:41:21.661] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:21.661] info) [18:41:21.661] } [18:41:21.661] else { [18:41:21.661] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:21.661] info, version) [18:41:21.661] } [18:41:21.661] base::stop(msg) [18:41:21.661] } [18:41:21.661] }) [18:41:21.661] } [18:41:21.661] ...future.strategy.old <- future::plan("list") [18:41:21.661] options(future.plan = NULL) [18:41:21.661] Sys.unsetenv("R_FUTURE_PLAN") [18:41:21.661] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:21.661] } [18:41:21.661] ...future.workdir <- getwd() [18:41:21.661] } [18:41:21.661] ...future.oldOptions <- base::as.list(base::.Options) [18:41:21.661] ...future.oldEnvVars <- base::Sys.getenv() [18:41:21.661] } [18:41:21.661] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:21.661] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:21.661] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:21.661] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:21.661] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:21.661] future.stdout.windows.reencode = NULL, width = 80L) [18:41:21.661] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:21.661] base::names(...future.oldOptions)) [18:41:21.661] } [18:41:21.661] if (FALSE) { [18:41:21.661] } [18:41:21.661] else { [18:41:21.661] if (TRUE) { [18:41:21.661] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:21.661] open = "w") [18:41:21.661] } [18:41:21.661] else { [18:41:21.661] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:21.661] windows = "NUL", "/dev/null"), open = "w") [18:41:21.661] } [18:41:21.661] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:21.661] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:21.661] base::sink(type = "output", split = FALSE) [18:41:21.661] base::close(...future.stdout) [18:41:21.661] }, add = TRUE) [18:41:21.661] } [18:41:21.661] ...future.frame <- base::sys.nframe() [18:41:21.661] ...future.conditions <- base::list() [18:41:21.661] ...future.rng <- base::globalenv()$.Random.seed [18:41:21.661] if (FALSE) { [18:41:21.661] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:21.661] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:21.661] } [18:41:21.661] ...future.result <- base::tryCatch({ [18:41:21.661] base::withCallingHandlers({ [18:41:21.661] ...future.value <- base::withVisible(base::local({ [18:41:21.661] do.call(function(...) { [18:41:21.661] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:21.661] if (!identical(...future.globals.maxSize.org, [18:41:21.661] ...future.globals.maxSize)) { [18:41:21.661] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:21.661] on.exit(options(oopts), add = TRUE) [18:41:21.661] } [18:41:21.661] { [18:41:21.661] lapply(seq_along(...future.elements_ii), [18:41:21.661] FUN = function(jj) { [18:41:21.661] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:21.661] ...future.FUN(...future.X_jj, ...) [18:41:21.661] }) [18:41:21.661] } [18:41:21.661] }, args = future.call.arguments) [18:41:21.661] })) [18:41:21.661] future::FutureResult(value = ...future.value$value, [18:41:21.661] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:21.661] ...future.rng), globalenv = if (FALSE) [18:41:21.661] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:21.661] ...future.globalenv.names)) [18:41:21.661] else NULL, started = ...future.startTime, version = "1.8") [18:41:21.661] }, condition = base::local({ [18:41:21.661] c <- base::c [18:41:21.661] inherits <- base::inherits [18:41:21.661] invokeRestart <- base::invokeRestart [18:41:21.661] length <- base::length [18:41:21.661] list <- base::list [18:41:21.661] seq.int <- base::seq.int [18:41:21.661] signalCondition <- base::signalCondition [18:41:21.661] sys.calls <- base::sys.calls [18:41:21.661] `[[` <- base::`[[` [18:41:21.661] `+` <- base::`+` [18:41:21.661] `<<-` <- base::`<<-` [18:41:21.661] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:21.661] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:21.661] 3L)] [18:41:21.661] } [18:41:21.661] function(cond) { [18:41:21.661] is_error <- inherits(cond, "error") [18:41:21.661] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:21.661] NULL) [18:41:21.661] if (is_error) { [18:41:21.661] sessionInformation <- function() { [18:41:21.661] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:21.661] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:21.661] search = base::search(), system = base::Sys.info()) [18:41:21.661] } [18:41:21.661] ...future.conditions[[length(...future.conditions) + [18:41:21.661] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:21.661] cond$call), session = sessionInformation(), [18:41:21.661] timestamp = base::Sys.time(), signaled = 0L) [18:41:21.661] signalCondition(cond) [18:41:21.661] } [18:41:21.661] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:21.661] "immediateCondition"))) { [18:41:21.661] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:21.661] ...future.conditions[[length(...future.conditions) + [18:41:21.661] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:21.661] if (TRUE && !signal) { [18:41:21.661] muffleCondition <- function (cond, pattern = "^muffle") [18:41:21.661] { [18:41:21.661] inherits <- base::inherits [18:41:21.661] invokeRestart <- base::invokeRestart [18:41:21.661] is.null <- base::is.null [18:41:21.661] muffled <- FALSE [18:41:21.661] if (inherits(cond, "message")) { [18:41:21.661] muffled <- grepl(pattern, "muffleMessage") [18:41:21.661] if (muffled) [18:41:21.661] invokeRestart("muffleMessage") [18:41:21.661] } [18:41:21.661] else if (inherits(cond, "warning")) { [18:41:21.661] muffled <- grepl(pattern, "muffleWarning") [18:41:21.661] if (muffled) [18:41:21.661] invokeRestart("muffleWarning") [18:41:21.661] } [18:41:21.661] else if (inherits(cond, "condition")) { [18:41:21.661] if (!is.null(pattern)) { [18:41:21.661] computeRestarts <- base::computeRestarts [18:41:21.661] grepl <- base::grepl [18:41:21.661] restarts <- computeRestarts(cond) [18:41:21.661] for (restart in restarts) { [18:41:21.661] name <- restart$name [18:41:21.661] if (is.null(name)) [18:41:21.661] next [18:41:21.661] if (!grepl(pattern, name)) [18:41:21.661] next [18:41:21.661] invokeRestart(restart) [18:41:21.661] muffled <- TRUE [18:41:21.661] break [18:41:21.661] } [18:41:21.661] } [18:41:21.661] } [18:41:21.661] invisible(muffled) [18:41:21.661] } [18:41:21.661] muffleCondition(cond, pattern = "^muffle") [18:41:21.661] } [18:41:21.661] } [18:41:21.661] else { [18:41:21.661] if (TRUE) { [18:41:21.661] muffleCondition <- function (cond, pattern = "^muffle") [18:41:21.661] { [18:41:21.661] inherits <- base::inherits [18:41:21.661] invokeRestart <- base::invokeRestart [18:41:21.661] is.null <- base::is.null [18:41:21.661] muffled <- FALSE [18:41:21.661] if (inherits(cond, "message")) { [18:41:21.661] muffled <- grepl(pattern, "muffleMessage") [18:41:21.661] if (muffled) [18:41:21.661] invokeRestart("muffleMessage") [18:41:21.661] } [18:41:21.661] else if (inherits(cond, "warning")) { [18:41:21.661] muffled <- grepl(pattern, "muffleWarning") [18:41:21.661] if (muffled) [18:41:21.661] invokeRestart("muffleWarning") [18:41:21.661] } [18:41:21.661] else if (inherits(cond, "condition")) { [18:41:21.661] if (!is.null(pattern)) { [18:41:21.661] computeRestarts <- base::computeRestarts [18:41:21.661] grepl <- base::grepl [18:41:21.661] restarts <- computeRestarts(cond) [18:41:21.661] for (restart in restarts) { [18:41:21.661] name <- restart$name [18:41:21.661] if (is.null(name)) [18:41:21.661] next [18:41:21.661] if (!grepl(pattern, name)) [18:41:21.661] next [18:41:21.661] invokeRestart(restart) [18:41:21.661] muffled <- TRUE [18:41:21.661] break [18:41:21.661] } [18:41:21.661] } [18:41:21.661] } [18:41:21.661] invisible(muffled) [18:41:21.661] } [18:41:21.661] muffleCondition(cond, pattern = "^muffle") [18:41:21.661] } [18:41:21.661] } [18:41:21.661] } [18:41:21.661] })) [18:41:21.661] }, error = function(ex) { [18:41:21.661] base::structure(base::list(value = NULL, visible = NULL, [18:41:21.661] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:21.661] ...future.rng), started = ...future.startTime, [18:41:21.661] finished = Sys.time(), session_uuid = NA_character_, [18:41:21.661] version = "1.8"), class = "FutureResult") [18:41:21.661] }, finally = { [18:41:21.661] if (!identical(...future.workdir, getwd())) [18:41:21.661] setwd(...future.workdir) [18:41:21.661] { [18:41:21.661] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:21.661] ...future.oldOptions$nwarnings <- NULL [18:41:21.661] } [18:41:21.661] base::options(...future.oldOptions) [18:41:21.661] if (.Platform$OS.type == "windows") { [18:41:21.661] old_names <- names(...future.oldEnvVars) [18:41:21.661] envs <- base::Sys.getenv() [18:41:21.661] names <- names(envs) [18:41:21.661] common <- intersect(names, old_names) [18:41:21.661] added <- setdiff(names, old_names) [18:41:21.661] removed <- setdiff(old_names, names) [18:41:21.661] changed <- common[...future.oldEnvVars[common] != [18:41:21.661] envs[common]] [18:41:21.661] NAMES <- toupper(changed) [18:41:21.661] args <- list() [18:41:21.661] for (kk in seq_along(NAMES)) { [18:41:21.661] name <- changed[[kk]] [18:41:21.661] NAME <- NAMES[[kk]] [18:41:21.661] if (name != NAME && is.element(NAME, old_names)) [18:41:21.661] next [18:41:21.661] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:21.661] } [18:41:21.661] NAMES <- toupper(added) [18:41:21.661] for (kk in seq_along(NAMES)) { [18:41:21.661] name <- added[[kk]] [18:41:21.661] NAME <- NAMES[[kk]] [18:41:21.661] if (name != NAME && is.element(NAME, old_names)) [18:41:21.661] next [18:41:21.661] args[[name]] <- "" [18:41:21.661] } [18:41:21.661] NAMES <- toupper(removed) [18:41:21.661] for (kk in seq_along(NAMES)) { [18:41:21.661] name <- removed[[kk]] [18:41:21.661] NAME <- NAMES[[kk]] [18:41:21.661] if (name != NAME && is.element(NAME, old_names)) [18:41:21.661] next [18:41:21.661] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:21.661] } [18:41:21.661] if (length(args) > 0) [18:41:21.661] base::do.call(base::Sys.setenv, args = args) [18:41:21.661] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:21.661] } [18:41:21.661] else { [18:41:21.661] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:21.661] } [18:41:21.661] { [18:41:21.661] if (base::length(...future.futureOptionsAdded) > [18:41:21.661] 0L) { [18:41:21.661] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:21.661] base::names(opts) <- ...future.futureOptionsAdded [18:41:21.661] base::options(opts) [18:41:21.661] } [18:41:21.661] { [18:41:21.661] { [18:41:21.661] NULL [18:41:21.661] RNGkind("Mersenne-Twister") [18:41:21.661] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:21.661] inherits = FALSE) [18:41:21.661] } [18:41:21.661] options(future.plan = NULL) [18:41:21.661] if (is.na(NA_character_)) [18:41:21.661] Sys.unsetenv("R_FUTURE_PLAN") [18:41:21.661] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:21.661] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:21.661] .init = FALSE) [18:41:21.661] } [18:41:21.661] } [18:41:21.661] } [18:41:21.661] }) [18:41:21.661] if (TRUE) { [18:41:21.661] base::sink(type = "output", split = FALSE) [18:41:21.661] if (TRUE) { [18:41:21.661] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:21.661] } [18:41:21.661] else { [18:41:21.661] ...future.result["stdout"] <- base::list(NULL) [18:41:21.661] } [18:41:21.661] base::close(...future.stdout) [18:41:21.661] ...future.stdout <- NULL [18:41:21.661] } [18:41:21.661] ...future.result$conditions <- ...future.conditions [18:41:21.661] ...future.result$finished <- base::Sys.time() [18:41:21.661] ...future.result [18:41:21.661] } [18:41:21.665] assign_globals() ... [18:41:21.665] List of 6 [18:41:21.665] $ ...future.FUN :function (z) [18:41:21.665] $ a : num 3.14 [18:41:21.665] $ future.call.arguments : list() [18:41:21.665] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:21.665] $ ...future.elements_ii :List of 10000 [18:41:21.665] ..$ : int 1 [18:41:21.665] ..$ : int 2 [18:41:21.665] ..$ : int 3 [18:41:21.665] ..$ : int 4 [18:41:21.665] ..$ : int 5 [18:41:21.665] ..$ : int 6 [18:41:21.665] ..$ : int 7 [18:41:21.665] ..$ : int 8 [18:41:21.665] ..$ : int 9 [18:41:21.665] ..$ : int 10 [18:41:21.665] ..$ : int 11 [18:41:21.665] ..$ : int 12 [18:41:21.665] ..$ : int 13 [18:41:21.665] ..$ : int 14 [18:41:21.665] ..$ : int 15 [18:41:21.665] ..$ : int 16 [18:41:21.665] ..$ : int 17 [18:41:21.665] ..$ : int 18 [18:41:21.665] ..$ : int 19 [18:41:21.665] ..$ : int 20 [18:41:21.665] ..$ : int 21 [18:41:21.665] ..$ : int 22 [18:41:21.665] ..$ : int 23 [18:41:21.665] ..$ : int 24 [18:41:21.665] ..$ : int 25 [18:41:21.665] ..$ : int 26 [18:41:21.665] ..$ : int 27 [18:41:21.665] ..$ : int 28 [18:41:21.665] ..$ : int 29 [18:41:21.665] ..$ : int 30 [18:41:21.665] ..$ : int 31 [18:41:21.665] ..$ : int 32 [18:41:21.665] ..$ : int 33 [18:41:21.665] ..$ : int 34 [18:41:21.665] ..$ : int 35 [18:41:21.665] ..$ : int 36 [18:41:21.665] ..$ : int 37 [18:41:21.665] ..$ : int 38 [18:41:21.665] ..$ : int 39 [18:41:21.665] ..$ : int 40 [18:41:21.665] ..$ : int 41 [18:41:21.665] ..$ : int 42 [18:41:21.665] ..$ : int 43 [18:41:21.665] ..$ : int 44 [18:41:21.665] ..$ : int 45 [18:41:21.665] ..$ : int 46 [18:41:21.665] ..$ : int 47 [18:41:21.665] ..$ : int 48 [18:41:21.665] ..$ : int 49 [18:41:21.665] ..$ : int 50 [18:41:21.665] ..$ : int 51 [18:41:21.665] ..$ : int 52 [18:41:21.665] ..$ : int 53 [18:41:21.665] ..$ : int 54 [18:41:21.665] ..$ : int 55 [18:41:21.665] ..$ : int 56 [18:41:21.665] ..$ : int 57 [18:41:21.665] ..$ : int 58 [18:41:21.665] ..$ : int 59 [18:41:21.665] ..$ : int 60 [18:41:21.665] ..$ : int 61 [18:41:21.665] ..$ : int 62 [18:41:21.665] ..$ : int 63 [18:41:21.665] ..$ : int 64 [18:41:21.665] ..$ : int 65 [18:41:21.665] ..$ : int 66 [18:41:21.665] ..$ : int 67 [18:41:21.665] ..$ : int 68 [18:41:21.665] ..$ : int 69 [18:41:21.665] ..$ : int 70 [18:41:21.665] ..$ : int 71 [18:41:21.665] ..$ : int 72 [18:41:21.665] ..$ : int 73 [18:41:21.665] ..$ : int 74 [18:41:21.665] ..$ : int 75 [18:41:21.665] ..$ : int 76 [18:41:21.665] ..$ : int 77 [18:41:21.665] ..$ : int 78 [18:41:21.665] ..$ : int 79 [18:41:21.665] ..$ : int 80 [18:41:21.665] ..$ : int 81 [18:41:21.665] ..$ : int 82 [18:41:21.665] ..$ : int 83 [18:41:21.665] ..$ : int 84 [18:41:21.665] ..$ : int 85 [18:41:21.665] ..$ : int 86 [18:41:21.665] ..$ : int 87 [18:41:21.665] ..$ : int 88 [18:41:21.665] ..$ : int 89 [18:41:21.665] ..$ : int 90 [18:41:21.665] ..$ : int 91 [18:41:21.665] ..$ : int 92 [18:41:21.665] ..$ : int 93 [18:41:21.665] ..$ : int 94 [18:41:21.665] ..$ : int 95 [18:41:21.665] ..$ : int 96 [18:41:21.665] ..$ : int 97 [18:41:21.665] ..$ : int 98 [18:41:21.665] ..$ : int 99 [18:41:21.665] .. [list output truncated] [18:41:21.665] $ ...future.seeds_ii : NULL [18:41:21.665] $ ...future.globals.maxSize: NULL [18:41:21.665] - attr(*, "where")=List of 6 [18:41:21.665] ..$ ...future.FUN : [18:41:21.665] ..$ a : [18:41:21.665] ..$ future.call.arguments : [18:41:21.665] ..$ ...future.elements_ii : [18:41:21.665] ..$ ...future.seeds_ii : [18:41:21.665] ..$ ...future.globals.maxSize: [18:41:21.665] - attr(*, "resolved")= logi FALSE [18:41:21.665] - attr(*, "total_size")= num 4016 [18:41:21.665] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:21.665] - attr(*, "already-done")= logi TRUE [18:41:21.716] - reassign environment for '...future.FUN' [18:41:21.717] - copied '...future.FUN' to environment [18:41:21.717] - copied 'a' to environment [18:41:21.717] - copied 'future.call.arguments' to environment [18:41:21.717] - copied '...future.elements_ii' to environment [18:41:21.717] - copied '...future.seeds_ii' to environment [18:41:21.717] - copied '...future.globals.maxSize' to environment [18:41:21.718] assign_globals() ... done [18:41:21.718] plan(): Setting new future strategy stack: [18:41:21.718] List of future strategies: [18:41:21.718] 1. sequential: [18:41:21.718] - args: function (..., envir = parent.frame(), workers = "") [18:41:21.718] - tweaked: FALSE [18:41:21.718] - call: NULL [18:41:21.719] plan(): nbrOfWorkers() = 1 [18:41:21.738] plan(): Setting new future strategy stack: [18:41:21.739] List of future strategies: [18:41:21.739] 1. sequential: [18:41:21.739] - args: function (..., envir = parent.frame(), workers = "") [18:41:21.739] - tweaked: FALSE [18:41:21.739] - call: plan(strategy) [18:41:21.739] plan(): nbrOfWorkers() = 1 [18:41:21.740] SequentialFuture started (and completed) [18:41:21.740] - Launch lazy future ... done [18:41:21.740] run() for 'SequentialFuture' ... done [18:41:21.740] Created future: [18:41:21.740] SequentialFuture: [18:41:21.740] Label: 'future_lapply-1' [18:41:21.740] Expression: [18:41:21.740] { [18:41:21.740] do.call(function(...) { [18:41:21.740] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:21.740] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:21.740] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:21.740] on.exit(options(oopts), add = TRUE) [18:41:21.740] } [18:41:21.740] { [18:41:21.740] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:21.740] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:21.740] ...future.FUN(...future.X_jj, ...) [18:41:21.740] }) [18:41:21.740] } [18:41:21.740] }, args = future.call.arguments) [18:41:21.740] } [18:41:21.740] Lazy evaluation: FALSE [18:41:21.740] Asynchronous evaluation: FALSE [18:41:21.740] Local evaluation: TRUE [18:41:21.740] Environment: R_GlobalEnv [18:41:21.740] Capture standard output: TRUE [18:41:21.740] Capture condition classes: 'condition' (excluding 'nothing') [18:41:21.740] Globals: 6 objects totaling 117.79 KiB (function '...future.FUN' of 399 bytes, numeric 'a' of 39 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 117.22 KiB, NULL '...future.seeds_ii' of 27 bytes, ...) [18:41:21.740] Packages: [18:41:21.740] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:21.740] Resolved: TRUE [18:41:21.740] Value: 156.28 KiB of class 'list' [18:41:21.740] Early signaling: FALSE [18:41:21.740] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:21.740] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:21.742] Chunk #1 of 1 ... DONE [18:41:21.742] Launching 1 futures (chunks) ... DONE [18:41:21.742] Resolving 1 futures (chunks) ... [18:41:21.743] resolve() on list ... [18:41:21.743] recursive: 0 [18:41:21.743] length: 1 [18:41:21.743] [18:41:21.743] resolved() for 'SequentialFuture' ... [18:41:21.743] - state: 'finished' [18:41:21.744] - run: TRUE [18:41:21.744] - result: 'FutureResult' [18:41:21.744] resolved() for 'SequentialFuture' ... done [18:41:21.744] Future #1 [18:41:21.744] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:21.745] - nx: 1 [18:41:21.745] - relay: TRUE [18:41:21.745] - stdout: TRUE [18:41:21.745] - signal: TRUE [18:41:21.745] - resignal: FALSE [18:41:21.745] - force: TRUE [18:41:21.746] - relayed: [n=1] FALSE [18:41:21.746] - queued futures: [n=1] FALSE [18:41:21.746] - until=1 [18:41:21.746] - relaying element #1 [18:41:21.746] - relayed: [n=1] TRUE [18:41:21.746] - queued futures: [n=1] TRUE [18:41:21.747] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:21.747] length: 0 (resolved future 1) [18:41:21.747] Relaying remaining futures [18:41:21.747] signalConditionsASAP(NULL, pos=0) ... [18:41:21.747] - nx: 1 [18:41:21.747] - relay: TRUE [18:41:21.748] - stdout: TRUE [18:41:21.748] - signal: TRUE [18:41:21.748] - resignal: FALSE [18:41:21.748] - force: TRUE [18:41:21.748] - relayed: [n=1] TRUE [18:41:21.748] - queued futures: [n=1] TRUE - flush all [18:41:21.749] - relayed: [n=1] TRUE [18:41:21.749] - queued futures: [n=1] TRUE [18:41:21.749] signalConditionsASAP(NULL, pos=0) ... done [18:41:21.749] resolve() on list ... DONE [18:41:21.749] - Number of value chunks collected: 1 [18:41:21.750] Resolving 1 futures (chunks) ... DONE [18:41:21.750] Reducing values from 1 chunks ... [18:41:21.750] - Number of values collected after concatenation: 10000 [18:41:21.750] - Number of values expected: 10000 [18:41:21.750] Reducing values from 1 chunks ... DONE [18:41:21.751] future_lapply() ... DONE - future_lapply(x, FUN = table, ...) ... [18:41:21.751] future_lapply() ... [18:41:21.798] Number of chunks: 1 [18:41:21.799] getGlobalsAndPackagesXApply() ... [18:41:21.799] - future.globals: TRUE [18:41:21.799] getGlobalsAndPackages() ... [18:41:21.799] Searching for globals... [18:41:21.843] - globals found: [59] 'FUN', 'if', '==', 'c', 'list.names', '{', '<-', '[', 'as.list', 'substitute', '-', '&&', 'length', 'is.list', '!', 'is.null', 'names', 'return', 'seq_along', 'vapply', 'switch', '+', 'is.symbol', 'as.character', 'deparse', '[<-', 'missing', 'match', 'match.arg', '!=', 'warning', 'list', '[[', 'paste', 'stop', 'integer', 'for', 'is.factor', 'anyNA', 'options', 'on.exit', 'factor', '(', '||', 'levels', 'as.integer', 'which', 'is.na', 'is.na<-', '>', 'prod', '$', '.Machine', '*', 'names<-', 'array', 'tabulate', 'class', 'class<-' [18:41:21.843] Searching for globals ... DONE [18:41:21.844] Resolving globals: FALSE [18:41:21.846] The total size of the 1 globals is 31.30 KiB (32048 bytes) [18:41:21.847] The total size of the 1 globals exported for future expression ('FUN()') is 31.30 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (31.30 KiB of class 'function') [18:41:21.847] - globals: [1] 'FUN' [18:41:21.847] [18:41:21.847] getGlobalsAndPackages() ... DONE [18:41:21.847] - globals found/used: [n=1] 'FUN' [18:41:21.848] - needed namespaces: [n=0] [18:41:21.848] Finding globals ... DONE [18:41:21.848] - use_args: TRUE [18:41:21.848] - Getting '...' globals ... [18:41:21.849] resolve() on list ... [18:41:21.849] recursive: 0 [18:41:21.849] length: 1 [18:41:21.849] elements: '...' [18:41:21.849] length: 0 (resolved future 1) [18:41:21.850] resolve() on list ... DONE [18:41:21.850] - '...' content: [n=0] [18:41:21.850] List of 1 [18:41:21.850] $ ...: list() [18:41:21.850] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:21.850] - attr(*, "where")=List of 1 [18:41:21.850] ..$ ...: [18:41:21.850] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:21.850] - attr(*, "resolved")= logi TRUE [18:41:21.850] - attr(*, "total_size")= num NA [18:41:21.854] - Getting '...' globals ... DONE [18:41:21.854] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:21.854] List of 2 [18:41:21.854] $ ...future.FUN:function (..., exclude = if (useNA == "no") c(NA, NaN), useNA = c("no", [18:41:21.854] "ifany", "always"), dnn = list.names(...), deparse.level = 1) [18:41:21.854] $ ... : list() [18:41:21.854] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:21.854] - attr(*, "where")=List of 2 [18:41:21.854] ..$ ...future.FUN: [18:41:21.854] ..$ ... : [18:41:21.854] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:21.854] - attr(*, "resolved")= logi FALSE [18:41:21.854] - attr(*, "total_size")= int 67153 [18:41:21.858] Packages to be attached in all futures: [n=0] [18:41:21.858] getGlobalsAndPackagesXApply() ... DONE [18:41:21.858] Number of futures (= number of chunks): 1 [18:41:21.859] Launching 1 futures (chunks) ... [18:41:21.859] Chunk #1 of 1 ... [18:41:21.859] - Finding globals in 'X' for chunk #1 ... [18:41:21.859] getGlobalsAndPackages() ... [18:41:21.859] Searching for globals... [18:41:21.860] [18:41:21.860] Searching for globals ... DONE [18:41:21.860] - globals: [0] [18:41:21.860] getGlobalsAndPackages() ... DONE [18:41:21.860] + additional globals found: [n=0] [18:41:21.861] + additional namespaces needed: [n=0] [18:41:21.861] - Finding globals in 'X' for chunk #1 ... DONE [18:41:21.861] - seeds: [18:41:21.861] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:21.861] getGlobalsAndPackages() ... [18:41:21.861] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:21.862] Resolving globals: FALSE [18:41:21.862] Tweak future expression to call with '...' arguments ... [18:41:21.862] { [18:41:21.862] do.call(function(...) { [18:41:21.862] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:21.862] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:21.862] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:21.862] on.exit(options(oopts), add = TRUE) [18:41:21.862] } [18:41:21.862] { [18:41:21.862] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:21.862] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:21.862] ...future.FUN(...future.X_jj, ...) [18:41:21.862] }) [18:41:21.862] } [18:41:21.862] }, args = future.call.arguments) [18:41:21.862] } [18:41:21.862] Tweak future expression to call with '...' arguments ... DONE [18:41:21.863] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:21.863] [18:41:21.863] getGlobalsAndPackages() ... DONE [18:41:21.864] run() for 'Future' ... [18:41:21.864] - state: 'created' [18:41:21.864] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:21.865] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:21.865] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:21.865] - Field: 'label' [18:41:21.865] - Field: 'local' [18:41:21.866] - Field: 'owner' [18:41:21.866] - Field: 'envir' [18:41:21.866] - Field: 'packages' [18:41:21.866] - Field: 'gc' [18:41:21.869] - Field: 'conditions' [18:41:21.869] - Field: 'expr' [18:41:21.869] - Field: 'uuid' [18:41:21.870] - Field: 'seed' [18:41:21.870] - Field: 'version' [18:41:21.870] - Field: 'result' [18:41:21.870] - Field: 'asynchronous' [18:41:21.870] - Field: 'calls' [18:41:21.870] - Field: 'globals' [18:41:21.871] - Field: 'stdout' [18:41:21.871] - Field: 'earlySignal' [18:41:21.871] - Field: 'lazy' [18:41:21.871] - Field: 'state' [18:41:21.871] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:21.871] - Launch lazy future ... [18:41:21.872] Packages needed by the future expression (n = 0): [18:41:21.872] Packages needed by future strategies (n = 0): [18:41:21.872] { [18:41:21.872] { [18:41:21.872] { [18:41:21.872] ...future.startTime <- base::Sys.time() [18:41:21.872] { [18:41:21.872] { [18:41:21.872] { [18:41:21.872] base::local({ [18:41:21.872] has_future <- base::requireNamespace("future", [18:41:21.872] quietly = TRUE) [18:41:21.872] if (has_future) { [18:41:21.872] ns <- base::getNamespace("future") [18:41:21.872] version <- ns[[".package"]][["version"]] [18:41:21.872] if (is.null(version)) [18:41:21.872] version <- utils::packageVersion("future") [18:41:21.872] } [18:41:21.872] else { [18:41:21.872] version <- NULL [18:41:21.872] } [18:41:21.872] if (!has_future || version < "1.8.0") { [18:41:21.872] info <- base::c(r_version = base::gsub("R version ", [18:41:21.872] "", base::R.version$version.string), [18:41:21.872] platform = base::sprintf("%s (%s-bit)", [18:41:21.872] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:21.872] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:21.872] "release", "version")], collapse = " "), [18:41:21.872] hostname = base::Sys.info()[["nodename"]]) [18:41:21.872] info <- base::sprintf("%s: %s", base::names(info), [18:41:21.872] info) [18:41:21.872] info <- base::paste(info, collapse = "; ") [18:41:21.872] if (!has_future) { [18:41:21.872] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:21.872] info) [18:41:21.872] } [18:41:21.872] else { [18:41:21.872] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:21.872] info, version) [18:41:21.872] } [18:41:21.872] base::stop(msg) [18:41:21.872] } [18:41:21.872] }) [18:41:21.872] } [18:41:21.872] ...future.strategy.old <- future::plan("list") [18:41:21.872] options(future.plan = NULL) [18:41:21.872] Sys.unsetenv("R_FUTURE_PLAN") [18:41:21.872] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:21.872] } [18:41:21.872] ...future.workdir <- getwd() [18:41:21.872] } [18:41:21.872] ...future.oldOptions <- base::as.list(base::.Options) [18:41:21.872] ...future.oldEnvVars <- base::Sys.getenv() [18:41:21.872] } [18:41:21.872] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:21.872] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:21.872] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:21.872] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:21.872] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:21.872] future.stdout.windows.reencode = NULL, width = 80L) [18:41:21.872] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:21.872] base::names(...future.oldOptions)) [18:41:21.872] } [18:41:21.872] if (FALSE) { [18:41:21.872] } [18:41:21.872] else { [18:41:21.872] if (TRUE) { [18:41:21.872] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:21.872] open = "w") [18:41:21.872] } [18:41:21.872] else { [18:41:21.872] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:21.872] windows = "NUL", "/dev/null"), open = "w") [18:41:21.872] } [18:41:21.872] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:21.872] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:21.872] base::sink(type = "output", split = FALSE) [18:41:21.872] base::close(...future.stdout) [18:41:21.872] }, add = TRUE) [18:41:21.872] } [18:41:21.872] ...future.frame <- base::sys.nframe() [18:41:21.872] ...future.conditions <- base::list() [18:41:21.872] ...future.rng <- base::globalenv()$.Random.seed [18:41:21.872] if (FALSE) { [18:41:21.872] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:21.872] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:21.872] } [18:41:21.872] ...future.result <- base::tryCatch({ [18:41:21.872] base::withCallingHandlers({ [18:41:21.872] ...future.value <- base::withVisible(base::local({ [18:41:21.872] do.call(function(...) { [18:41:21.872] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:21.872] if (!identical(...future.globals.maxSize.org, [18:41:21.872] ...future.globals.maxSize)) { [18:41:21.872] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:21.872] on.exit(options(oopts), add = TRUE) [18:41:21.872] } [18:41:21.872] { [18:41:21.872] lapply(seq_along(...future.elements_ii), [18:41:21.872] FUN = function(jj) { [18:41:21.872] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:21.872] ...future.FUN(...future.X_jj, ...) [18:41:21.872] }) [18:41:21.872] } [18:41:21.872] }, args = future.call.arguments) [18:41:21.872] })) [18:41:21.872] future::FutureResult(value = ...future.value$value, [18:41:21.872] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:21.872] ...future.rng), globalenv = if (FALSE) [18:41:21.872] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:21.872] ...future.globalenv.names)) [18:41:21.872] else NULL, started = ...future.startTime, version = "1.8") [18:41:21.872] }, condition = base::local({ [18:41:21.872] c <- base::c [18:41:21.872] inherits <- base::inherits [18:41:21.872] invokeRestart <- base::invokeRestart [18:41:21.872] length <- base::length [18:41:21.872] list <- base::list [18:41:21.872] seq.int <- base::seq.int [18:41:21.872] signalCondition <- base::signalCondition [18:41:21.872] sys.calls <- base::sys.calls [18:41:21.872] `[[` <- base::`[[` [18:41:21.872] `+` <- base::`+` [18:41:21.872] `<<-` <- base::`<<-` [18:41:21.872] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:21.872] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:21.872] 3L)] [18:41:21.872] } [18:41:21.872] function(cond) { [18:41:21.872] is_error <- inherits(cond, "error") [18:41:21.872] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:21.872] NULL) [18:41:21.872] if (is_error) { [18:41:21.872] sessionInformation <- function() { [18:41:21.872] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:21.872] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:21.872] search = base::search(), system = base::Sys.info()) [18:41:21.872] } [18:41:21.872] ...future.conditions[[length(...future.conditions) + [18:41:21.872] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:21.872] cond$call), session = sessionInformation(), [18:41:21.872] timestamp = base::Sys.time(), signaled = 0L) [18:41:21.872] signalCondition(cond) [18:41:21.872] } [18:41:21.872] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:21.872] "immediateCondition"))) { [18:41:21.872] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:21.872] ...future.conditions[[length(...future.conditions) + [18:41:21.872] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:21.872] if (TRUE && !signal) { [18:41:21.872] muffleCondition <- function (cond, pattern = "^muffle") [18:41:21.872] { [18:41:21.872] inherits <- base::inherits [18:41:21.872] invokeRestart <- base::invokeRestart [18:41:21.872] is.null <- base::is.null [18:41:21.872] muffled <- FALSE [18:41:21.872] if (inherits(cond, "message")) { [18:41:21.872] muffled <- grepl(pattern, "muffleMessage") [18:41:21.872] if (muffled) [18:41:21.872] invokeRestart("muffleMessage") [18:41:21.872] } [18:41:21.872] else if (inherits(cond, "warning")) { [18:41:21.872] muffled <- grepl(pattern, "muffleWarning") [18:41:21.872] if (muffled) [18:41:21.872] invokeRestart("muffleWarning") [18:41:21.872] } [18:41:21.872] else if (inherits(cond, "condition")) { [18:41:21.872] if (!is.null(pattern)) { [18:41:21.872] computeRestarts <- base::computeRestarts [18:41:21.872] grepl <- base::grepl [18:41:21.872] restarts <- computeRestarts(cond) [18:41:21.872] for (restart in restarts) { [18:41:21.872] name <- restart$name [18:41:21.872] if (is.null(name)) [18:41:21.872] next [18:41:21.872] if (!grepl(pattern, name)) [18:41:21.872] next [18:41:21.872] invokeRestart(restart) [18:41:21.872] muffled <- TRUE [18:41:21.872] break [18:41:21.872] } [18:41:21.872] } [18:41:21.872] } [18:41:21.872] invisible(muffled) [18:41:21.872] } [18:41:21.872] muffleCondition(cond, pattern = "^muffle") [18:41:21.872] } [18:41:21.872] } [18:41:21.872] else { [18:41:21.872] if (TRUE) { [18:41:21.872] muffleCondition <- function (cond, pattern = "^muffle") [18:41:21.872] { [18:41:21.872] inherits <- base::inherits [18:41:21.872] invokeRestart <- base::invokeRestart [18:41:21.872] is.null <- base::is.null [18:41:21.872] muffled <- FALSE [18:41:21.872] if (inherits(cond, "message")) { [18:41:21.872] muffled <- grepl(pattern, "muffleMessage") [18:41:21.872] if (muffled) [18:41:21.872] invokeRestart("muffleMessage") [18:41:21.872] } [18:41:21.872] else if (inherits(cond, "warning")) { [18:41:21.872] muffled <- grepl(pattern, "muffleWarning") [18:41:21.872] if (muffled) [18:41:21.872] invokeRestart("muffleWarning") [18:41:21.872] } [18:41:21.872] else if (inherits(cond, "condition")) { [18:41:21.872] if (!is.null(pattern)) { [18:41:21.872] computeRestarts <- base::computeRestarts [18:41:21.872] grepl <- base::grepl [18:41:21.872] restarts <- computeRestarts(cond) [18:41:21.872] for (restart in restarts) { [18:41:21.872] name <- restart$name [18:41:21.872] if (is.null(name)) [18:41:21.872] next [18:41:21.872] if (!grepl(pattern, name)) [18:41:21.872] next [18:41:21.872] invokeRestart(restart) [18:41:21.872] muffled <- TRUE [18:41:21.872] break [18:41:21.872] } [18:41:21.872] } [18:41:21.872] } [18:41:21.872] invisible(muffled) [18:41:21.872] } [18:41:21.872] muffleCondition(cond, pattern = "^muffle") [18:41:21.872] } [18:41:21.872] } [18:41:21.872] } [18:41:21.872] })) [18:41:21.872] }, error = function(ex) { [18:41:21.872] base::structure(base::list(value = NULL, visible = NULL, [18:41:21.872] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:21.872] ...future.rng), started = ...future.startTime, [18:41:21.872] finished = Sys.time(), session_uuid = NA_character_, [18:41:21.872] version = "1.8"), class = "FutureResult") [18:41:21.872] }, finally = { [18:41:21.872] if (!identical(...future.workdir, getwd())) [18:41:21.872] setwd(...future.workdir) [18:41:21.872] { [18:41:21.872] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:21.872] ...future.oldOptions$nwarnings <- NULL [18:41:21.872] } [18:41:21.872] base::options(...future.oldOptions) [18:41:21.872] if (.Platform$OS.type == "windows") { [18:41:21.872] old_names <- names(...future.oldEnvVars) [18:41:21.872] envs <- base::Sys.getenv() [18:41:21.872] names <- names(envs) [18:41:21.872] common <- intersect(names, old_names) [18:41:21.872] added <- setdiff(names, old_names) [18:41:21.872] removed <- setdiff(old_names, names) [18:41:21.872] changed <- common[...future.oldEnvVars[common] != [18:41:21.872] envs[common]] [18:41:21.872] NAMES <- toupper(changed) [18:41:21.872] args <- list() [18:41:21.872] for (kk in seq_along(NAMES)) { [18:41:21.872] name <- changed[[kk]] [18:41:21.872] NAME <- NAMES[[kk]] [18:41:21.872] if (name != NAME && is.element(NAME, old_names)) [18:41:21.872] next [18:41:21.872] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:21.872] } [18:41:21.872] NAMES <- toupper(added) [18:41:21.872] for (kk in seq_along(NAMES)) { [18:41:21.872] name <- added[[kk]] [18:41:21.872] NAME <- NAMES[[kk]] [18:41:21.872] if (name != NAME && is.element(NAME, old_names)) [18:41:21.872] next [18:41:21.872] args[[name]] <- "" [18:41:21.872] } [18:41:21.872] NAMES <- toupper(removed) [18:41:21.872] for (kk in seq_along(NAMES)) { [18:41:21.872] name <- removed[[kk]] [18:41:21.872] NAME <- NAMES[[kk]] [18:41:21.872] if (name != NAME && is.element(NAME, old_names)) [18:41:21.872] next [18:41:21.872] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:21.872] } [18:41:21.872] if (length(args) > 0) [18:41:21.872] base::do.call(base::Sys.setenv, args = args) [18:41:21.872] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:21.872] } [18:41:21.872] else { [18:41:21.872] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:21.872] } [18:41:21.872] { [18:41:21.872] if (base::length(...future.futureOptionsAdded) > [18:41:21.872] 0L) { [18:41:21.872] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:21.872] base::names(opts) <- ...future.futureOptionsAdded [18:41:21.872] base::options(opts) [18:41:21.872] } [18:41:21.872] { [18:41:21.872] { [18:41:21.872] NULL [18:41:21.872] RNGkind("Mersenne-Twister") [18:41:21.872] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:21.872] inherits = FALSE) [18:41:21.872] } [18:41:21.872] options(future.plan = NULL) [18:41:21.872] if (is.na(NA_character_)) [18:41:21.872] Sys.unsetenv("R_FUTURE_PLAN") [18:41:21.872] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:21.872] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:21.872] .init = FALSE) [18:41:21.872] } [18:41:21.872] } [18:41:21.872] } [18:41:21.872] }) [18:41:21.872] if (TRUE) { [18:41:21.872] base::sink(type = "output", split = FALSE) [18:41:21.872] if (TRUE) { [18:41:21.872] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:21.872] } [18:41:21.872] else { [18:41:21.872] ...future.result["stdout"] <- base::list(NULL) [18:41:21.872] } [18:41:21.872] base::close(...future.stdout) [18:41:21.872] ...future.stdout <- NULL [18:41:21.872] } [18:41:21.872] ...future.result$conditions <- ...future.conditions [18:41:21.872] ...future.result$finished <- base::Sys.time() [18:41:21.872] ...future.result [18:41:21.872] } [18:41:21.876] assign_globals() ... [18:41:21.877] List of 5 [18:41:21.877] $ ...future.FUN :function (..., exclude = if (useNA == "no") c(NA, NaN), useNA = c("no", [18:41:21.877] "ifany", "always"), dnn = list.names(...), deparse.level = 1) [18:41:21.877] $ future.call.arguments : list() [18:41:21.877] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:21.877] $ ...future.elements_ii :List of 2 [18:41:21.877] ..$ a: int [1:4] 1 2 3 4 [18:41:21.877] ..$ b: int [1:4] 5 6 7 8 [18:41:21.877] $ ...future.seeds_ii : NULL [18:41:21.877] $ ...future.globals.maxSize: NULL [18:41:21.877] - attr(*, "where")=List of 5 [18:41:21.877] ..$ ...future.FUN : [18:41:21.877] ..$ future.call.arguments : [18:41:21.877] ..$ ...future.elements_ii : [18:41:21.877] ..$ ...future.seeds_ii : [18:41:21.877] ..$ ...future.globals.maxSize: [18:41:21.877] - attr(*, "resolved")= logi FALSE [18:41:21.877] - attr(*, "total_size")= num 67153 [18:41:21.877] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:21.877] - attr(*, "already-done")= logi TRUE [18:41:21.883] - copied '...future.FUN' to environment [18:41:21.883] - copied 'future.call.arguments' to environment [18:41:21.883] - copied '...future.elements_ii' to environment [18:41:21.883] - copied '...future.seeds_ii' to environment [18:41:21.883] - copied '...future.globals.maxSize' to environment [18:41:21.884] assign_globals() ... done [18:41:21.884] plan(): Setting new future strategy stack: [18:41:21.884] List of future strategies: [18:41:21.884] 1. sequential: [18:41:21.884] - args: function (..., envir = parent.frame(), workers = "") [18:41:21.884] - tweaked: FALSE [18:41:21.884] - call: NULL [18:41:21.885] plan(): nbrOfWorkers() = 1 [18:41:21.886] plan(): Setting new future strategy stack: [18:41:21.887] List of future strategies: [18:41:21.887] 1. sequential: [18:41:21.887] - args: function (..., envir = parent.frame(), workers = "") [18:41:21.887] - tweaked: FALSE [18:41:21.887] - call: plan(strategy) [18:41:21.887] plan(): nbrOfWorkers() = 1 [18:41:21.887] SequentialFuture started (and completed) [18:41:21.888] - Launch lazy future ... done [18:41:21.888] run() for 'SequentialFuture' ... done [18:41:21.888] Created future: [18:41:21.888] SequentialFuture: [18:41:21.888] Label: 'future_lapply-1' [18:41:21.888] Expression: [18:41:21.888] { [18:41:21.888] do.call(function(...) { [18:41:21.888] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:21.888] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:21.888] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:21.888] on.exit(options(oopts), add = TRUE) [18:41:21.888] } [18:41:21.888] { [18:41:21.888] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:21.888] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:21.888] ...future.FUN(...future.X_jj, ...) [18:41:21.888] }) [18:41:21.888] } [18:41:21.888] }, args = future.call.arguments) [18:41:21.888] } [18:41:21.888] Lazy evaluation: FALSE [18:41:21.888] Asynchronous evaluation: FALSE [18:41:21.888] Local evaluation: TRUE [18:41:21.888] Environment: R_GlobalEnv [18:41:21.888] Capture standard output: TRUE [18:41:21.888] Capture condition classes: 'condition' (excluding 'nothing') [18:41:21.888] Globals: 5 objects totaling 31.71 KiB (function '...future.FUN' of 31.30 KiB, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 268 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:21.888] Packages: [18:41:21.888] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:21.888] Resolved: TRUE [18:41:21.888] Value: 442 bytes of class 'list' [18:41:21.888] Early signaling: FALSE [18:41:21.888] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:21.888] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:21.890] Chunk #1 of 1 ... DONE [18:41:21.890] Launching 1 futures (chunks) ... DONE [18:41:21.890] Resolving 1 futures (chunks) ... [18:41:21.890] resolve() on list ... [18:41:21.890] recursive: 0 [18:41:21.891] length: 1 [18:41:21.891] [18:41:21.891] resolved() for 'SequentialFuture' ... [18:41:21.891] - state: 'finished' [18:41:21.891] - run: TRUE [18:41:21.891] - result: 'FutureResult' [18:41:21.892] resolved() for 'SequentialFuture' ... done [18:41:21.892] Future #1 [18:41:21.892] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:21.892] - nx: 1 [18:41:21.893] - relay: TRUE [18:41:21.893] - stdout: TRUE [18:41:21.893] - signal: TRUE [18:41:21.893] - resignal: FALSE [18:41:21.893] - force: TRUE [18:41:21.893] - relayed: [n=1] FALSE [18:41:21.893] - queued futures: [n=1] FALSE [18:41:21.894] - until=1 [18:41:21.894] - relaying element #1 [18:41:21.894] - relayed: [n=1] TRUE [18:41:21.894] - queued futures: [n=1] TRUE [18:41:21.894] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:21.895] length: 0 (resolved future 1) [18:41:21.895] Relaying remaining futures [18:41:21.895] signalConditionsASAP(NULL, pos=0) ... [18:41:21.895] - nx: 1 [18:41:21.895] - relay: TRUE [18:41:21.895] - stdout: TRUE [18:41:21.896] - signal: TRUE [18:41:21.896] - resignal: FALSE [18:41:21.896] - force: TRUE [18:41:21.896] - relayed: [n=1] TRUE [18:41:21.896] - queued futures: [n=1] TRUE - flush all [18:41:21.896] - relayed: [n=1] TRUE [18:41:21.897] - queued futures: [n=1] TRUE [18:41:21.897] signalConditionsASAP(NULL, pos=0) ... done [18:41:21.897] resolve() on list ... DONE [18:41:21.897] - Number of value chunks collected: 1 [18:41:21.897] Resolving 1 futures (chunks) ... DONE [18:41:21.897] Reducing values from 1 chunks ... [18:41:21.898] - Number of values collected after concatenation: 2 [18:41:21.898] - Number of values expected: 2 [18:41:21.898] Reducing values from 1 chunks ... DONE [18:41:21.898] future_lapply() ... DONE - future_lapply(x, ...) where length(x) != length(as.list(x)) ... [18:41:21.898] future_lapply() ... [18:41:21.899] Number of chunks: 1 [18:41:21.899] getGlobalsAndPackagesXApply() ... [18:41:21.899] - future.globals: TRUE [18:41:21.899] getGlobalsAndPackages() ... [18:41:21.899] Searching for globals... [18:41:21.900] - globals found: [1] 'FUN' [18:41:21.900] Searching for globals ... DONE [18:41:21.900] Resolving globals: FALSE [18:41:21.901] The total size of the 1 globals is 37 bytes (37 bytes) [18:41:21.901] The total size of the 1 globals exported for future expression ('FUN()') is 37 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (37 bytes of class 'function') [18:41:21.902] - globals: [1] 'FUN' [18:41:21.902] [18:41:21.902] getGlobalsAndPackages() ... DONE [18:41:21.902] - globals found/used: [n=1] 'FUN' [18:41:21.902] - needed namespaces: [n=0] [18:41:21.902] Finding globals ... DONE [18:41:21.903] - use_args: TRUE [18:41:21.903] - Getting '...' globals ... [18:41:21.903] resolve() on list ... [18:41:21.903] recursive: 0 [18:41:21.904] length: 1 [18:41:21.904] elements: '...' [18:41:21.904] length: 0 (resolved future 1) [18:41:21.904] resolve() on list ... DONE [18:41:21.904] - '...' content: [n=0] [18:41:21.904] List of 1 [18:41:21.904] $ ...: list() [18:41:21.904] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:21.904] - attr(*, "where")=List of 1 [18:41:21.904] ..$ ...: [18:41:21.904] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:21.904] - attr(*, "resolved")= logi TRUE [18:41:21.904] - attr(*, "total_size")= num NA [18:41:21.907] - Getting '...' globals ... DONE [18:41:21.907] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:21.908] List of 2 [18:41:21.908] $ ...future.FUN:function (x) [18:41:21.908] $ ... : list() [18:41:21.908] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:21.908] - attr(*, "where")=List of 2 [18:41:21.908] ..$ ...future.FUN: [18:41:21.908] ..$ ... : [18:41:21.908] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:21.908] - attr(*, "resolved")= logi FALSE [18:41:21.908] - attr(*, "total_size")= int 2891 [18:41:21.911] Packages to be attached in all futures: [n=0] [18:41:21.911] getGlobalsAndPackagesXApply() ... DONE [18:41:21.912] Number of futures (= number of chunks): 1 [18:41:21.912] Launching 1 futures (chunks) ... [18:41:21.912] Chunk #1 of 1 ... [18:41:21.912] - Finding globals in 'X' for chunk #1 ... [18:41:21.912] getGlobalsAndPackages() ... [18:41:21.912] Searching for globals... [18:41:21.913] [18:41:21.913] Searching for globals ... DONE [18:41:21.913] - globals: [0] [18:41:21.913] getGlobalsAndPackages() ... DONE [18:41:21.913] + additional globals found: [n=0] [18:41:21.914] + additional namespaces needed: [n=0] [18:41:21.914] - Finding globals in 'X' for chunk #1 ... DONE [18:41:21.914] - seeds: [18:41:21.914] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:21.914] getGlobalsAndPackages() ... [18:41:21.914] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:21.915] Resolving globals: FALSE [18:41:21.915] Tweak future expression to call with '...' arguments ... [18:41:21.915] { [18:41:21.915] do.call(function(...) { [18:41:21.915] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:21.915] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:21.915] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:21.915] on.exit(options(oopts), add = TRUE) [18:41:21.915] } [18:41:21.915] { [18:41:21.915] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:21.915] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:21.915] ...future.FUN(...future.X_jj, ...) [18:41:21.915] }) [18:41:21.915] } [18:41:21.915] }, args = future.call.arguments) [18:41:21.915] } [18:41:21.915] Tweak future expression to call with '...' arguments ... DONE [18:41:21.916] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:21.916] [18:41:21.916] getGlobalsAndPackages() ... DONE [18:41:21.916] run() for 'Future' ... [18:41:21.917] - state: 'created' [18:41:21.917] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:21.917] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:21.917] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:21.918] - Field: 'label' [18:41:21.918] - Field: 'local' [18:41:21.918] - Field: 'owner' [18:41:21.918] - Field: 'envir' [18:41:21.918] - Field: 'packages' [18:41:21.919] - Field: 'gc' [18:41:21.919] - Field: 'conditions' [18:41:21.919] - Field: 'expr' [18:41:21.919] - Field: 'uuid' [18:41:21.919] - Field: 'seed' [18:41:21.919] - Field: 'version' [18:41:21.920] - Field: 'result' [18:41:21.920] - Field: 'asynchronous' [18:41:21.920] - Field: 'calls' [18:41:21.920] - Field: 'globals' [18:41:21.920] - Field: 'stdout' [18:41:21.920] - Field: 'earlySignal' [18:41:21.921] - Field: 'lazy' [18:41:21.921] - Field: 'state' [18:41:21.921] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:21.921] - Launch lazy future ... [18:41:21.921] Packages needed by the future expression (n = 0): [18:41:21.921] Packages needed by future strategies (n = 0): [18:41:21.922] { [18:41:21.922] { [18:41:21.922] { [18:41:21.922] ...future.startTime <- base::Sys.time() [18:41:21.922] { [18:41:21.922] { [18:41:21.922] { [18:41:21.922] base::local({ [18:41:21.922] has_future <- base::requireNamespace("future", [18:41:21.922] quietly = TRUE) [18:41:21.922] if (has_future) { [18:41:21.922] ns <- base::getNamespace("future") [18:41:21.922] version <- ns[[".package"]][["version"]] [18:41:21.922] if (is.null(version)) [18:41:21.922] version <- utils::packageVersion("future") [18:41:21.922] } [18:41:21.922] else { [18:41:21.922] version <- NULL [18:41:21.922] } [18:41:21.922] if (!has_future || version < "1.8.0") { [18:41:21.922] info <- base::c(r_version = base::gsub("R version ", [18:41:21.922] "", base::R.version$version.string), [18:41:21.922] platform = base::sprintf("%s (%s-bit)", [18:41:21.922] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:21.922] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:21.922] "release", "version")], collapse = " "), [18:41:21.922] hostname = base::Sys.info()[["nodename"]]) [18:41:21.922] info <- base::sprintf("%s: %s", base::names(info), [18:41:21.922] info) [18:41:21.922] info <- base::paste(info, collapse = "; ") [18:41:21.922] if (!has_future) { [18:41:21.922] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:21.922] info) [18:41:21.922] } [18:41:21.922] else { [18:41:21.922] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:21.922] info, version) [18:41:21.922] } [18:41:21.922] base::stop(msg) [18:41:21.922] } [18:41:21.922] }) [18:41:21.922] } [18:41:21.922] ...future.strategy.old <- future::plan("list") [18:41:21.922] options(future.plan = NULL) [18:41:21.922] Sys.unsetenv("R_FUTURE_PLAN") [18:41:21.922] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:21.922] } [18:41:21.922] ...future.workdir <- getwd() [18:41:21.922] } [18:41:21.922] ...future.oldOptions <- base::as.list(base::.Options) [18:41:21.922] ...future.oldEnvVars <- base::Sys.getenv() [18:41:21.922] } [18:41:21.922] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:21.922] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:21.922] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:21.922] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:21.922] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:21.922] future.stdout.windows.reencode = NULL, width = 80L) [18:41:21.922] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:21.922] base::names(...future.oldOptions)) [18:41:21.922] } [18:41:21.922] if (FALSE) { [18:41:21.922] } [18:41:21.922] else { [18:41:21.922] if (TRUE) { [18:41:21.922] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:21.922] open = "w") [18:41:21.922] } [18:41:21.922] else { [18:41:21.922] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:21.922] windows = "NUL", "/dev/null"), open = "w") [18:41:21.922] } [18:41:21.922] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:21.922] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:21.922] base::sink(type = "output", split = FALSE) [18:41:21.922] base::close(...future.stdout) [18:41:21.922] }, add = TRUE) [18:41:21.922] } [18:41:21.922] ...future.frame <- base::sys.nframe() [18:41:21.922] ...future.conditions <- base::list() [18:41:21.922] ...future.rng <- base::globalenv()$.Random.seed [18:41:21.922] if (FALSE) { [18:41:21.922] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:21.922] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:21.922] } [18:41:21.922] ...future.result <- base::tryCatch({ [18:41:21.922] base::withCallingHandlers({ [18:41:21.922] ...future.value <- base::withVisible(base::local({ [18:41:21.922] do.call(function(...) { [18:41:21.922] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:21.922] if (!identical(...future.globals.maxSize.org, [18:41:21.922] ...future.globals.maxSize)) { [18:41:21.922] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:21.922] on.exit(options(oopts), add = TRUE) [18:41:21.922] } [18:41:21.922] { [18:41:21.922] lapply(seq_along(...future.elements_ii), [18:41:21.922] FUN = function(jj) { [18:41:21.922] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:21.922] ...future.FUN(...future.X_jj, ...) [18:41:21.922] }) [18:41:21.922] } [18:41:21.922] }, args = future.call.arguments) [18:41:21.922] })) [18:41:21.922] future::FutureResult(value = ...future.value$value, [18:41:21.922] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:21.922] ...future.rng), globalenv = if (FALSE) [18:41:21.922] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:21.922] ...future.globalenv.names)) [18:41:21.922] else NULL, started = ...future.startTime, version = "1.8") [18:41:21.922] }, condition = base::local({ [18:41:21.922] c <- base::c [18:41:21.922] inherits <- base::inherits [18:41:21.922] invokeRestart <- base::invokeRestart [18:41:21.922] length <- base::length [18:41:21.922] list <- base::list [18:41:21.922] seq.int <- base::seq.int [18:41:21.922] signalCondition <- base::signalCondition [18:41:21.922] sys.calls <- base::sys.calls [18:41:21.922] `[[` <- base::`[[` [18:41:21.922] `+` <- base::`+` [18:41:21.922] `<<-` <- base::`<<-` [18:41:21.922] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:21.922] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:21.922] 3L)] [18:41:21.922] } [18:41:21.922] function(cond) { [18:41:21.922] is_error <- inherits(cond, "error") [18:41:21.922] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:21.922] NULL) [18:41:21.922] if (is_error) { [18:41:21.922] sessionInformation <- function() { [18:41:21.922] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:21.922] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:21.922] search = base::search(), system = base::Sys.info()) [18:41:21.922] } [18:41:21.922] ...future.conditions[[length(...future.conditions) + [18:41:21.922] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:21.922] cond$call), session = sessionInformation(), [18:41:21.922] timestamp = base::Sys.time(), signaled = 0L) [18:41:21.922] signalCondition(cond) [18:41:21.922] } [18:41:21.922] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:21.922] "immediateCondition"))) { [18:41:21.922] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:21.922] ...future.conditions[[length(...future.conditions) + [18:41:21.922] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:21.922] if (TRUE && !signal) { [18:41:21.922] muffleCondition <- function (cond, pattern = "^muffle") [18:41:21.922] { [18:41:21.922] inherits <- base::inherits [18:41:21.922] invokeRestart <- base::invokeRestart [18:41:21.922] is.null <- base::is.null [18:41:21.922] muffled <- FALSE [18:41:21.922] if (inherits(cond, "message")) { [18:41:21.922] muffled <- grepl(pattern, "muffleMessage") [18:41:21.922] if (muffled) [18:41:21.922] invokeRestart("muffleMessage") [18:41:21.922] } [18:41:21.922] else if (inherits(cond, "warning")) { [18:41:21.922] muffled <- grepl(pattern, "muffleWarning") [18:41:21.922] if (muffled) [18:41:21.922] invokeRestart("muffleWarning") [18:41:21.922] } [18:41:21.922] else if (inherits(cond, "condition")) { [18:41:21.922] if (!is.null(pattern)) { [18:41:21.922] computeRestarts <- base::computeRestarts [18:41:21.922] grepl <- base::grepl [18:41:21.922] restarts <- computeRestarts(cond) [18:41:21.922] for (restart in restarts) { [18:41:21.922] name <- restart$name [18:41:21.922] if (is.null(name)) [18:41:21.922] next [18:41:21.922] if (!grepl(pattern, name)) [18:41:21.922] next [18:41:21.922] invokeRestart(restart) [18:41:21.922] muffled <- TRUE [18:41:21.922] break [18:41:21.922] } [18:41:21.922] } [18:41:21.922] } [18:41:21.922] invisible(muffled) [18:41:21.922] } [18:41:21.922] muffleCondition(cond, pattern = "^muffle") [18:41:21.922] } [18:41:21.922] } [18:41:21.922] else { [18:41:21.922] if (TRUE) { [18:41:21.922] muffleCondition <- function (cond, pattern = "^muffle") [18:41:21.922] { [18:41:21.922] inherits <- base::inherits [18:41:21.922] invokeRestart <- base::invokeRestart [18:41:21.922] is.null <- base::is.null [18:41:21.922] muffled <- FALSE [18:41:21.922] if (inherits(cond, "message")) { [18:41:21.922] muffled <- grepl(pattern, "muffleMessage") [18:41:21.922] if (muffled) [18:41:21.922] invokeRestart("muffleMessage") [18:41:21.922] } [18:41:21.922] else if (inherits(cond, "warning")) { [18:41:21.922] muffled <- grepl(pattern, "muffleWarning") [18:41:21.922] if (muffled) [18:41:21.922] invokeRestart("muffleWarning") [18:41:21.922] } [18:41:21.922] else if (inherits(cond, "condition")) { [18:41:21.922] if (!is.null(pattern)) { [18:41:21.922] computeRestarts <- base::computeRestarts [18:41:21.922] grepl <- base::grepl [18:41:21.922] restarts <- computeRestarts(cond) [18:41:21.922] for (restart in restarts) { [18:41:21.922] name <- restart$name [18:41:21.922] if (is.null(name)) [18:41:21.922] next [18:41:21.922] if (!grepl(pattern, name)) [18:41:21.922] next [18:41:21.922] invokeRestart(restart) [18:41:21.922] muffled <- TRUE [18:41:21.922] break [18:41:21.922] } [18:41:21.922] } [18:41:21.922] } [18:41:21.922] invisible(muffled) [18:41:21.922] } [18:41:21.922] muffleCondition(cond, pattern = "^muffle") [18:41:21.922] } [18:41:21.922] } [18:41:21.922] } [18:41:21.922] })) [18:41:21.922] }, error = function(ex) { [18:41:21.922] base::structure(base::list(value = NULL, visible = NULL, [18:41:21.922] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:21.922] ...future.rng), started = ...future.startTime, [18:41:21.922] finished = Sys.time(), session_uuid = NA_character_, [18:41:21.922] version = "1.8"), class = "FutureResult") [18:41:21.922] }, finally = { [18:41:21.922] if (!identical(...future.workdir, getwd())) [18:41:21.922] setwd(...future.workdir) [18:41:21.922] { [18:41:21.922] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:21.922] ...future.oldOptions$nwarnings <- NULL [18:41:21.922] } [18:41:21.922] base::options(...future.oldOptions) [18:41:21.922] if (.Platform$OS.type == "windows") { [18:41:21.922] old_names <- names(...future.oldEnvVars) [18:41:21.922] envs <- base::Sys.getenv() [18:41:21.922] names <- names(envs) [18:41:21.922] common <- intersect(names, old_names) [18:41:21.922] added <- setdiff(names, old_names) [18:41:21.922] removed <- setdiff(old_names, names) [18:41:21.922] changed <- common[...future.oldEnvVars[common] != [18:41:21.922] envs[common]] [18:41:21.922] NAMES <- toupper(changed) [18:41:21.922] args <- list() [18:41:21.922] for (kk in seq_along(NAMES)) { [18:41:21.922] name <- changed[[kk]] [18:41:21.922] NAME <- NAMES[[kk]] [18:41:21.922] if (name != NAME && is.element(NAME, old_names)) [18:41:21.922] next [18:41:21.922] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:21.922] } [18:41:21.922] NAMES <- toupper(added) [18:41:21.922] for (kk in seq_along(NAMES)) { [18:41:21.922] name <- added[[kk]] [18:41:21.922] NAME <- NAMES[[kk]] [18:41:21.922] if (name != NAME && is.element(NAME, old_names)) [18:41:21.922] next [18:41:21.922] args[[name]] <- "" [18:41:21.922] } [18:41:21.922] NAMES <- toupper(removed) [18:41:21.922] for (kk in seq_along(NAMES)) { [18:41:21.922] name <- removed[[kk]] [18:41:21.922] NAME <- NAMES[[kk]] [18:41:21.922] if (name != NAME && is.element(NAME, old_names)) [18:41:21.922] next [18:41:21.922] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:21.922] } [18:41:21.922] if (length(args) > 0) [18:41:21.922] base::do.call(base::Sys.setenv, args = args) [18:41:21.922] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:21.922] } [18:41:21.922] else { [18:41:21.922] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:21.922] } [18:41:21.922] { [18:41:21.922] if (base::length(...future.futureOptionsAdded) > [18:41:21.922] 0L) { [18:41:21.922] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:21.922] base::names(opts) <- ...future.futureOptionsAdded [18:41:21.922] base::options(opts) [18:41:21.922] } [18:41:21.922] { [18:41:21.922] { [18:41:21.922] NULL [18:41:21.922] RNGkind("Mersenne-Twister") [18:41:21.922] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:21.922] inherits = FALSE) [18:41:21.922] } [18:41:21.922] options(future.plan = NULL) [18:41:21.922] if (is.na(NA_character_)) [18:41:21.922] Sys.unsetenv("R_FUTURE_PLAN") [18:41:21.922] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:21.922] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:21.922] .init = FALSE) [18:41:21.922] } [18:41:21.922] } [18:41:21.922] } [18:41:21.922] }) [18:41:21.922] if (TRUE) { [18:41:21.922] base::sink(type = "output", split = FALSE) [18:41:21.922] if (TRUE) { [18:41:21.922] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:21.922] } [18:41:21.922] else { [18:41:21.922] ...future.result["stdout"] <- base::list(NULL) [18:41:21.922] } [18:41:21.922] base::close(...future.stdout) [18:41:21.922] ...future.stdout <- NULL [18:41:21.922] } [18:41:21.922] ...future.result$conditions <- ...future.conditions [18:41:21.922] ...future.result$finished <- base::Sys.time() [18:41:21.922] ...future.result [18:41:21.922] } [18:41:21.926] assign_globals() ... [18:41:21.926] List of 5 [18:41:21.926] $ ...future.FUN :function (x) [18:41:21.926] $ future.call.arguments : list() [18:41:21.926] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:21.926] $ ...future.elements_ii :List of 3 [18:41:21.926] ..$ a: num 1 [18:41:21.926] ..$ b: num 2 [18:41:21.926] ..$ c: num 3 [18:41:21.926] $ ...future.seeds_ii : NULL [18:41:21.926] $ ...future.globals.maxSize: NULL [18:41:21.926] - attr(*, "where")=List of 5 [18:41:21.926] ..$ ...future.FUN : [18:41:21.926] ..$ future.call.arguments : [18:41:21.926] ..$ ...future.elements_ii : [18:41:21.926] ..$ ...future.seeds_ii : [18:41:21.926] ..$ ...future.globals.maxSize: [18:41:21.926] - attr(*, "resolved")= logi FALSE [18:41:21.926] - attr(*, "total_size")= num 2891 [18:41:21.926] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:21.926] - attr(*, "already-done")= logi TRUE [18:41:21.932] - copied '...future.FUN' to environment [18:41:21.933] - copied 'future.call.arguments' to environment [18:41:21.933] - copied '...future.elements_ii' to environment [18:41:21.933] - copied '...future.seeds_ii' to environment [18:41:21.933] - copied '...future.globals.maxSize' to environment [18:41:21.933] assign_globals() ... done [18:41:21.934] plan(): Setting new future strategy stack: [18:41:21.934] List of future strategies: [18:41:21.934] 1. sequential: [18:41:21.934] - args: function (..., envir = parent.frame(), workers = "") [18:41:21.934] - tweaked: FALSE [18:41:21.934] - call: NULL [18:41:21.934] plan(): nbrOfWorkers() = 1 [18:41:21.936] plan(): Setting new future strategy stack: [18:41:21.936] List of future strategies: [18:41:21.936] 1. sequential: [18:41:21.936] - args: function (..., envir = parent.frame(), workers = "") [18:41:21.936] - tweaked: FALSE [18:41:21.936] - call: plan(strategy) [18:41:21.937] plan(): nbrOfWorkers() = 1 [18:41:21.937] SequentialFuture started (and completed) [18:41:21.937] - Launch lazy future ... done [18:41:21.937] run() for 'SequentialFuture' ... done [18:41:21.937] Created future: [18:41:21.938] SequentialFuture: [18:41:21.938] Label: 'future_lapply-1' [18:41:21.938] Expression: [18:41:21.938] { [18:41:21.938] do.call(function(...) { [18:41:21.938] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:21.938] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:21.938] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:21.938] on.exit(options(oopts), add = TRUE) [18:41:21.938] } [18:41:21.938] { [18:41:21.938] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:21.938] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:21.938] ...future.FUN(...future.X_jj, ...) [18:41:21.938] }) [18:41:21.938] } [18:41:21.938] }, args = future.call.arguments) [18:41:21.938] } [18:41:21.938] Lazy evaluation: FALSE [18:41:21.938] Asynchronous evaluation: FALSE [18:41:21.938] Local evaluation: TRUE [18:41:21.938] Environment: R_GlobalEnv [18:41:21.938] Capture standard output: TRUE [18:41:21.938] Capture condition classes: 'condition' (excluding 'nothing') [18:41:21.938] Globals: 5 objects totaling 327 bytes (function '...future.FUN' of 37 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 139 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:21.938] Packages: [18:41:21.938] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:21.938] Resolved: TRUE [18:41:21.938] Value: 67 bytes of class 'list' [18:41:21.938] Early signaling: FALSE [18:41:21.938] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:21.938] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:21.939] Chunk #1 of 1 ... DONE [18:41:21.939] Launching 1 futures (chunks) ... DONE [18:41:21.939] Resolving 1 futures (chunks) ... [18:41:21.939] resolve() on list ... [18:41:21.940] recursive: 0 [18:41:21.940] length: 1 [18:41:21.940] [18:41:21.940] resolved() for 'SequentialFuture' ... [18:41:21.940] - state: 'finished' [18:41:21.940] - run: TRUE [18:41:21.941] - result: 'FutureResult' [18:41:21.941] resolved() for 'SequentialFuture' ... done [18:41:21.941] Future #1 [18:41:21.941] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:21.941] - nx: 1 [18:41:21.941] - relay: TRUE [18:41:21.942] - stdout: TRUE [18:41:21.942] - signal: TRUE [18:41:21.942] - resignal: FALSE [18:41:21.942] - force: TRUE [18:41:21.942] - relayed: [n=1] FALSE [18:41:21.942] - queued futures: [n=1] FALSE [18:41:21.943] - until=1 [18:41:21.943] - relaying element #1 [18:41:21.943] - relayed: [n=1] TRUE [18:41:21.943] - queued futures: [n=1] TRUE [18:41:21.943] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:21.943] length: 0 (resolved future 1) [18:41:21.944] Relaying remaining futures [18:41:21.944] signalConditionsASAP(NULL, pos=0) ... [18:41:21.944] - nx: 1 [18:41:21.944] - relay: TRUE [18:41:21.944] - stdout: TRUE [18:41:21.944] - signal: TRUE [18:41:21.944] - resignal: FALSE [18:41:21.945] - force: TRUE [18:41:21.945] - relayed: [n=1] TRUE [18:41:21.945] - queued futures: [n=1] TRUE - flush all [18:41:21.945] - relayed: [n=1] TRUE [18:41:21.945] - queued futures: [n=1] TRUE [18:41:21.945] signalConditionsASAP(NULL, pos=0) ... done [18:41:21.946] resolve() on list ... DONE [18:41:21.946] - Number of value chunks collected: 1 [18:41:21.946] Resolving 1 futures (chunks) ... DONE [18:41:21.946] Reducing values from 1 chunks ... [18:41:21.946] - Number of values collected after concatenation: 3 [18:41:21.946] - Number of values expected: 3 [18:41:21.947] Reducing values from 1 chunks ... DONE [18:41:21.947] future_lapply() ... DONE - future_lapply(x, ...) where x[[i]] subsets via S3 method ... [18:41:21.947] future_lapply() ... [18:41:21.948] Number of chunks: 1 [18:41:21.948] getGlobalsAndPackagesXApply() ... [18:41:21.948] - future.globals: TRUE [18:41:21.948] getGlobalsAndPackages() ... [18:41:21.948] Searching for globals... [18:41:21.950] - globals found: [1] 'FUN' [18:41:21.950] Searching for globals ... DONE [18:41:21.950] Resolving globals: FALSE [18:41:21.950] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:21.951] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:21.951] - globals: [1] 'FUN' [18:41:21.951] [18:41:21.951] getGlobalsAndPackages() ... DONE [18:41:21.951] - globals found/used: [n=1] 'FUN' [18:41:21.952] - needed namespaces: [n=0] [18:41:21.952] Finding globals ... DONE [18:41:21.952] - use_args: TRUE [18:41:21.952] - Getting '...' globals ... [18:41:21.953] resolve() on list ... [18:41:21.953] recursive: 0 [18:41:21.953] length: 1 [18:41:21.953] elements: '...' [18:41:21.953] length: 0 (resolved future 1) [18:41:21.953] resolve() on list ... DONE [18:41:21.954] - '...' content: [n=0] [18:41:21.954] List of 1 [18:41:21.954] $ ...: list() [18:41:21.954] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:21.954] - attr(*, "where")=List of 1 [18:41:21.954] ..$ ...: [18:41:21.954] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:21.954] - attr(*, "resolved")= logi TRUE [18:41:21.954] - attr(*, "total_size")= num NA [18:41:21.957] - Getting '...' globals ... DONE [18:41:21.957] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:21.957] List of 2 [18:41:21.957] $ ...future.FUN:function (x) [18:41:21.957] $ ... : list() [18:41:21.957] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:21.957] - attr(*, "where")=List of 2 [18:41:21.957] ..$ ...future.FUN: [18:41:21.957] ..$ ... : [18:41:21.957] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:21.957] - attr(*, "resolved")= logi FALSE [18:41:21.957] - attr(*, "total_size")= int 3176 [18:41:21.960] Packages to be attached in all futures: [n=0] [18:41:21.960] getGlobalsAndPackagesXApply() ... DONE [18:41:21.961] Number of futures (= number of chunks): 1 [18:41:21.961] Launching 1 futures (chunks) ... [18:41:21.961] Chunk #1 of 1 ... [18:41:21.961] - Finding globals in 'X' for chunk #1 ... [18:41:21.961] getGlobalsAndPackages() ... [18:41:21.962] Searching for globals... [18:41:21.962] [18:41:21.962] Searching for globals ... DONE [18:41:21.962] - globals: [0] [18:41:21.962] getGlobalsAndPackages() ... DONE [18:41:21.963] + additional globals found: [n=0] [18:41:21.963] + additional namespaces needed: [n=0] [18:41:21.963] - Finding globals in 'X' for chunk #1 ... DONE [18:41:21.963] - seeds: [18:41:21.963] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:21.963] getGlobalsAndPackages() ... [18:41:21.963] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:21.964] Resolving globals: FALSE [18:41:21.964] Tweak future expression to call with '...' arguments ... [18:41:21.964] { [18:41:21.964] do.call(function(...) { [18:41:21.964] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:21.964] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:21.964] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:21.964] on.exit(options(oopts), add = TRUE) [18:41:21.964] } [18:41:21.964] { [18:41:21.964] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:21.964] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:21.964] ...future.FUN(...future.X_jj, ...) [18:41:21.964] }) [18:41:21.964] } [18:41:21.964] }, args = future.call.arguments) [18:41:21.964] } [18:41:21.964] Tweak future expression to call with '...' arguments ... DONE [18:41:21.965] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:21.965] [18:41:21.965] getGlobalsAndPackages() ... DONE [18:41:21.966] run() for 'Future' ... [18:41:21.966] - state: 'created' [18:41:21.966] - Future backend: 'FutureStrategy', 'sequential', 'uniprocess', 'future', 'function' [18:41:21.966] - Future class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:21.967] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... [18:41:21.967] - Field: 'label' [18:41:21.967] - Field: 'local' [18:41:21.967] - Field: 'owner' [18:41:21.967] - Field: 'envir' [18:41:21.968] - Field: 'packages' [18:41:21.968] - Field: 'gc' [18:41:21.968] - Field: 'conditions' [18:41:21.968] - Field: 'expr' [18:41:21.968] - Field: 'uuid' [18:41:21.969] - Field: 'seed' [18:41:21.969] - Field: 'version' [18:41:21.969] - Field: 'result' [18:41:21.969] - Field: 'asynchronous' [18:41:21.969] - Field: 'calls' [18:41:21.969] - Field: 'globals' [18:41:21.970] - Field: 'stdout' [18:41:21.970] - Field: 'earlySignal' [18:41:21.970] - Field: 'lazy' [18:41:21.970] - Field: 'state' [18:41:21.970] - Copy elements of temporary 'SequentialFuture' to final 'Future' object ... done [18:41:21.971] - Launch lazy future ... [18:41:21.971] Packages needed by the future expression (n = 0): [18:41:21.971] Packages needed by future strategies (n = 0): [18:41:21.972] { [18:41:21.972] { [18:41:21.972] { [18:41:21.972] ...future.startTime <- base::Sys.time() [18:41:21.972] { [18:41:21.972] { [18:41:21.972] { [18:41:21.972] base::local({ [18:41:21.972] has_future <- base::requireNamespace("future", [18:41:21.972] quietly = TRUE) [18:41:21.972] if (has_future) { [18:41:21.972] ns <- base::getNamespace("future") [18:41:21.972] version <- ns[[".package"]][["version"]] [18:41:21.972] if (is.null(version)) [18:41:21.972] version <- utils::packageVersion("future") [18:41:21.972] } [18:41:21.972] else { [18:41:21.972] version <- NULL [18:41:21.972] } [18:41:21.972] if (!has_future || version < "1.8.0") { [18:41:21.972] info <- base::c(r_version = base::gsub("R version ", [18:41:21.972] "", base::R.version$version.string), [18:41:21.972] platform = base::sprintf("%s (%s-bit)", [18:41:21.972] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:21.972] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:21.972] "release", "version")], collapse = " "), [18:41:21.972] hostname = base::Sys.info()[["nodename"]]) [18:41:21.972] info <- base::sprintf("%s: %s", base::names(info), [18:41:21.972] info) [18:41:21.972] info <- base::paste(info, collapse = "; ") [18:41:21.972] if (!has_future) { [18:41:21.972] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:21.972] info) [18:41:21.972] } [18:41:21.972] else { [18:41:21.972] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:21.972] info, version) [18:41:21.972] } [18:41:21.972] base::stop(msg) [18:41:21.972] } [18:41:21.972] }) [18:41:21.972] } [18:41:21.972] ...future.strategy.old <- future::plan("list") [18:41:21.972] options(future.plan = NULL) [18:41:21.972] Sys.unsetenv("R_FUTURE_PLAN") [18:41:21.972] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:21.972] } [18:41:21.972] ...future.workdir <- getwd() [18:41:21.972] } [18:41:21.972] ...future.oldOptions <- base::as.list(base::.Options) [18:41:21.972] ...future.oldEnvVars <- base::Sys.getenv() [18:41:21.972] } [18:41:21.972] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:21.972] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:21.972] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:21.972] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:21.972] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:21.972] future.stdout.windows.reencode = NULL, width = 80L) [18:41:21.972] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:21.972] base::names(...future.oldOptions)) [18:41:21.972] } [18:41:21.972] if (FALSE) { [18:41:21.972] } [18:41:21.972] else { [18:41:21.972] if (TRUE) { [18:41:21.972] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:21.972] open = "w") [18:41:21.972] } [18:41:21.972] else { [18:41:21.972] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:21.972] windows = "NUL", "/dev/null"), open = "w") [18:41:21.972] } [18:41:21.972] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:21.972] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:21.972] base::sink(type = "output", split = FALSE) [18:41:21.972] base::close(...future.stdout) [18:41:21.972] }, add = TRUE) [18:41:21.972] } [18:41:21.972] ...future.frame <- base::sys.nframe() [18:41:21.972] ...future.conditions <- base::list() [18:41:21.972] ...future.rng <- base::globalenv()$.Random.seed [18:41:21.972] if (FALSE) { [18:41:21.972] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:21.972] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:21.972] } [18:41:21.972] ...future.result <- base::tryCatch({ [18:41:21.972] base::withCallingHandlers({ [18:41:21.972] ...future.value <- base::withVisible(base::local({ [18:41:21.972] do.call(function(...) { [18:41:21.972] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:21.972] if (!identical(...future.globals.maxSize.org, [18:41:21.972] ...future.globals.maxSize)) { [18:41:21.972] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:21.972] on.exit(options(oopts), add = TRUE) [18:41:21.972] } [18:41:21.972] { [18:41:21.972] lapply(seq_along(...future.elements_ii), [18:41:21.972] FUN = function(jj) { [18:41:21.972] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:21.972] ...future.FUN(...future.X_jj, ...) [18:41:21.972] }) [18:41:21.972] } [18:41:21.972] }, args = future.call.arguments) [18:41:21.972] })) [18:41:21.972] future::FutureResult(value = ...future.value$value, [18:41:21.972] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:21.972] ...future.rng), globalenv = if (FALSE) [18:41:21.972] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:21.972] ...future.globalenv.names)) [18:41:21.972] else NULL, started = ...future.startTime, version = "1.8") [18:41:21.972] }, condition = base::local({ [18:41:21.972] c <- base::c [18:41:21.972] inherits <- base::inherits [18:41:21.972] invokeRestart <- base::invokeRestart [18:41:21.972] length <- base::length [18:41:21.972] list <- base::list [18:41:21.972] seq.int <- base::seq.int [18:41:21.972] signalCondition <- base::signalCondition [18:41:21.972] sys.calls <- base::sys.calls [18:41:21.972] `[[` <- base::`[[` [18:41:21.972] `+` <- base::`+` [18:41:21.972] `<<-` <- base::`<<-` [18:41:21.972] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:21.972] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:21.972] 3L)] [18:41:21.972] } [18:41:21.972] function(cond) { [18:41:21.972] is_error <- inherits(cond, "error") [18:41:21.972] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:21.972] NULL) [18:41:21.972] if (is_error) { [18:41:21.972] sessionInformation <- function() { [18:41:21.972] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:21.972] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:21.972] search = base::search(), system = base::Sys.info()) [18:41:21.972] } [18:41:21.972] ...future.conditions[[length(...future.conditions) + [18:41:21.972] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:21.972] cond$call), session = sessionInformation(), [18:41:21.972] timestamp = base::Sys.time(), signaled = 0L) [18:41:21.972] signalCondition(cond) [18:41:21.972] } [18:41:21.972] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:21.972] "immediateCondition"))) { [18:41:21.972] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:21.972] ...future.conditions[[length(...future.conditions) + [18:41:21.972] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:21.972] if (TRUE && !signal) { [18:41:21.972] muffleCondition <- function (cond, pattern = "^muffle") [18:41:21.972] { [18:41:21.972] inherits <- base::inherits [18:41:21.972] invokeRestart <- base::invokeRestart [18:41:21.972] is.null <- base::is.null [18:41:21.972] muffled <- FALSE [18:41:21.972] if (inherits(cond, "message")) { [18:41:21.972] muffled <- grepl(pattern, "muffleMessage") [18:41:21.972] if (muffled) [18:41:21.972] invokeRestart("muffleMessage") [18:41:21.972] } [18:41:21.972] else if (inherits(cond, "warning")) { [18:41:21.972] muffled <- grepl(pattern, "muffleWarning") [18:41:21.972] if (muffled) [18:41:21.972] invokeRestart("muffleWarning") [18:41:21.972] } [18:41:21.972] else if (inherits(cond, "condition")) { [18:41:21.972] if (!is.null(pattern)) { [18:41:21.972] computeRestarts <- base::computeRestarts [18:41:21.972] grepl <- base::grepl [18:41:21.972] restarts <- computeRestarts(cond) [18:41:21.972] for (restart in restarts) { [18:41:21.972] name <- restart$name [18:41:21.972] if (is.null(name)) [18:41:21.972] next [18:41:21.972] if (!grepl(pattern, name)) [18:41:21.972] next [18:41:21.972] invokeRestart(restart) [18:41:21.972] muffled <- TRUE [18:41:21.972] break [18:41:21.972] } [18:41:21.972] } [18:41:21.972] } [18:41:21.972] invisible(muffled) [18:41:21.972] } [18:41:21.972] muffleCondition(cond, pattern = "^muffle") [18:41:21.972] } [18:41:21.972] } [18:41:21.972] else { [18:41:21.972] if (TRUE) { [18:41:21.972] muffleCondition <- function (cond, pattern = "^muffle") [18:41:21.972] { [18:41:21.972] inherits <- base::inherits [18:41:21.972] invokeRestart <- base::invokeRestart [18:41:21.972] is.null <- base::is.null [18:41:21.972] muffled <- FALSE [18:41:21.972] if (inherits(cond, "message")) { [18:41:21.972] muffled <- grepl(pattern, "muffleMessage") [18:41:21.972] if (muffled) [18:41:21.972] invokeRestart("muffleMessage") [18:41:21.972] } [18:41:21.972] else if (inherits(cond, "warning")) { [18:41:21.972] muffled <- grepl(pattern, "muffleWarning") [18:41:21.972] if (muffled) [18:41:21.972] invokeRestart("muffleWarning") [18:41:21.972] } [18:41:21.972] else if (inherits(cond, "condition")) { [18:41:21.972] if (!is.null(pattern)) { [18:41:21.972] computeRestarts <- base::computeRestarts [18:41:21.972] grepl <- base::grepl [18:41:21.972] restarts <- computeRestarts(cond) [18:41:21.972] for (restart in restarts) { [18:41:21.972] name <- restart$name [18:41:21.972] if (is.null(name)) [18:41:21.972] next [18:41:21.972] if (!grepl(pattern, name)) [18:41:21.972] next [18:41:21.972] invokeRestart(restart) [18:41:21.972] muffled <- TRUE [18:41:21.972] break [18:41:21.972] } [18:41:21.972] } [18:41:21.972] } [18:41:21.972] invisible(muffled) [18:41:21.972] } [18:41:21.972] muffleCondition(cond, pattern = "^muffle") [18:41:21.972] } [18:41:21.972] } [18:41:21.972] } [18:41:21.972] })) [18:41:21.972] }, error = function(ex) { [18:41:21.972] base::structure(base::list(value = NULL, visible = NULL, [18:41:21.972] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:21.972] ...future.rng), started = ...future.startTime, [18:41:21.972] finished = Sys.time(), session_uuid = NA_character_, [18:41:21.972] version = "1.8"), class = "FutureResult") [18:41:21.972] }, finally = { [18:41:21.972] if (!identical(...future.workdir, getwd())) [18:41:21.972] setwd(...future.workdir) [18:41:21.972] { [18:41:21.972] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:21.972] ...future.oldOptions$nwarnings <- NULL [18:41:21.972] } [18:41:21.972] base::options(...future.oldOptions) [18:41:21.972] if (.Platform$OS.type == "windows") { [18:41:21.972] old_names <- names(...future.oldEnvVars) [18:41:21.972] envs <- base::Sys.getenv() [18:41:21.972] names <- names(envs) [18:41:21.972] common <- intersect(names, old_names) [18:41:21.972] added <- setdiff(names, old_names) [18:41:21.972] removed <- setdiff(old_names, names) [18:41:21.972] changed <- common[...future.oldEnvVars[common] != [18:41:21.972] envs[common]] [18:41:21.972] NAMES <- toupper(changed) [18:41:21.972] args <- list() [18:41:21.972] for (kk in seq_along(NAMES)) { [18:41:21.972] name <- changed[[kk]] [18:41:21.972] NAME <- NAMES[[kk]] [18:41:21.972] if (name != NAME && is.element(NAME, old_names)) [18:41:21.972] next [18:41:21.972] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:21.972] } [18:41:21.972] NAMES <- toupper(added) [18:41:21.972] for (kk in seq_along(NAMES)) { [18:41:21.972] name <- added[[kk]] [18:41:21.972] NAME <- NAMES[[kk]] [18:41:21.972] if (name != NAME && is.element(NAME, old_names)) [18:41:21.972] next [18:41:21.972] args[[name]] <- "" [18:41:21.972] } [18:41:21.972] NAMES <- toupper(removed) [18:41:21.972] for (kk in seq_along(NAMES)) { [18:41:21.972] name <- removed[[kk]] [18:41:21.972] NAME <- NAMES[[kk]] [18:41:21.972] if (name != NAME && is.element(NAME, old_names)) [18:41:21.972] next [18:41:21.972] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:21.972] } [18:41:21.972] if (length(args) > 0) [18:41:21.972] base::do.call(base::Sys.setenv, args = args) [18:41:21.972] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:21.972] } [18:41:21.972] else { [18:41:21.972] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:21.972] } [18:41:21.972] { [18:41:21.972] if (base::length(...future.futureOptionsAdded) > [18:41:21.972] 0L) { [18:41:21.972] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:21.972] base::names(opts) <- ...future.futureOptionsAdded [18:41:21.972] base::options(opts) [18:41:21.972] } [18:41:21.972] { [18:41:21.972] { [18:41:21.972] NULL [18:41:21.972] RNGkind("Mersenne-Twister") [18:41:21.972] base::rm(list = ".Random.seed", envir = base::globalenv(), [18:41:21.972] inherits = FALSE) [18:41:21.972] } [18:41:21.972] options(future.plan = NULL) [18:41:21.972] if (is.na(NA_character_)) [18:41:21.972] Sys.unsetenv("R_FUTURE_PLAN") [18:41:21.972] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:21.972] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:21.972] .init = FALSE) [18:41:21.972] } [18:41:21.972] } [18:41:21.972] } [18:41:21.972] }) [18:41:21.972] if (TRUE) { [18:41:21.972] base::sink(type = "output", split = FALSE) [18:41:21.972] if (TRUE) { [18:41:21.972] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:21.972] } [18:41:21.972] else { [18:41:21.972] ...future.result["stdout"] <- base::list(NULL) [18:41:21.972] } [18:41:21.972] base::close(...future.stdout) [18:41:21.972] ...future.stdout <- NULL [18:41:21.972] } [18:41:21.972] ...future.result$conditions <- ...future.conditions [18:41:21.972] ...future.result$finished <- base::Sys.time() [18:41:21.972] ...future.result [18:41:21.972] } [18:41:21.976] assign_globals() ... [18:41:21.976] List of 5 [18:41:21.976] $ ...future.FUN :function (x) [18:41:21.976] $ future.call.arguments : list() [18:41:21.976] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:21.976] $ ...future.elements_ii :List of 2 [18:41:21.976] ..$ a: num 0 [18:41:21.976] ..$ b: num 0 [18:41:21.976] $ ...future.seeds_ii : NULL [18:41:21.976] $ ...future.globals.maxSize: NULL [18:41:21.976] - attr(*, "where")=List of 5 [18:41:21.976] ..$ ...future.FUN : [18:41:21.976] ..$ future.call.arguments : [18:41:21.976] ..$ ...future.elements_ii : [18:41:21.976] ..$ ...future.seeds_ii : [18:41:21.976] ..$ ...future.globals.maxSize: [18:41:21.976] - attr(*, "resolved")= logi FALSE [18:41:21.976] - attr(*, "total_size")= num 3176 [18:41:21.976] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:21.976] - attr(*, "already-done")= logi TRUE [18:41:21.985] - copied '...future.FUN' to environment [18:41:21.985] - copied 'future.call.arguments' to environment [18:41:21.985] - copied '...future.elements_ii' to environment [18:41:21.985] - copied '...future.seeds_ii' to environment [18:41:21.986] - copied '...future.globals.maxSize' to environment [18:41:21.986] assign_globals() ... done [18:41:21.986] plan(): Setting new future strategy stack: [18:41:21.987] List of future strategies: [18:41:21.987] 1. sequential: [18:41:21.987] - args: function (..., envir = parent.frame(), workers = "") [18:41:21.987] - tweaked: FALSE [18:41:21.987] - call: NULL [18:41:21.987] plan(): nbrOfWorkers() = 1 [18:41:21.988] plan(): Setting new future strategy stack: [18:41:21.989] List of future strategies: [18:41:21.989] 1. sequential: [18:41:21.989] - args: function (..., envir = parent.frame(), workers = "") [18:41:21.989] - tweaked: FALSE [18:41:21.989] - call: plan(strategy) [18:41:21.989] plan(): nbrOfWorkers() = 1 [18:41:21.989] SequentialFuture started (and completed) [18:41:21.990] - Launch lazy future ... done [18:41:21.990] run() for 'SequentialFuture' ... done [18:41:21.990] Created future: [18:41:21.990] SequentialFuture: [18:41:21.990] Label: 'future_lapply-1' [18:41:21.990] Expression: [18:41:21.990] { [18:41:21.990] do.call(function(...) { [18:41:21.990] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:21.990] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:21.990] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:21.990] on.exit(options(oopts), add = TRUE) [18:41:21.990] } [18:41:21.990] { [18:41:21.990] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:21.990] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:21.990] ...future.FUN(...future.X_jj, ...) [18:41:21.990] }) [18:41:21.990] } [18:41:21.990] }, args = future.call.arguments) [18:41:21.990] } [18:41:21.990] Lazy evaluation: FALSE [18:41:21.990] Asynchronous evaluation: FALSE [18:41:21.990] Local evaluation: TRUE [18:41:21.990] Environment: R_GlobalEnv [18:41:21.990] Capture standard output: TRUE [18:41:21.990] Capture condition classes: 'condition' (excluding 'nothing') [18:41:21.990] Globals: 5 objects totaling 450 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:21.990] Packages: [18:41:21.990] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:21.990] Resolved: TRUE [18:41:21.990] Value: 63 bytes of class 'list' [18:41:21.990] Early signaling: FALSE [18:41:21.990] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:21.990] Class: 'SequentialFuture', 'UniprocessFuture', 'Future', 'environment' [18:41:21.991] Chunk #1 of 1 ... DONE [18:41:21.991] Launching 1 futures (chunks) ... DONE [18:41:21.992] Resolving 1 futures (chunks) ... [18:41:21.992] resolve() on list ... [18:41:21.992] recursive: 0 [18:41:21.992] length: 1 [18:41:21.992] [18:41:21.992] resolved() for 'SequentialFuture' ... [18:41:21.993] - state: 'finished' [18:41:21.993] - run: TRUE [18:41:21.993] - result: 'FutureResult' [18:41:21.993] resolved() for 'SequentialFuture' ... done [18:41:21.993] Future #1 [18:41:21.993] signalConditionsASAP(SequentialFuture, pos=1) ... [18:41:21.994] - nx: 1 [18:41:21.994] - relay: TRUE [18:41:21.994] - stdout: TRUE [18:41:21.994] - signal: TRUE [18:41:21.994] - resignal: FALSE [18:41:21.994] - force: TRUE [18:41:21.995] - relayed: [n=1] FALSE [18:41:21.995] - queued futures: [n=1] FALSE [18:41:21.995] - until=1 [18:41:21.995] - relaying element #1 [18:41:21.995] - relayed: [n=1] TRUE [18:41:21.995] - queued futures: [n=1] TRUE [18:41:21.996] signalConditionsASAP(SequentialFuture, pos=1) ... done [18:41:21.996] length: 0 (resolved future 1) [18:41:21.996] Relaying remaining futures [18:41:21.996] signalConditionsASAP(NULL, pos=0) ... [18:41:21.996] - nx: 1 [18:41:21.996] - relay: TRUE [18:41:21.997] - stdout: TRUE [18:41:21.997] - signal: TRUE [18:41:21.997] - resignal: FALSE [18:41:21.997] - force: TRUE [18:41:21.997] - relayed: [n=1] TRUE [18:41:21.997] - queued futures: [n=1] TRUE - flush all [18:41:21.998] - relayed: [n=1] TRUE [18:41:21.998] - queued futures: [n=1] TRUE [18:41:21.998] signalConditionsASAP(NULL, pos=0) ... done [18:41:21.998] resolve() on list ... DONE [18:41:21.998] - Number of value chunks collected: 1 [18:41:21.998] Resolving 1 futures (chunks) ... DONE [18:41:21.999] Reducing values from 1 chunks ... [18:41:21.999] - Number of values collected after concatenation: 2 [18:41:21.999] - Number of values expected: 2 [18:41:21.999] Reducing values from 1 chunks ... DONE [18:41:21.999] future_lapply() ... DONE - plan('multisession') ... [18:41:21.999] plan(): Setting new future strategy stack: [18:41:22.000] List of future strategies: [18:41:22.000] 1. multisession: [18:41:22.000] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:41:22.000] - tweaked: FALSE [18:41:22.000] - call: plan(strategy) [18:41:22.000] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... [18:41:22.000] multisession: [18:41:22.000] - args: function (..., workers = availableCores(), lazy = FALSE, rscript_libs = .libPaths(), envir = parent.frame()) [18:41:22.000] - tweaked: FALSE [18:41:22.000] - call: plan(strategy) [18:41:22.004] getGlobalsAndPackages() ... [18:41:22.004] Not searching for globals [18:41:22.005] - globals: [0] [18:41:22.005] getGlobalsAndPackages() ... DONE [18:41:22.005] [local output] makeClusterPSOCK() ... [18:41:22.059] [local output] Workers: [n = 2] 'localhost', 'localhost' [18:41:22.066] [local output] Base port: 30596 [18:41:22.066] [local output] Getting setup options for 2 cluster nodes ... [18:41:22.066] [local output] - Node #1 of 2 ... [18:41:22.067] [local output] localMachine=TRUE => revtunnel=FALSE [18:41:22.068] Testing if worker's PID can be inferred: '"D:/RCompile/recent/R/bin/x64/Rscript" -e "try(suppressWarnings(cat(Sys.getpid(),file=\"D:/temp/RtmpI36mb7/worker.rank=1.parallelly.parent=110188.1ae6c32a41a94.pid\")), silent = TRUE)" -e "file.exists(\"D:/temp/RtmpI36mb7/worker.rank=1.parallelly.parent=110188.1ae6c32a41a94.pid\")"' [18:41:22.502] - Possible to infer worker's PID: TRUE [18:41:22.503] [local output] Rscript port: 30596 [18:41:22.504] [local output] - Node #2 of 2 ... [18:41:22.504] [local output] localMachine=TRUE => revtunnel=FALSE [18:41:22.506] [local output] Rscript port: 30596 [18:41:22.506] [local output] Getting setup options for 2 cluster nodes ... done [18:41:22.506] [local output] - Parallel setup requested for some PSOCK nodes [18:41:22.507] [local output] Setting up PSOCK nodes in parallel [18:41:22.507] List of 36 [18:41:22.507] $ worker : chr "localhost" [18:41:22.507] ..- attr(*, "localhost")= logi TRUE [18:41:22.507] $ master : chr "localhost" [18:41:22.507] $ port : int 30596 [18:41:22.507] $ connectTimeout : num 120 [18:41:22.507] $ timeout : num 120 [18:41:22.507] $ rscript : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\"" [18:41:22.507] $ homogeneous : logi TRUE [18:41:22.507] $ rscript_args : chr "--default-packages=datasets,utils,grDevices,graphics,stats,methods -e \"#label=future_lapply.R:110188:CRANWIN3:"| __truncated__ [18:41:22.507] $ rscript_envs : NULL [18:41:22.507] $ rscript_libs : chr [1:2] "D:/temp/Rtmpi4y3mu/RLIBS_25080533fa8" "D:/RCompile/recent/R/library" [18:41:22.507] $ rscript_startup : NULL [18:41:22.507] $ rscript_sh : chr [1:2] "cmd" "cmd" [18:41:22.507] $ default_packages: chr [1:6] "datasets" "utils" "grDevices" "graphics" ... [18:41:22.507] $ methods : logi TRUE [18:41:22.507] $ socketOptions : chr "no-delay" [18:41:22.507] $ useXDR : logi FALSE [18:41:22.507] $ outfile : chr "/dev/null" [18:41:22.507] $ renice : int NA [18:41:22.507] $ rshcmd : NULL [18:41:22.507] $ user : chr(0) [18:41:22.507] $ revtunnel : logi FALSE [18:41:22.507] $ rshlogfile : NULL [18:41:22.507] $ rshopts : chr(0) [18:41:22.507] $ rank : int 1 [18:41:22.507] $ manual : logi FALSE [18:41:22.507] $ dryrun : logi FALSE [18:41:22.507] $ quiet : logi FALSE [18:41:22.507] $ setup_strategy : chr "parallel" [18:41:22.507] $ local_cmd : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "| __truncated__ [18:41:22.507] $ pidfile : chr "D:/temp/RtmpI36mb7/worker.rank=1.parallelly.parent=110188.1ae6c32a41a94.pid" [18:41:22.507] $ rshcmd_label : NULL [18:41:22.507] $ rsh_call : NULL [18:41:22.507] $ cmd : chr "\"D:/RCompile/recent/R/bin/x64/Rscript\" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "| __truncated__ [18:41:22.507] $ localMachine : logi TRUE [18:41:22.507] $ make_fcn :function (worker = getOption2("parallelly.localhost.hostname", "localhost"), [18:41:22.507] master = NULL, port, connectTimeout = getOption2("parallelly.makeNodePSOCK.connectTimeout", [18:41:22.507] 2 * 60), timeout = getOption2("parallelly.makeNodePSOCK.timeout", [18:41:22.507] 30 * 24 * 60 * 60), rscript = NULL, homogeneous = NULL, rscript_args = NULL, [18:41:22.507] rscript_envs = NULL, rscript_libs = NULL, rscript_startup = NULL, rscript_sh = c("auto", [18:41:22.507] "cmd", "sh", "none"), default_packages = c("datasets", "utils", [18:41:22.507] "grDevices", "graphics", "stats", if (methods) "methods"), methods = TRUE, [18:41:22.507] socketOptions = getOption2("parallelly.makeNodePSOCK.socketOptions", [18:41:22.507] "no-delay"), useXDR = getOption2("parallelly.makeNodePSOCK.useXDR", [18:41:22.507] FALSE), outfile = "/dev/null", renice = NA_integer_, rshcmd = getOption2("parallelly.makeNodePSOCK.rshcmd", [18:41:22.507] NULL), user = NULL, revtunnel = NA, rshlogfile = NULL, rshopts = getOption2("parallelly.makeNodePSOCK.rshopts", [18:41:22.507] NULL), rank = 1L, manual = FALSE, dryrun = FALSE, quiet = FALSE, [18:41:22.507] setup_strategy = getOption2("parallelly.makeNodePSOCK.setup_strategy", [18:41:22.507] "parallel"), action = c("launch", "options"), verbose = FALSE) [18:41:22.507] $ arguments :List of 28 [18:41:22.507] ..$ worker : chr "localhost" [18:41:22.507] ..$ master : NULL [18:41:22.507] ..$ port : int 30596 [18:41:22.507] ..$ connectTimeout : num 120 [18:41:22.507] ..$ timeout : num 120 [18:41:22.507] ..$ rscript : NULL [18:41:22.507] ..$ homogeneous : NULL [18:41:22.507] ..$ rscript_args : NULL [18:41:22.507] ..$ rscript_envs : NULL [18:41:22.507] ..$ rscript_libs : chr [1:2] "D:/temp/Rtmpi4y3mu/RLIBS_25080533fa8" "D:/RCompile/recent/R/library" [18:41:22.507] ..$ rscript_startup : NULL [18:41:22.507] ..$ rscript_sh : chr "auto" [18:41:22.507] ..$ default_packages: chr [1:6] "datasets" "utils" "grDevices" "graphics" ... [18:41:22.507] ..$ methods : logi TRUE [18:41:22.507] ..$ socketOptions : chr "no-delay" [18:41:22.507] ..$ useXDR : logi FALSE [18:41:22.507] ..$ outfile : chr "/dev/null" [18:41:22.507] ..$ renice : int NA [18:41:22.507] ..$ rshcmd : NULL [18:41:22.507] ..$ user : NULL [18:41:22.507] ..$ revtunnel : logi NA [18:41:22.507] ..$ rshlogfile : NULL [18:41:22.507] ..$ rshopts : NULL [18:41:22.507] ..$ rank : int 1 [18:41:22.507] ..$ manual : logi FALSE [18:41:22.507] ..$ dryrun : logi FALSE [18:41:22.507] ..$ quiet : logi FALSE [18:41:22.507] ..$ setup_strategy : chr "parallel" [18:41:22.507] - attr(*, "class")= chr [1:2] "makeNodePSOCKOptions" "makeNodeOptions" [18:41:22.529] [local output] System call to launch all workers: [18:41:22.529] [local output] "D:/RCompile/recent/R/bin/x64/Rscript" --default-packages=datasets,utils,grDevices,graphics,stats,methods -e "#label=future_lapply.R:110188:CRANWIN3:CRAN" -e "try(suppressWarnings(cat(Sys.getpid(),file=\"D:/temp/RtmpI36mb7/worker.rank=1.parallelly.parent=110188.1ae6c32a41a94.pid\")), silent = TRUE)" -e "options(socketOptions = \"no-delay\")" -e ".libPaths(c(\"D:/temp/Rtmpi4y3mu/RLIBS_25080533fa8\",\"D:/RCompile/recent/R/library\"))" -e "workRSOCK <- tryCatch(parallel:::.workRSOCK, error=function(e) parallel:::.slaveRSOCK); workRSOCK()" MASTER=localhost PORT=30596 OUT=/dev/null TIMEOUT=120 XDR=FALSE SETUPTIMEOUT=120 SETUPSTRATEGY=parallel [18:41:22.530] [local output] Starting PSOCK main server [18:41:22.536] [local output] Workers launched [18:41:22.536] [local output] Waiting for workers to connect back [18:41:22.537] - [local output] 0 workers out of 2 ready [18:41:22.710] - [local output] 0 workers out of 2 ready [18:41:22.711] - [local output] 1 workers out of 2 ready [18:41:22.786] - [local output] 1 workers out of 2 ready [18:41:22.787] - [local output] 2 workers out of 2 ready [18:41:22.787] [local output] Launching of 2 workers completed [18:41:22.787] [local output] Number of nodes in cluster: 2 [18:41:22.787] [local output] Collecting session information from 2 workers [18:41:22.788] [local output] - Worker #1 of 2 [18:41:22.789] [local output] - Worker #2 of 2 [18:41:22.790] [local output] makeClusterPSOCK() ... done [18:41:22.804] Packages needed by the future expression (n = 0): [18:41:22.804] Packages needed by future strategies (n = 0): [18:41:22.805] { [18:41:22.805] { [18:41:22.805] { [18:41:22.805] ...future.startTime <- base::Sys.time() [18:41:22.805] { [18:41:22.805] { [18:41:22.805] { [18:41:22.805] { [18:41:22.805] base::local({ [18:41:22.805] has_future <- base::requireNamespace("future", [18:41:22.805] quietly = TRUE) [18:41:22.805] if (has_future) { [18:41:22.805] ns <- base::getNamespace("future") [18:41:22.805] version <- ns[[".package"]][["version"]] [18:41:22.805] if (is.null(version)) [18:41:22.805] version <- utils::packageVersion("future") [18:41:22.805] } [18:41:22.805] else { [18:41:22.805] version <- NULL [18:41:22.805] } [18:41:22.805] if (!has_future || version < "1.8.0") { [18:41:22.805] info <- base::c(r_version = base::gsub("R version ", [18:41:22.805] "", base::R.version$version.string), [18:41:22.805] platform = base::sprintf("%s (%s-bit)", [18:41:22.805] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:22.805] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:22.805] "release", "version")], collapse = " "), [18:41:22.805] hostname = base::Sys.info()[["nodename"]]) [18:41:22.805] info <- base::sprintf("%s: %s", base::names(info), [18:41:22.805] info) [18:41:22.805] info <- base::paste(info, collapse = "; ") [18:41:22.805] if (!has_future) { [18:41:22.805] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:22.805] info) [18:41:22.805] } [18:41:22.805] else { [18:41:22.805] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:22.805] info, version) [18:41:22.805] } [18:41:22.805] base::stop(msg) [18:41:22.805] } [18:41:22.805] }) [18:41:22.805] } [18:41:22.805] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:22.805] base::options(mc.cores = 1L) [18:41:22.805] } [18:41:22.805] ...future.strategy.old <- future::plan("list") [18:41:22.805] options(future.plan = NULL) [18:41:22.805] Sys.unsetenv("R_FUTURE_PLAN") [18:41:22.805] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:22.805] } [18:41:22.805] ...future.workdir <- getwd() [18:41:22.805] } [18:41:22.805] ...future.oldOptions <- base::as.list(base::.Options) [18:41:22.805] ...future.oldEnvVars <- base::Sys.getenv() [18:41:22.805] } [18:41:22.805] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:22.805] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:22.805] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:22.805] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:22.805] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:22.805] future.stdout.windows.reencode = NULL, width = 80L) [18:41:22.805] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:22.805] base::names(...future.oldOptions)) [18:41:22.805] } [18:41:22.805] if (FALSE) { [18:41:22.805] } [18:41:22.805] else { [18:41:22.805] if (TRUE) { [18:41:22.805] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:22.805] open = "w") [18:41:22.805] } [18:41:22.805] else { [18:41:22.805] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:22.805] windows = "NUL", "/dev/null"), open = "w") [18:41:22.805] } [18:41:22.805] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:22.805] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:22.805] base::sink(type = "output", split = FALSE) [18:41:22.805] base::close(...future.stdout) [18:41:22.805] }, add = TRUE) [18:41:22.805] } [18:41:22.805] ...future.frame <- base::sys.nframe() [18:41:22.805] ...future.conditions <- base::list() [18:41:22.805] ...future.rng <- base::globalenv()$.Random.seed [18:41:22.805] if (FALSE) { [18:41:22.805] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:22.805] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:22.805] } [18:41:22.805] ...future.result <- base::tryCatch({ [18:41:22.805] base::withCallingHandlers({ [18:41:22.805] ...future.value <- base::withVisible(base::local({ [18:41:22.805] ...future.makeSendCondition <- base::local({ [18:41:22.805] sendCondition <- NULL [18:41:22.805] function(frame = 1L) { [18:41:22.805] if (is.function(sendCondition)) [18:41:22.805] return(sendCondition) [18:41:22.805] ns <- getNamespace("parallel") [18:41:22.805] if (exists("sendData", mode = "function", [18:41:22.805] envir = ns)) { [18:41:22.805] parallel_sendData <- get("sendData", mode = "function", [18:41:22.805] envir = ns) [18:41:22.805] envir <- sys.frame(frame) [18:41:22.805] master <- NULL [18:41:22.805] while (!identical(envir, .GlobalEnv) && [18:41:22.805] !identical(envir, emptyenv())) { [18:41:22.805] if (exists("master", mode = "list", envir = envir, [18:41:22.805] inherits = FALSE)) { [18:41:22.805] master <- get("master", mode = "list", [18:41:22.805] envir = envir, inherits = FALSE) [18:41:22.805] if (inherits(master, c("SOCKnode", [18:41:22.805] "SOCK0node"))) { [18:41:22.805] sendCondition <<- function(cond) { [18:41:22.805] data <- list(type = "VALUE", value = cond, [18:41:22.805] success = TRUE) [18:41:22.805] parallel_sendData(master, data) [18:41:22.805] } [18:41:22.805] return(sendCondition) [18:41:22.805] } [18:41:22.805] } [18:41:22.805] frame <- frame + 1L [18:41:22.805] envir <- sys.frame(frame) [18:41:22.805] } [18:41:22.805] } [18:41:22.805] sendCondition <<- function(cond) NULL [18:41:22.805] } [18:41:22.805] }) [18:41:22.805] withCallingHandlers({ [18:41:22.805] NA [18:41:22.805] }, immediateCondition = function(cond) { [18:41:22.805] sendCondition <- ...future.makeSendCondition() [18:41:22.805] sendCondition(cond) [18:41:22.805] muffleCondition <- function (cond, pattern = "^muffle") [18:41:22.805] { [18:41:22.805] inherits <- base::inherits [18:41:22.805] invokeRestart <- base::invokeRestart [18:41:22.805] is.null <- base::is.null [18:41:22.805] muffled <- FALSE [18:41:22.805] if (inherits(cond, "message")) { [18:41:22.805] muffled <- grepl(pattern, "muffleMessage") [18:41:22.805] if (muffled) [18:41:22.805] invokeRestart("muffleMessage") [18:41:22.805] } [18:41:22.805] else if (inherits(cond, "warning")) { [18:41:22.805] muffled <- grepl(pattern, "muffleWarning") [18:41:22.805] if (muffled) [18:41:22.805] invokeRestart("muffleWarning") [18:41:22.805] } [18:41:22.805] else if (inherits(cond, "condition")) { [18:41:22.805] if (!is.null(pattern)) { [18:41:22.805] computeRestarts <- base::computeRestarts [18:41:22.805] grepl <- base::grepl [18:41:22.805] restarts <- computeRestarts(cond) [18:41:22.805] for (restart in restarts) { [18:41:22.805] name <- restart$name [18:41:22.805] if (is.null(name)) [18:41:22.805] next [18:41:22.805] if (!grepl(pattern, name)) [18:41:22.805] next [18:41:22.805] invokeRestart(restart) [18:41:22.805] muffled <- TRUE [18:41:22.805] break [18:41:22.805] } [18:41:22.805] } [18:41:22.805] } [18:41:22.805] invisible(muffled) [18:41:22.805] } [18:41:22.805] muffleCondition(cond) [18:41:22.805] }) [18:41:22.805] })) [18:41:22.805] future::FutureResult(value = ...future.value$value, [18:41:22.805] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:22.805] ...future.rng), globalenv = if (FALSE) [18:41:22.805] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:22.805] ...future.globalenv.names)) [18:41:22.805] else NULL, started = ...future.startTime, version = "1.8") [18:41:22.805] }, condition = base::local({ [18:41:22.805] c <- base::c [18:41:22.805] inherits <- base::inherits [18:41:22.805] invokeRestart <- base::invokeRestart [18:41:22.805] length <- base::length [18:41:22.805] list <- base::list [18:41:22.805] seq.int <- base::seq.int [18:41:22.805] signalCondition <- base::signalCondition [18:41:22.805] sys.calls <- base::sys.calls [18:41:22.805] `[[` <- base::`[[` [18:41:22.805] `+` <- base::`+` [18:41:22.805] `<<-` <- base::`<<-` [18:41:22.805] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:22.805] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:22.805] 3L)] [18:41:22.805] } [18:41:22.805] function(cond) { [18:41:22.805] is_error <- inherits(cond, "error") [18:41:22.805] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:22.805] NULL) [18:41:22.805] if (is_error) { [18:41:22.805] sessionInformation <- function() { [18:41:22.805] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:22.805] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:22.805] search = base::search(), system = base::Sys.info()) [18:41:22.805] } [18:41:22.805] ...future.conditions[[length(...future.conditions) + [18:41:22.805] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:22.805] cond$call), session = sessionInformation(), [18:41:22.805] timestamp = base::Sys.time(), signaled = 0L) [18:41:22.805] signalCondition(cond) [18:41:22.805] } [18:41:22.805] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:22.805] "immediateCondition"))) { [18:41:22.805] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:22.805] ...future.conditions[[length(...future.conditions) + [18:41:22.805] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:22.805] if (TRUE && !signal) { [18:41:22.805] muffleCondition <- function (cond, pattern = "^muffle") [18:41:22.805] { [18:41:22.805] inherits <- base::inherits [18:41:22.805] invokeRestart <- base::invokeRestart [18:41:22.805] is.null <- base::is.null [18:41:22.805] muffled <- FALSE [18:41:22.805] if (inherits(cond, "message")) { [18:41:22.805] muffled <- grepl(pattern, "muffleMessage") [18:41:22.805] if (muffled) [18:41:22.805] invokeRestart("muffleMessage") [18:41:22.805] } [18:41:22.805] else if (inherits(cond, "warning")) { [18:41:22.805] muffled <- grepl(pattern, "muffleWarning") [18:41:22.805] if (muffled) [18:41:22.805] invokeRestart("muffleWarning") [18:41:22.805] } [18:41:22.805] else if (inherits(cond, "condition")) { [18:41:22.805] if (!is.null(pattern)) { [18:41:22.805] computeRestarts <- base::computeRestarts [18:41:22.805] grepl <- base::grepl [18:41:22.805] restarts <- computeRestarts(cond) [18:41:22.805] for (restart in restarts) { [18:41:22.805] name <- restart$name [18:41:22.805] if (is.null(name)) [18:41:22.805] next [18:41:22.805] if (!grepl(pattern, name)) [18:41:22.805] next [18:41:22.805] invokeRestart(restart) [18:41:22.805] muffled <- TRUE [18:41:22.805] break [18:41:22.805] } [18:41:22.805] } [18:41:22.805] } [18:41:22.805] invisible(muffled) [18:41:22.805] } [18:41:22.805] muffleCondition(cond, pattern = "^muffle") [18:41:22.805] } [18:41:22.805] } [18:41:22.805] else { [18:41:22.805] if (TRUE) { [18:41:22.805] muffleCondition <- function (cond, pattern = "^muffle") [18:41:22.805] { [18:41:22.805] inherits <- base::inherits [18:41:22.805] invokeRestart <- base::invokeRestart [18:41:22.805] is.null <- base::is.null [18:41:22.805] muffled <- FALSE [18:41:22.805] if (inherits(cond, "message")) { [18:41:22.805] muffled <- grepl(pattern, "muffleMessage") [18:41:22.805] if (muffled) [18:41:22.805] invokeRestart("muffleMessage") [18:41:22.805] } [18:41:22.805] else if (inherits(cond, "warning")) { [18:41:22.805] muffled <- grepl(pattern, "muffleWarning") [18:41:22.805] if (muffled) [18:41:22.805] invokeRestart("muffleWarning") [18:41:22.805] } [18:41:22.805] else if (inherits(cond, "condition")) { [18:41:22.805] if (!is.null(pattern)) { [18:41:22.805] computeRestarts <- base::computeRestarts [18:41:22.805] grepl <- base::grepl [18:41:22.805] restarts <- computeRestarts(cond) [18:41:22.805] for (restart in restarts) { [18:41:22.805] name <- restart$name [18:41:22.805] if (is.null(name)) [18:41:22.805] next [18:41:22.805] if (!grepl(pattern, name)) [18:41:22.805] next [18:41:22.805] invokeRestart(restart) [18:41:22.805] muffled <- TRUE [18:41:22.805] break [18:41:22.805] } [18:41:22.805] } [18:41:22.805] } [18:41:22.805] invisible(muffled) [18:41:22.805] } [18:41:22.805] muffleCondition(cond, pattern = "^muffle") [18:41:22.805] } [18:41:22.805] } [18:41:22.805] } [18:41:22.805] })) [18:41:22.805] }, error = function(ex) { [18:41:22.805] base::structure(base::list(value = NULL, visible = NULL, [18:41:22.805] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:22.805] ...future.rng), started = ...future.startTime, [18:41:22.805] finished = Sys.time(), session_uuid = NA_character_, [18:41:22.805] version = "1.8"), class = "FutureResult") [18:41:22.805] }, finally = { [18:41:22.805] if (!identical(...future.workdir, getwd())) [18:41:22.805] setwd(...future.workdir) [18:41:22.805] { [18:41:22.805] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:22.805] ...future.oldOptions$nwarnings <- NULL [18:41:22.805] } [18:41:22.805] base::options(...future.oldOptions) [18:41:22.805] if (.Platform$OS.type == "windows") { [18:41:22.805] old_names <- names(...future.oldEnvVars) [18:41:22.805] envs <- base::Sys.getenv() [18:41:22.805] names <- names(envs) [18:41:22.805] common <- intersect(names, old_names) [18:41:22.805] added <- setdiff(names, old_names) [18:41:22.805] removed <- setdiff(old_names, names) [18:41:22.805] changed <- common[...future.oldEnvVars[common] != [18:41:22.805] envs[common]] [18:41:22.805] NAMES <- toupper(changed) [18:41:22.805] args <- list() [18:41:22.805] for (kk in seq_along(NAMES)) { [18:41:22.805] name <- changed[[kk]] [18:41:22.805] NAME <- NAMES[[kk]] [18:41:22.805] if (name != NAME && is.element(NAME, old_names)) [18:41:22.805] next [18:41:22.805] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:22.805] } [18:41:22.805] NAMES <- toupper(added) [18:41:22.805] for (kk in seq_along(NAMES)) { [18:41:22.805] name <- added[[kk]] [18:41:22.805] NAME <- NAMES[[kk]] [18:41:22.805] if (name != NAME && is.element(NAME, old_names)) [18:41:22.805] next [18:41:22.805] args[[name]] <- "" [18:41:22.805] } [18:41:22.805] NAMES <- toupper(removed) [18:41:22.805] for (kk in seq_along(NAMES)) { [18:41:22.805] name <- removed[[kk]] [18:41:22.805] NAME <- NAMES[[kk]] [18:41:22.805] if (name != NAME && is.element(NAME, old_names)) [18:41:22.805] next [18:41:22.805] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:22.805] } [18:41:22.805] if (length(args) > 0) [18:41:22.805] base::do.call(base::Sys.setenv, args = args) [18:41:22.805] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:22.805] } [18:41:22.805] else { [18:41:22.805] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:22.805] } [18:41:22.805] { [18:41:22.805] if (base::length(...future.futureOptionsAdded) > [18:41:22.805] 0L) { [18:41:22.805] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:22.805] base::names(opts) <- ...future.futureOptionsAdded [18:41:22.805] base::options(opts) [18:41:22.805] } [18:41:22.805] { [18:41:22.805] { [18:41:22.805] base::options(mc.cores = ...future.mc.cores.old) [18:41:22.805] NULL [18:41:22.805] } [18:41:22.805] options(future.plan = NULL) [18:41:22.805] if (is.na(NA_character_)) [18:41:22.805] Sys.unsetenv("R_FUTURE_PLAN") [18:41:22.805] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:22.805] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:22.805] .init = FALSE) [18:41:22.805] } [18:41:22.805] } [18:41:22.805] } [18:41:22.805] }) [18:41:22.805] if (TRUE) { [18:41:22.805] base::sink(type = "output", split = FALSE) [18:41:22.805] if (TRUE) { [18:41:22.805] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:22.805] } [18:41:22.805] else { [18:41:22.805] ...future.result["stdout"] <- base::list(NULL) [18:41:22.805] } [18:41:22.805] base::close(...future.stdout) [18:41:22.805] ...future.stdout <- NULL [18:41:22.805] } [18:41:22.805] ...future.result$conditions <- ...future.conditions [18:41:22.805] ...future.result$finished <- base::Sys.time() [18:41:22.805] ...future.result [18:41:22.805] } [18:41:22.894] MultisessionFuture started [18:41:22.895] result() for ClusterFuture ... [18:41:22.895] receiveMessageFromWorker() for ClusterFuture ... [18:41:22.895] - Validating connection of MultisessionFuture [18:41:22.948] - received message: FutureResult [18:41:22.948] - Received FutureResult [18:41:22.951] - Erased future from FutureRegistry [18:41:22.951] result() for ClusterFuture ... [18:41:22.951] - result already collected: FutureResult [18:41:22.951] result() for ClusterFuture ... done [18:41:22.952] receiveMessageFromWorker() for ClusterFuture ... done [18:41:22.952] result() for ClusterFuture ... done [18:41:22.952] result() for ClusterFuture ... [18:41:22.952] - result already collected: FutureResult [18:41:22.952] result() for ClusterFuture ... done [18:41:22.952] plan(): plan_init() of 'multisession', 'cluster', 'multiprocess', 'future', 'function' ... DONE [18:41:22.955] plan(): nbrOfWorkers() = 2 - future_lapply(x, FUN = vector, ...) ... [18:41:22.955] future_lapply() ... [18:41:22.958] Number of chunks: 4 [18:41:22.958] getGlobalsAndPackagesXApply() ... [18:41:22.959] - future.globals: TRUE [18:41:22.959] getGlobalsAndPackages() ... [18:41:22.959] Searching for globals... [18:41:22.961] - globals found: [2] 'FUN', '.Internal' [18:41:22.961] Searching for globals ... DONE [18:41:22.961] Resolving globals: FALSE [18:41:22.961] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:22.962] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:22.962] - globals: [1] 'FUN' [18:41:22.962] [18:41:22.962] getGlobalsAndPackages() ... DONE [18:41:22.963] - globals found/used: [n=1] 'FUN' [18:41:22.963] - needed namespaces: [n=0] [18:41:22.963] Finding globals ... DONE [18:41:22.963] - use_args: TRUE [18:41:22.963] - Getting '...' globals ... [18:41:22.964] resolve() on list ... [18:41:22.964] recursive: 0 [18:41:22.964] length: 1 [18:41:22.964] elements: '...' [18:41:22.964] length: 0 (resolved future 1) [18:41:22.965] resolve() on list ... DONE [18:41:22.965] - '...' content: [n=1] 'length' [18:41:22.965] List of 1 [18:41:22.965] $ ...:List of 1 [18:41:22.965] ..$ length: int 2 [18:41:22.965] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:22.965] - attr(*, "where")=List of 1 [18:41:22.965] ..$ ...: [18:41:22.965] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:22.965] - attr(*, "resolved")= logi TRUE [18:41:22.965] - attr(*, "total_size")= num NA [18:41:22.969] - Getting '...' globals ... DONE [18:41:22.969] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:22.969] List of 2 [18:41:22.969] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:22.969] $ ... :List of 1 [18:41:22.969] ..$ length: int 2 [18:41:22.969] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:22.969] - attr(*, "where")=List of 2 [18:41:22.969] ..$ ...future.FUN: [18:41:22.969] ..$ ... : [18:41:22.969] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:22.969] - attr(*, "resolved")= logi FALSE [18:41:22.969] - attr(*, "total_size")= int 4288 [18:41:22.973] Packages to be attached in all futures: [n=0] [18:41:22.974] getGlobalsAndPackagesXApply() ... DONE [18:41:22.974] Number of futures (= number of chunks): 4 [18:41:22.974] Launching 4 futures (chunks) ... [18:41:22.974] Chunk #1 of 4 ... [18:41:22.974] - Finding globals in 'X' for chunk #1 ... [18:41:22.975] getGlobalsAndPackages() ... [18:41:22.975] Searching for globals... [18:41:22.975] [18:41:22.975] Searching for globals ... DONE [18:41:22.975] - globals: [0] [18:41:22.976] getGlobalsAndPackages() ... DONE [18:41:22.976] + additional globals found: [n=0] [18:41:22.976] + additional namespaces needed: [n=0] [18:41:22.976] - Finding globals in 'X' for chunk #1 ... DONE [18:41:22.976] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:22.976] - seeds: [18:41:22.977] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:22.977] getGlobalsAndPackages() ... [18:41:22.977] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:22.977] Resolving globals: FALSE [18:41:22.977] Tweak future expression to call with '...' arguments ... [18:41:22.977] { [18:41:22.977] do.call(function(...) { [18:41:22.977] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:22.977] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:22.977] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:22.977] on.exit(options(oopts), add = TRUE) [18:41:22.977] } [18:41:22.977] { [18:41:22.977] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:22.977] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:22.977] ...future.FUN(...future.X_jj, ...) [18:41:22.977] }) [18:41:22.977] } [18:41:22.977] }, args = future.call.arguments) [18:41:22.977] } [18:41:22.978] Tweak future expression to call with '...' arguments ... DONE [18:41:22.979] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:22.979] [18:41:22.979] getGlobalsAndPackages() ... DONE [18:41:22.979] run() for 'Future' ... [18:41:22.980] - state: 'created' [18:41:22.980] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:22.996] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:22.996] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:22.996] - Field: 'node' [18:41:22.996] - Field: 'label' [18:41:22.997] - Field: 'local' [18:41:22.997] - Field: 'owner' [18:41:22.997] - Field: 'envir' [18:41:22.997] - Field: 'workers' [18:41:22.997] - Field: 'packages' [18:41:22.998] - Field: 'gc' [18:41:22.998] - Field: 'conditions' [18:41:22.998] - Field: 'persistent' [18:41:22.998] - Field: 'expr' [18:41:22.998] - Field: 'uuid' [18:41:22.999] - Field: 'seed' [18:41:22.999] - Field: 'version' [18:41:22.999] - Field: 'result' [18:41:22.999] - Field: 'asynchronous' [18:41:22.999] - Field: 'calls' [18:41:22.999] - Field: 'globals' [18:41:23.000] - Field: 'stdout' [18:41:23.000] - Field: 'earlySignal' [18:41:23.000] - Field: 'lazy' [18:41:23.000] - Field: 'state' [18:41:23.000] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:23.000] - Launch lazy future ... [18:41:23.001] Packages needed by the future expression (n = 0): [18:41:23.001] Packages needed by future strategies (n = 0): [18:41:23.002] { [18:41:23.002] { [18:41:23.002] { [18:41:23.002] ...future.startTime <- base::Sys.time() [18:41:23.002] { [18:41:23.002] { [18:41:23.002] { [18:41:23.002] { [18:41:23.002] base::local({ [18:41:23.002] has_future <- base::requireNamespace("future", [18:41:23.002] quietly = TRUE) [18:41:23.002] if (has_future) { [18:41:23.002] ns <- base::getNamespace("future") [18:41:23.002] version <- ns[[".package"]][["version"]] [18:41:23.002] if (is.null(version)) [18:41:23.002] version <- utils::packageVersion("future") [18:41:23.002] } [18:41:23.002] else { [18:41:23.002] version <- NULL [18:41:23.002] } [18:41:23.002] if (!has_future || version < "1.8.0") { [18:41:23.002] info <- base::c(r_version = base::gsub("R version ", [18:41:23.002] "", base::R.version$version.string), [18:41:23.002] platform = base::sprintf("%s (%s-bit)", [18:41:23.002] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:23.002] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:23.002] "release", "version")], collapse = " "), [18:41:23.002] hostname = base::Sys.info()[["nodename"]]) [18:41:23.002] info <- base::sprintf("%s: %s", base::names(info), [18:41:23.002] info) [18:41:23.002] info <- base::paste(info, collapse = "; ") [18:41:23.002] if (!has_future) { [18:41:23.002] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:23.002] info) [18:41:23.002] } [18:41:23.002] else { [18:41:23.002] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:23.002] info, version) [18:41:23.002] } [18:41:23.002] base::stop(msg) [18:41:23.002] } [18:41:23.002] }) [18:41:23.002] } [18:41:23.002] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:23.002] base::options(mc.cores = 1L) [18:41:23.002] } [18:41:23.002] ...future.strategy.old <- future::plan("list") [18:41:23.002] options(future.plan = NULL) [18:41:23.002] Sys.unsetenv("R_FUTURE_PLAN") [18:41:23.002] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:23.002] } [18:41:23.002] ...future.workdir <- getwd() [18:41:23.002] } [18:41:23.002] ...future.oldOptions <- base::as.list(base::.Options) [18:41:23.002] ...future.oldEnvVars <- base::Sys.getenv() [18:41:23.002] } [18:41:23.002] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:23.002] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:23.002] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:23.002] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:23.002] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:23.002] future.stdout.windows.reencode = NULL, width = 80L) [18:41:23.002] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:23.002] base::names(...future.oldOptions)) [18:41:23.002] } [18:41:23.002] if (FALSE) { [18:41:23.002] } [18:41:23.002] else { [18:41:23.002] if (TRUE) { [18:41:23.002] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:23.002] open = "w") [18:41:23.002] } [18:41:23.002] else { [18:41:23.002] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:23.002] windows = "NUL", "/dev/null"), open = "w") [18:41:23.002] } [18:41:23.002] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:23.002] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:23.002] base::sink(type = "output", split = FALSE) [18:41:23.002] base::close(...future.stdout) [18:41:23.002] }, add = TRUE) [18:41:23.002] } [18:41:23.002] ...future.frame <- base::sys.nframe() [18:41:23.002] ...future.conditions <- base::list() [18:41:23.002] ...future.rng <- base::globalenv()$.Random.seed [18:41:23.002] if (FALSE) { [18:41:23.002] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:23.002] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:23.002] } [18:41:23.002] ...future.result <- base::tryCatch({ [18:41:23.002] base::withCallingHandlers({ [18:41:23.002] ...future.value <- base::withVisible(base::local({ [18:41:23.002] ...future.makeSendCondition <- base::local({ [18:41:23.002] sendCondition <- NULL [18:41:23.002] function(frame = 1L) { [18:41:23.002] if (is.function(sendCondition)) [18:41:23.002] return(sendCondition) [18:41:23.002] ns <- getNamespace("parallel") [18:41:23.002] if (exists("sendData", mode = "function", [18:41:23.002] envir = ns)) { [18:41:23.002] parallel_sendData <- get("sendData", mode = "function", [18:41:23.002] envir = ns) [18:41:23.002] envir <- sys.frame(frame) [18:41:23.002] master <- NULL [18:41:23.002] while (!identical(envir, .GlobalEnv) && [18:41:23.002] !identical(envir, emptyenv())) { [18:41:23.002] if (exists("master", mode = "list", envir = envir, [18:41:23.002] inherits = FALSE)) { [18:41:23.002] master <- get("master", mode = "list", [18:41:23.002] envir = envir, inherits = FALSE) [18:41:23.002] if (inherits(master, c("SOCKnode", [18:41:23.002] "SOCK0node"))) { [18:41:23.002] sendCondition <<- function(cond) { [18:41:23.002] data <- list(type = "VALUE", value = cond, [18:41:23.002] success = TRUE) [18:41:23.002] parallel_sendData(master, data) [18:41:23.002] } [18:41:23.002] return(sendCondition) [18:41:23.002] } [18:41:23.002] } [18:41:23.002] frame <- frame + 1L [18:41:23.002] envir <- sys.frame(frame) [18:41:23.002] } [18:41:23.002] } [18:41:23.002] sendCondition <<- function(cond) NULL [18:41:23.002] } [18:41:23.002] }) [18:41:23.002] withCallingHandlers({ [18:41:23.002] { [18:41:23.002] do.call(function(...) { [18:41:23.002] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:23.002] if (!identical(...future.globals.maxSize.org, [18:41:23.002] ...future.globals.maxSize)) { [18:41:23.002] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:23.002] on.exit(options(oopts), add = TRUE) [18:41:23.002] } [18:41:23.002] { [18:41:23.002] lapply(seq_along(...future.elements_ii), [18:41:23.002] FUN = function(jj) { [18:41:23.002] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:23.002] ...future.FUN(...future.X_jj, ...) [18:41:23.002] }) [18:41:23.002] } [18:41:23.002] }, args = future.call.arguments) [18:41:23.002] } [18:41:23.002] }, immediateCondition = function(cond) { [18:41:23.002] sendCondition <- ...future.makeSendCondition() [18:41:23.002] sendCondition(cond) [18:41:23.002] muffleCondition <- function (cond, pattern = "^muffle") [18:41:23.002] { [18:41:23.002] inherits <- base::inherits [18:41:23.002] invokeRestart <- base::invokeRestart [18:41:23.002] is.null <- base::is.null [18:41:23.002] muffled <- FALSE [18:41:23.002] if (inherits(cond, "message")) { [18:41:23.002] muffled <- grepl(pattern, "muffleMessage") [18:41:23.002] if (muffled) [18:41:23.002] invokeRestart("muffleMessage") [18:41:23.002] } [18:41:23.002] else if (inherits(cond, "warning")) { [18:41:23.002] muffled <- grepl(pattern, "muffleWarning") [18:41:23.002] if (muffled) [18:41:23.002] invokeRestart("muffleWarning") [18:41:23.002] } [18:41:23.002] else if (inherits(cond, "condition")) { [18:41:23.002] if (!is.null(pattern)) { [18:41:23.002] computeRestarts <- base::computeRestarts [18:41:23.002] grepl <- base::grepl [18:41:23.002] restarts <- computeRestarts(cond) [18:41:23.002] for (restart in restarts) { [18:41:23.002] name <- restart$name [18:41:23.002] if (is.null(name)) [18:41:23.002] next [18:41:23.002] if (!grepl(pattern, name)) [18:41:23.002] next [18:41:23.002] invokeRestart(restart) [18:41:23.002] muffled <- TRUE [18:41:23.002] break [18:41:23.002] } [18:41:23.002] } [18:41:23.002] } [18:41:23.002] invisible(muffled) [18:41:23.002] } [18:41:23.002] muffleCondition(cond) [18:41:23.002] }) [18:41:23.002] })) [18:41:23.002] future::FutureResult(value = ...future.value$value, [18:41:23.002] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:23.002] ...future.rng), globalenv = if (FALSE) [18:41:23.002] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:23.002] ...future.globalenv.names)) [18:41:23.002] else NULL, started = ...future.startTime, version = "1.8") [18:41:23.002] }, condition = base::local({ [18:41:23.002] c <- base::c [18:41:23.002] inherits <- base::inherits [18:41:23.002] invokeRestart <- base::invokeRestart [18:41:23.002] length <- base::length [18:41:23.002] list <- base::list [18:41:23.002] seq.int <- base::seq.int [18:41:23.002] signalCondition <- base::signalCondition [18:41:23.002] sys.calls <- base::sys.calls [18:41:23.002] `[[` <- base::`[[` [18:41:23.002] `+` <- base::`+` [18:41:23.002] `<<-` <- base::`<<-` [18:41:23.002] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:23.002] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:23.002] 3L)] [18:41:23.002] } [18:41:23.002] function(cond) { [18:41:23.002] is_error <- inherits(cond, "error") [18:41:23.002] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:23.002] NULL) [18:41:23.002] if (is_error) { [18:41:23.002] sessionInformation <- function() { [18:41:23.002] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:23.002] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:23.002] search = base::search(), system = base::Sys.info()) [18:41:23.002] } [18:41:23.002] ...future.conditions[[length(...future.conditions) + [18:41:23.002] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:23.002] cond$call), session = sessionInformation(), [18:41:23.002] timestamp = base::Sys.time(), signaled = 0L) [18:41:23.002] signalCondition(cond) [18:41:23.002] } [18:41:23.002] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:23.002] "immediateCondition"))) { [18:41:23.002] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:23.002] ...future.conditions[[length(...future.conditions) + [18:41:23.002] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:23.002] if (TRUE && !signal) { [18:41:23.002] muffleCondition <- function (cond, pattern = "^muffle") [18:41:23.002] { [18:41:23.002] inherits <- base::inherits [18:41:23.002] invokeRestart <- base::invokeRestart [18:41:23.002] is.null <- base::is.null [18:41:23.002] muffled <- FALSE [18:41:23.002] if (inherits(cond, "message")) { [18:41:23.002] muffled <- grepl(pattern, "muffleMessage") [18:41:23.002] if (muffled) [18:41:23.002] invokeRestart("muffleMessage") [18:41:23.002] } [18:41:23.002] else if (inherits(cond, "warning")) { [18:41:23.002] muffled <- grepl(pattern, "muffleWarning") [18:41:23.002] if (muffled) [18:41:23.002] invokeRestart("muffleWarning") [18:41:23.002] } [18:41:23.002] else if (inherits(cond, "condition")) { [18:41:23.002] if (!is.null(pattern)) { [18:41:23.002] computeRestarts <- base::computeRestarts [18:41:23.002] grepl <- base::grepl [18:41:23.002] restarts <- computeRestarts(cond) [18:41:23.002] for (restart in restarts) { [18:41:23.002] name <- restart$name [18:41:23.002] if (is.null(name)) [18:41:23.002] next [18:41:23.002] if (!grepl(pattern, name)) [18:41:23.002] next [18:41:23.002] invokeRestart(restart) [18:41:23.002] muffled <- TRUE [18:41:23.002] break [18:41:23.002] } [18:41:23.002] } [18:41:23.002] } [18:41:23.002] invisible(muffled) [18:41:23.002] } [18:41:23.002] muffleCondition(cond, pattern = "^muffle") [18:41:23.002] } [18:41:23.002] } [18:41:23.002] else { [18:41:23.002] if (TRUE) { [18:41:23.002] muffleCondition <- function (cond, pattern = "^muffle") [18:41:23.002] { [18:41:23.002] inherits <- base::inherits [18:41:23.002] invokeRestart <- base::invokeRestart [18:41:23.002] is.null <- base::is.null [18:41:23.002] muffled <- FALSE [18:41:23.002] if (inherits(cond, "message")) { [18:41:23.002] muffled <- grepl(pattern, "muffleMessage") [18:41:23.002] if (muffled) [18:41:23.002] invokeRestart("muffleMessage") [18:41:23.002] } [18:41:23.002] else if (inherits(cond, "warning")) { [18:41:23.002] muffled <- grepl(pattern, "muffleWarning") [18:41:23.002] if (muffled) [18:41:23.002] invokeRestart("muffleWarning") [18:41:23.002] } [18:41:23.002] else if (inherits(cond, "condition")) { [18:41:23.002] if (!is.null(pattern)) { [18:41:23.002] computeRestarts <- base::computeRestarts [18:41:23.002] grepl <- base::grepl [18:41:23.002] restarts <- computeRestarts(cond) [18:41:23.002] for (restart in restarts) { [18:41:23.002] name <- restart$name [18:41:23.002] if (is.null(name)) [18:41:23.002] next [18:41:23.002] if (!grepl(pattern, name)) [18:41:23.002] next [18:41:23.002] invokeRestart(restart) [18:41:23.002] muffled <- TRUE [18:41:23.002] break [18:41:23.002] } [18:41:23.002] } [18:41:23.002] } [18:41:23.002] invisible(muffled) [18:41:23.002] } [18:41:23.002] muffleCondition(cond, pattern = "^muffle") [18:41:23.002] } [18:41:23.002] } [18:41:23.002] } [18:41:23.002] })) [18:41:23.002] }, error = function(ex) { [18:41:23.002] base::structure(base::list(value = NULL, visible = NULL, [18:41:23.002] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:23.002] ...future.rng), started = ...future.startTime, [18:41:23.002] finished = Sys.time(), session_uuid = NA_character_, [18:41:23.002] version = "1.8"), class = "FutureResult") [18:41:23.002] }, finally = { [18:41:23.002] if (!identical(...future.workdir, getwd())) [18:41:23.002] setwd(...future.workdir) [18:41:23.002] { [18:41:23.002] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:23.002] ...future.oldOptions$nwarnings <- NULL [18:41:23.002] } [18:41:23.002] base::options(...future.oldOptions) [18:41:23.002] if (.Platform$OS.type == "windows") { [18:41:23.002] old_names <- names(...future.oldEnvVars) [18:41:23.002] envs <- base::Sys.getenv() [18:41:23.002] names <- names(envs) [18:41:23.002] common <- intersect(names, old_names) [18:41:23.002] added <- setdiff(names, old_names) [18:41:23.002] removed <- setdiff(old_names, names) [18:41:23.002] changed <- common[...future.oldEnvVars[common] != [18:41:23.002] envs[common]] [18:41:23.002] NAMES <- toupper(changed) [18:41:23.002] args <- list() [18:41:23.002] for (kk in seq_along(NAMES)) { [18:41:23.002] name <- changed[[kk]] [18:41:23.002] NAME <- NAMES[[kk]] [18:41:23.002] if (name != NAME && is.element(NAME, old_names)) [18:41:23.002] next [18:41:23.002] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:23.002] } [18:41:23.002] NAMES <- toupper(added) [18:41:23.002] for (kk in seq_along(NAMES)) { [18:41:23.002] name <- added[[kk]] [18:41:23.002] NAME <- NAMES[[kk]] [18:41:23.002] if (name != NAME && is.element(NAME, old_names)) [18:41:23.002] next [18:41:23.002] args[[name]] <- "" [18:41:23.002] } [18:41:23.002] NAMES <- toupper(removed) [18:41:23.002] for (kk in seq_along(NAMES)) { [18:41:23.002] name <- removed[[kk]] [18:41:23.002] NAME <- NAMES[[kk]] [18:41:23.002] if (name != NAME && is.element(NAME, old_names)) [18:41:23.002] next [18:41:23.002] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:23.002] } [18:41:23.002] if (length(args) > 0) [18:41:23.002] base::do.call(base::Sys.setenv, args = args) [18:41:23.002] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:23.002] } [18:41:23.002] else { [18:41:23.002] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:23.002] } [18:41:23.002] { [18:41:23.002] if (base::length(...future.futureOptionsAdded) > [18:41:23.002] 0L) { [18:41:23.002] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:23.002] base::names(opts) <- ...future.futureOptionsAdded [18:41:23.002] base::options(opts) [18:41:23.002] } [18:41:23.002] { [18:41:23.002] { [18:41:23.002] base::options(mc.cores = ...future.mc.cores.old) [18:41:23.002] NULL [18:41:23.002] } [18:41:23.002] options(future.plan = NULL) [18:41:23.002] if (is.na(NA_character_)) [18:41:23.002] Sys.unsetenv("R_FUTURE_PLAN") [18:41:23.002] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:23.002] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:23.002] .init = FALSE) [18:41:23.002] } [18:41:23.002] } [18:41:23.002] } [18:41:23.002] }) [18:41:23.002] if (TRUE) { [18:41:23.002] base::sink(type = "output", split = FALSE) [18:41:23.002] if (TRUE) { [18:41:23.002] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:23.002] } [18:41:23.002] else { [18:41:23.002] ...future.result["stdout"] <- base::list(NULL) [18:41:23.002] } [18:41:23.002] base::close(...future.stdout) [18:41:23.002] ...future.stdout <- NULL [18:41:23.002] } [18:41:23.002] ...future.result$conditions <- ...future.conditions [18:41:23.002] ...future.result$finished <- base::Sys.time() [18:41:23.002] ...future.result [18:41:23.002] } [18:41:23.007] Exporting 5 global objects (1.17 KiB) to cluster node #1 ... [18:41:23.007] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... [18:41:23.008] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... DONE [18:41:23.008] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... [18:41:23.008] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... DONE [18:41:23.009] Exporting '...future.elements_ii' (96 bytes) to cluster node #1 ... [18:41:23.009] Exporting '...future.elements_ii' (96 bytes) to cluster node #1 ... DONE [18:41:23.009] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:23.010] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:23.010] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:23.010] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:23.010] Exporting 5 global objects (1.17 KiB) to cluster node #1 ... DONE [18:41:23.011] MultisessionFuture started [18:41:23.011] - Launch lazy future ... done [18:41:23.011] run() for 'MultisessionFuture' ... done [18:41:23.012] Created future: [18:41:23.025] receiveMessageFromWorker() for ClusterFuture ... [18:41:23.025] - Validating connection of MultisessionFuture [18:41:23.025] - received message: FutureResult [18:41:23.025] - Received FutureResult [18:41:23.026] - Erased future from FutureRegistry [18:41:23.026] result() for ClusterFuture ... [18:41:23.026] - result already collected: FutureResult [18:41:23.026] result() for ClusterFuture ... done [18:41:23.026] receiveMessageFromWorker() for ClusterFuture ... done [18:41:23.012] MultisessionFuture: [18:41:23.012] Label: 'future_lapply-1' [18:41:23.012] Expression: [18:41:23.012] { [18:41:23.012] do.call(function(...) { [18:41:23.012] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:23.012] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:23.012] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:23.012] on.exit(options(oopts), add = TRUE) [18:41:23.012] } [18:41:23.012] { [18:41:23.012] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:23.012] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:23.012] ...future.FUN(...future.X_jj, ...) [18:41:23.012] }) [18:41:23.012] } [18:41:23.012] }, args = future.call.arguments) [18:41:23.012] } [18:41:23.012] Lazy evaluation: FALSE [18:41:23.012] Asynchronous evaluation: TRUE [18:41:23.012] Local evaluation: TRUE [18:41:23.012] Environment: R_GlobalEnv [18:41:23.012] Capture standard output: TRUE [18:41:23.012] Capture condition classes: 'condition' (excluding 'nothing') [18:41:23.012] Globals: 5 objects totaling 758 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 96 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:23.012] Packages: [18:41:23.012] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:23.012] Resolved: TRUE [18:41:23.012] Value: [18:41:23.012] Conditions captured: [18:41:23.012] Early signaling: FALSE [18:41:23.012] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:23.012] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:23.027] Chunk #1 of 4 ... DONE [18:41:23.027] Chunk #2 of 4 ... [18:41:23.027] - Finding globals in 'X' for chunk #2 ... [18:41:23.027] getGlobalsAndPackages() ... [18:41:23.028] Searching for globals... [18:41:23.028] [18:41:23.028] Searching for globals ... DONE [18:41:23.028] - globals: [0] [18:41:23.029] getGlobalsAndPackages() ... DONE [18:41:23.029] + additional globals found: [n=0] [18:41:23.029] + additional namespaces needed: [n=0] [18:41:23.029] - Finding globals in 'X' for chunk #2 ... DONE [18:41:23.029] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:23.029] - seeds: [18:41:23.030] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:23.030] getGlobalsAndPackages() ... [18:41:23.030] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:23.030] Resolving globals: FALSE [18:41:23.030] Tweak future expression to call with '...' arguments ... [18:41:23.031] { [18:41:23.031] do.call(function(...) { [18:41:23.031] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:23.031] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:23.031] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:23.031] on.exit(options(oopts), add = TRUE) [18:41:23.031] } [18:41:23.031] { [18:41:23.031] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:23.031] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:23.031] ...future.FUN(...future.X_jj, ...) [18:41:23.031] }) [18:41:23.031] } [18:41:23.031] }, args = future.call.arguments) [18:41:23.031] } [18:41:23.031] Tweak future expression to call with '...' arguments ... DONE [18:41:23.032] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:23.032] [18:41:23.032] getGlobalsAndPackages() ... DONE [18:41:23.032] run() for 'Future' ... [18:41:23.033] - state: 'created' [18:41:23.033] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:23.049] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:23.049] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:23.050] - Field: 'node' [18:41:23.050] - Field: 'label' [18:41:23.050] - Field: 'local' [18:41:23.050] - Field: 'owner' [18:41:23.050] - Field: 'envir' [18:41:23.050] - Field: 'workers' [18:41:23.051] - Field: 'packages' [18:41:23.051] - Field: 'gc' [18:41:23.051] - Field: 'conditions' [18:41:23.051] - Field: 'persistent' [18:41:23.052] - Field: 'expr' [18:41:23.052] - Field: 'uuid' [18:41:23.052] - Field: 'seed' [18:41:23.052] - Field: 'version' [18:41:23.052] - Field: 'result' [18:41:23.053] - Field: 'asynchronous' [18:41:23.053] - Field: 'calls' [18:41:23.053] - Field: 'globals' [18:41:23.053] - Field: 'stdout' [18:41:23.053] - Field: 'earlySignal' [18:41:23.054] - Field: 'lazy' [18:41:23.054] - Field: 'state' [18:41:23.054] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:23.054] - Launch lazy future ... [18:41:23.055] Packages needed by the future expression (n = 0): [18:41:23.055] Packages needed by future strategies (n = 0): [18:41:23.058] { [18:41:23.058] { [18:41:23.058] { [18:41:23.058] ...future.startTime <- base::Sys.time() [18:41:23.058] { [18:41:23.058] { [18:41:23.058] { [18:41:23.058] { [18:41:23.058] base::local({ [18:41:23.058] has_future <- base::requireNamespace("future", [18:41:23.058] quietly = TRUE) [18:41:23.058] if (has_future) { [18:41:23.058] ns <- base::getNamespace("future") [18:41:23.058] version <- ns[[".package"]][["version"]] [18:41:23.058] if (is.null(version)) [18:41:23.058] version <- utils::packageVersion("future") [18:41:23.058] } [18:41:23.058] else { [18:41:23.058] version <- NULL [18:41:23.058] } [18:41:23.058] if (!has_future || version < "1.8.0") { [18:41:23.058] info <- base::c(r_version = base::gsub("R version ", [18:41:23.058] "", base::R.version$version.string), [18:41:23.058] platform = base::sprintf("%s (%s-bit)", [18:41:23.058] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:23.058] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:23.058] "release", "version")], collapse = " "), [18:41:23.058] hostname = base::Sys.info()[["nodename"]]) [18:41:23.058] info <- base::sprintf("%s: %s", base::names(info), [18:41:23.058] info) [18:41:23.058] info <- base::paste(info, collapse = "; ") [18:41:23.058] if (!has_future) { [18:41:23.058] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:23.058] info) [18:41:23.058] } [18:41:23.058] else { [18:41:23.058] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:23.058] info, version) [18:41:23.058] } [18:41:23.058] base::stop(msg) [18:41:23.058] } [18:41:23.058] }) [18:41:23.058] } [18:41:23.058] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:23.058] base::options(mc.cores = 1L) [18:41:23.058] } [18:41:23.058] ...future.strategy.old <- future::plan("list") [18:41:23.058] options(future.plan = NULL) [18:41:23.058] Sys.unsetenv("R_FUTURE_PLAN") [18:41:23.058] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:23.058] } [18:41:23.058] ...future.workdir <- getwd() [18:41:23.058] } [18:41:23.058] ...future.oldOptions <- base::as.list(base::.Options) [18:41:23.058] ...future.oldEnvVars <- base::Sys.getenv() [18:41:23.058] } [18:41:23.058] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:23.058] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:23.058] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:23.058] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:23.058] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:23.058] future.stdout.windows.reencode = NULL, width = 80L) [18:41:23.058] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:23.058] base::names(...future.oldOptions)) [18:41:23.058] } [18:41:23.058] if (FALSE) { [18:41:23.058] } [18:41:23.058] else { [18:41:23.058] if (TRUE) { [18:41:23.058] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:23.058] open = "w") [18:41:23.058] } [18:41:23.058] else { [18:41:23.058] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:23.058] windows = "NUL", "/dev/null"), open = "w") [18:41:23.058] } [18:41:23.058] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:23.058] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:23.058] base::sink(type = "output", split = FALSE) [18:41:23.058] base::close(...future.stdout) [18:41:23.058] }, add = TRUE) [18:41:23.058] } [18:41:23.058] ...future.frame <- base::sys.nframe() [18:41:23.058] ...future.conditions <- base::list() [18:41:23.058] ...future.rng <- base::globalenv()$.Random.seed [18:41:23.058] if (FALSE) { [18:41:23.058] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:23.058] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:23.058] } [18:41:23.058] ...future.result <- base::tryCatch({ [18:41:23.058] base::withCallingHandlers({ [18:41:23.058] ...future.value <- base::withVisible(base::local({ [18:41:23.058] ...future.makeSendCondition <- base::local({ [18:41:23.058] sendCondition <- NULL [18:41:23.058] function(frame = 1L) { [18:41:23.058] if (is.function(sendCondition)) [18:41:23.058] return(sendCondition) [18:41:23.058] ns <- getNamespace("parallel") [18:41:23.058] if (exists("sendData", mode = "function", [18:41:23.058] envir = ns)) { [18:41:23.058] parallel_sendData <- get("sendData", mode = "function", [18:41:23.058] envir = ns) [18:41:23.058] envir <- sys.frame(frame) [18:41:23.058] master <- NULL [18:41:23.058] while (!identical(envir, .GlobalEnv) && [18:41:23.058] !identical(envir, emptyenv())) { [18:41:23.058] if (exists("master", mode = "list", envir = envir, [18:41:23.058] inherits = FALSE)) { [18:41:23.058] master <- get("master", mode = "list", [18:41:23.058] envir = envir, inherits = FALSE) [18:41:23.058] if (inherits(master, c("SOCKnode", [18:41:23.058] "SOCK0node"))) { [18:41:23.058] sendCondition <<- function(cond) { [18:41:23.058] data <- list(type = "VALUE", value = cond, [18:41:23.058] success = TRUE) [18:41:23.058] parallel_sendData(master, data) [18:41:23.058] } [18:41:23.058] return(sendCondition) [18:41:23.058] } [18:41:23.058] } [18:41:23.058] frame <- frame + 1L [18:41:23.058] envir <- sys.frame(frame) [18:41:23.058] } [18:41:23.058] } [18:41:23.058] sendCondition <<- function(cond) NULL [18:41:23.058] } [18:41:23.058] }) [18:41:23.058] withCallingHandlers({ [18:41:23.058] { [18:41:23.058] do.call(function(...) { [18:41:23.058] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:23.058] if (!identical(...future.globals.maxSize.org, [18:41:23.058] ...future.globals.maxSize)) { [18:41:23.058] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:23.058] on.exit(options(oopts), add = TRUE) [18:41:23.058] } [18:41:23.058] { [18:41:23.058] lapply(seq_along(...future.elements_ii), [18:41:23.058] FUN = function(jj) { [18:41:23.058] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:23.058] ...future.FUN(...future.X_jj, ...) [18:41:23.058] }) [18:41:23.058] } [18:41:23.058] }, args = future.call.arguments) [18:41:23.058] } [18:41:23.058] }, immediateCondition = function(cond) { [18:41:23.058] sendCondition <- ...future.makeSendCondition() [18:41:23.058] sendCondition(cond) [18:41:23.058] muffleCondition <- function (cond, pattern = "^muffle") [18:41:23.058] { [18:41:23.058] inherits <- base::inherits [18:41:23.058] invokeRestart <- base::invokeRestart [18:41:23.058] is.null <- base::is.null [18:41:23.058] muffled <- FALSE [18:41:23.058] if (inherits(cond, "message")) { [18:41:23.058] muffled <- grepl(pattern, "muffleMessage") [18:41:23.058] if (muffled) [18:41:23.058] invokeRestart("muffleMessage") [18:41:23.058] } [18:41:23.058] else if (inherits(cond, "warning")) { [18:41:23.058] muffled <- grepl(pattern, "muffleWarning") [18:41:23.058] if (muffled) [18:41:23.058] invokeRestart("muffleWarning") [18:41:23.058] } [18:41:23.058] else if (inherits(cond, "condition")) { [18:41:23.058] if (!is.null(pattern)) { [18:41:23.058] computeRestarts <- base::computeRestarts [18:41:23.058] grepl <- base::grepl [18:41:23.058] restarts <- computeRestarts(cond) [18:41:23.058] for (restart in restarts) { [18:41:23.058] name <- restart$name [18:41:23.058] if (is.null(name)) [18:41:23.058] next [18:41:23.058] if (!grepl(pattern, name)) [18:41:23.058] next [18:41:23.058] invokeRestart(restart) [18:41:23.058] muffled <- TRUE [18:41:23.058] break [18:41:23.058] } [18:41:23.058] } [18:41:23.058] } [18:41:23.058] invisible(muffled) [18:41:23.058] } [18:41:23.058] muffleCondition(cond) [18:41:23.058] }) [18:41:23.058] })) [18:41:23.058] future::FutureResult(value = ...future.value$value, [18:41:23.058] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:23.058] ...future.rng), globalenv = if (FALSE) [18:41:23.058] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:23.058] ...future.globalenv.names)) [18:41:23.058] else NULL, started = ...future.startTime, version = "1.8") [18:41:23.058] }, condition = base::local({ [18:41:23.058] c <- base::c [18:41:23.058] inherits <- base::inherits [18:41:23.058] invokeRestart <- base::invokeRestart [18:41:23.058] length <- base::length [18:41:23.058] list <- base::list [18:41:23.058] seq.int <- base::seq.int [18:41:23.058] signalCondition <- base::signalCondition [18:41:23.058] sys.calls <- base::sys.calls [18:41:23.058] `[[` <- base::`[[` [18:41:23.058] `+` <- base::`+` [18:41:23.058] `<<-` <- base::`<<-` [18:41:23.058] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:23.058] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:23.058] 3L)] [18:41:23.058] } [18:41:23.058] function(cond) { [18:41:23.058] is_error <- inherits(cond, "error") [18:41:23.058] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:23.058] NULL) [18:41:23.058] if (is_error) { [18:41:23.058] sessionInformation <- function() { [18:41:23.058] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:23.058] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:23.058] search = base::search(), system = base::Sys.info()) [18:41:23.058] } [18:41:23.058] ...future.conditions[[length(...future.conditions) + [18:41:23.058] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:23.058] cond$call), session = sessionInformation(), [18:41:23.058] timestamp = base::Sys.time(), signaled = 0L) [18:41:23.058] signalCondition(cond) [18:41:23.058] } [18:41:23.058] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:23.058] "immediateCondition"))) { [18:41:23.058] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:23.058] ...future.conditions[[length(...future.conditions) + [18:41:23.058] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:23.058] if (TRUE && !signal) { [18:41:23.058] muffleCondition <- function (cond, pattern = "^muffle") [18:41:23.058] { [18:41:23.058] inherits <- base::inherits [18:41:23.058] invokeRestart <- base::invokeRestart [18:41:23.058] is.null <- base::is.null [18:41:23.058] muffled <- FALSE [18:41:23.058] if (inherits(cond, "message")) { [18:41:23.058] muffled <- grepl(pattern, "muffleMessage") [18:41:23.058] if (muffled) [18:41:23.058] invokeRestart("muffleMessage") [18:41:23.058] } [18:41:23.058] else if (inherits(cond, "warning")) { [18:41:23.058] muffled <- grepl(pattern, "muffleWarning") [18:41:23.058] if (muffled) [18:41:23.058] invokeRestart("muffleWarning") [18:41:23.058] } [18:41:23.058] else if (inherits(cond, "condition")) { [18:41:23.058] if (!is.null(pattern)) { [18:41:23.058] computeRestarts <- base::computeRestarts [18:41:23.058] grepl <- base::grepl [18:41:23.058] restarts <- computeRestarts(cond) [18:41:23.058] for (restart in restarts) { [18:41:23.058] name <- restart$name [18:41:23.058] if (is.null(name)) [18:41:23.058] next [18:41:23.058] if (!grepl(pattern, name)) [18:41:23.058] next [18:41:23.058] invokeRestart(restart) [18:41:23.058] muffled <- TRUE [18:41:23.058] break [18:41:23.058] } [18:41:23.058] } [18:41:23.058] } [18:41:23.058] invisible(muffled) [18:41:23.058] } [18:41:23.058] muffleCondition(cond, pattern = "^muffle") [18:41:23.058] } [18:41:23.058] } [18:41:23.058] else { [18:41:23.058] if (TRUE) { [18:41:23.058] muffleCondition <- function (cond, pattern = "^muffle") [18:41:23.058] { [18:41:23.058] inherits <- base::inherits [18:41:23.058] invokeRestart <- base::invokeRestart [18:41:23.058] is.null <- base::is.null [18:41:23.058] muffled <- FALSE [18:41:23.058] if (inherits(cond, "message")) { [18:41:23.058] muffled <- grepl(pattern, "muffleMessage") [18:41:23.058] if (muffled) [18:41:23.058] invokeRestart("muffleMessage") [18:41:23.058] } [18:41:23.058] else if (inherits(cond, "warning")) { [18:41:23.058] muffled <- grepl(pattern, "muffleWarning") [18:41:23.058] if (muffled) [18:41:23.058] invokeRestart("muffleWarning") [18:41:23.058] } [18:41:23.058] else if (inherits(cond, "condition")) { [18:41:23.058] if (!is.null(pattern)) { [18:41:23.058] computeRestarts <- base::computeRestarts [18:41:23.058] grepl <- base::grepl [18:41:23.058] restarts <- computeRestarts(cond) [18:41:23.058] for (restart in restarts) { [18:41:23.058] name <- restart$name [18:41:23.058] if (is.null(name)) [18:41:23.058] next [18:41:23.058] if (!grepl(pattern, name)) [18:41:23.058] next [18:41:23.058] invokeRestart(restart) [18:41:23.058] muffled <- TRUE [18:41:23.058] break [18:41:23.058] } [18:41:23.058] } [18:41:23.058] } [18:41:23.058] invisible(muffled) [18:41:23.058] } [18:41:23.058] muffleCondition(cond, pattern = "^muffle") [18:41:23.058] } [18:41:23.058] } [18:41:23.058] } [18:41:23.058] })) [18:41:23.058] }, error = function(ex) { [18:41:23.058] base::structure(base::list(value = NULL, visible = NULL, [18:41:23.058] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:23.058] ...future.rng), started = ...future.startTime, [18:41:23.058] finished = Sys.time(), session_uuid = NA_character_, [18:41:23.058] version = "1.8"), class = "FutureResult") [18:41:23.058] }, finally = { [18:41:23.058] if (!identical(...future.workdir, getwd())) [18:41:23.058] setwd(...future.workdir) [18:41:23.058] { [18:41:23.058] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:23.058] ...future.oldOptions$nwarnings <- NULL [18:41:23.058] } [18:41:23.058] base::options(...future.oldOptions) [18:41:23.058] if (.Platform$OS.type == "windows") { [18:41:23.058] old_names <- names(...future.oldEnvVars) [18:41:23.058] envs <- base::Sys.getenv() [18:41:23.058] names <- names(envs) [18:41:23.058] common <- intersect(names, old_names) [18:41:23.058] added <- setdiff(names, old_names) [18:41:23.058] removed <- setdiff(old_names, names) [18:41:23.058] changed <- common[...future.oldEnvVars[common] != [18:41:23.058] envs[common]] [18:41:23.058] NAMES <- toupper(changed) [18:41:23.058] args <- list() [18:41:23.058] for (kk in seq_along(NAMES)) { [18:41:23.058] name <- changed[[kk]] [18:41:23.058] NAME <- NAMES[[kk]] [18:41:23.058] if (name != NAME && is.element(NAME, old_names)) [18:41:23.058] next [18:41:23.058] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:23.058] } [18:41:23.058] NAMES <- toupper(added) [18:41:23.058] for (kk in seq_along(NAMES)) { [18:41:23.058] name <- added[[kk]] [18:41:23.058] NAME <- NAMES[[kk]] [18:41:23.058] if (name != NAME && is.element(NAME, old_names)) [18:41:23.058] next [18:41:23.058] args[[name]] <- "" [18:41:23.058] } [18:41:23.058] NAMES <- toupper(removed) [18:41:23.058] for (kk in seq_along(NAMES)) { [18:41:23.058] name <- removed[[kk]] [18:41:23.058] NAME <- NAMES[[kk]] [18:41:23.058] if (name != NAME && is.element(NAME, old_names)) [18:41:23.058] next [18:41:23.058] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:23.058] } [18:41:23.058] if (length(args) > 0) [18:41:23.058] base::do.call(base::Sys.setenv, args = args) [18:41:23.058] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:23.058] } [18:41:23.058] else { [18:41:23.058] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:23.058] } [18:41:23.058] { [18:41:23.058] if (base::length(...future.futureOptionsAdded) > [18:41:23.058] 0L) { [18:41:23.058] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:23.058] base::names(opts) <- ...future.futureOptionsAdded [18:41:23.058] base::options(opts) [18:41:23.058] } [18:41:23.058] { [18:41:23.058] { [18:41:23.058] base::options(mc.cores = ...future.mc.cores.old) [18:41:23.058] NULL [18:41:23.058] } [18:41:23.058] options(future.plan = NULL) [18:41:23.058] if (is.na(NA_character_)) [18:41:23.058] Sys.unsetenv("R_FUTURE_PLAN") [18:41:23.058] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:23.058] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:23.058] .init = FALSE) [18:41:23.058] } [18:41:23.058] } [18:41:23.058] } [18:41:23.058] }) [18:41:23.058] if (TRUE) { [18:41:23.058] base::sink(type = "output", split = FALSE) [18:41:23.058] if (TRUE) { [18:41:23.058] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:23.058] } [18:41:23.058] else { [18:41:23.058] ...future.result["stdout"] <- base::list(NULL) [18:41:23.058] } [18:41:23.058] base::close(...future.stdout) [18:41:23.058] ...future.stdout <- NULL [18:41:23.058] } [18:41:23.058] ...future.result$conditions <- ...future.conditions [18:41:23.058] ...future.result$finished <- base::Sys.time() [18:41:23.058] ...future.result [18:41:23.058] } [18:41:23.064] Exporting 5 global objects (1.17 KiB) to cluster node #1 ... [18:41:23.064] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... [18:41:23.065] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... DONE [18:41:23.065] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... [18:41:23.065] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... DONE [18:41:23.065] Exporting '...future.elements_ii' (96 bytes) to cluster node #1 ... [18:41:23.066] Exporting '...future.elements_ii' (96 bytes) to cluster node #1 ... DONE [18:41:23.066] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:23.066] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:23.067] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:23.067] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:23.067] Exporting 5 global objects (1.17 KiB) to cluster node #1 ... DONE [18:41:23.068] MultisessionFuture started [18:41:23.068] - Launch lazy future ... done [18:41:23.068] run() for 'MultisessionFuture' ... done [18:41:23.068] Created future: [18:41:23.083] receiveMessageFromWorker() for ClusterFuture ... [18:41:23.083] - Validating connection of MultisessionFuture [18:41:23.084] - received message: FutureResult [18:41:23.084] - Received FutureResult [18:41:23.084] - Erased future from FutureRegistry [18:41:23.084] result() for ClusterFuture ... [18:41:23.084] - result already collected: FutureResult [18:41:23.084] result() for ClusterFuture ... done [18:41:23.085] receiveMessageFromWorker() for ClusterFuture ... done [18:41:23.068] MultisessionFuture: [18:41:23.068] Label: 'future_lapply-2' [18:41:23.068] Expression: [18:41:23.068] { [18:41:23.068] do.call(function(...) { [18:41:23.068] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:23.068] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:23.068] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:23.068] on.exit(options(oopts), add = TRUE) [18:41:23.068] } [18:41:23.068] { [18:41:23.068] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:23.068] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:23.068] ...future.FUN(...future.X_jj, ...) [18:41:23.068] }) [18:41:23.068] } [18:41:23.068] }, args = future.call.arguments) [18:41:23.068] } [18:41:23.068] Lazy evaluation: FALSE [18:41:23.068] Asynchronous evaluation: TRUE [18:41:23.068] Local evaluation: TRUE [18:41:23.068] Environment: R_GlobalEnv [18:41:23.068] Capture standard output: TRUE [18:41:23.068] Capture condition classes: 'condition' (excluding 'nothing') [18:41:23.068] Globals: 5 objects totaling 758 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 96 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:23.068] Packages: [18:41:23.068] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:23.068] Resolved: TRUE [18:41:23.068] Value: [18:41:23.068] Conditions captured: [18:41:23.068] Early signaling: FALSE [18:41:23.068] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:23.068] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:23.085] Chunk #2 of 4 ... DONE [18:41:23.085] Chunk #3 of 4 ... [18:41:23.085] - Finding globals in 'X' for chunk #3 ... [18:41:23.086] getGlobalsAndPackages() ... [18:41:23.086] Searching for globals... [18:41:23.086] [18:41:23.086] Searching for globals ... DONE [18:41:23.086] - globals: [0] [18:41:23.086] getGlobalsAndPackages() ... DONE [18:41:23.087] + additional globals found: [n=0] [18:41:23.087] + additional namespaces needed: [n=0] [18:41:23.087] - Finding globals in 'X' for chunk #3 ... DONE [18:41:23.087] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:23.087] - seeds: [18:41:23.087] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:23.088] getGlobalsAndPackages() ... [18:41:23.088] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:23.088] Resolving globals: FALSE [18:41:23.088] Tweak future expression to call with '...' arguments ... [18:41:23.088] { [18:41:23.088] do.call(function(...) { [18:41:23.088] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:23.088] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:23.088] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:23.088] on.exit(options(oopts), add = TRUE) [18:41:23.088] } [18:41:23.088] { [18:41:23.088] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:23.088] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:23.088] ...future.FUN(...future.X_jj, ...) [18:41:23.088] }) [18:41:23.088] } [18:41:23.088] }, args = future.call.arguments) [18:41:23.088] } [18:41:23.089] Tweak future expression to call with '...' arguments ... DONE [18:41:23.089] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:23.089] [18:41:23.090] getGlobalsAndPackages() ... DONE [18:41:23.090] run() for 'Future' ... [18:41:23.090] - state: 'created' [18:41:23.090] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:23.106] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:23.106] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:23.106] - Field: 'node' [18:41:23.106] - Field: 'label' [18:41:23.107] - Field: 'local' [18:41:23.107] - Field: 'owner' [18:41:23.107] - Field: 'envir' [18:41:23.107] - Field: 'workers' [18:41:23.107] - Field: 'packages' [18:41:23.108] - Field: 'gc' [18:41:23.108] - Field: 'conditions' [18:41:23.108] - Field: 'persistent' [18:41:23.108] - Field: 'expr' [18:41:23.108] - Field: 'uuid' [18:41:23.108] - Field: 'seed' [18:41:23.109] - Field: 'version' [18:41:23.109] - Field: 'result' [18:41:23.109] - Field: 'asynchronous' [18:41:23.109] - Field: 'calls' [18:41:23.109] - Field: 'globals' [18:41:23.109] - Field: 'stdout' [18:41:23.110] - Field: 'earlySignal' [18:41:23.110] - Field: 'lazy' [18:41:23.110] - Field: 'state' [18:41:23.110] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:23.110] - Launch lazy future ... [18:41:23.111] Packages needed by the future expression (n = 0): [18:41:23.111] Packages needed by future strategies (n = 0): [18:41:23.111] { [18:41:23.111] { [18:41:23.111] { [18:41:23.111] ...future.startTime <- base::Sys.time() [18:41:23.111] { [18:41:23.111] { [18:41:23.111] { [18:41:23.111] { [18:41:23.111] base::local({ [18:41:23.111] has_future <- base::requireNamespace("future", [18:41:23.111] quietly = TRUE) [18:41:23.111] if (has_future) { [18:41:23.111] ns <- base::getNamespace("future") [18:41:23.111] version <- ns[[".package"]][["version"]] [18:41:23.111] if (is.null(version)) [18:41:23.111] version <- utils::packageVersion("future") [18:41:23.111] } [18:41:23.111] else { [18:41:23.111] version <- NULL [18:41:23.111] } [18:41:23.111] if (!has_future || version < "1.8.0") { [18:41:23.111] info <- base::c(r_version = base::gsub("R version ", [18:41:23.111] "", base::R.version$version.string), [18:41:23.111] platform = base::sprintf("%s (%s-bit)", [18:41:23.111] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:23.111] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:23.111] "release", "version")], collapse = " "), [18:41:23.111] hostname = base::Sys.info()[["nodename"]]) [18:41:23.111] info <- base::sprintf("%s: %s", base::names(info), [18:41:23.111] info) [18:41:23.111] info <- base::paste(info, collapse = "; ") [18:41:23.111] if (!has_future) { [18:41:23.111] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:23.111] info) [18:41:23.111] } [18:41:23.111] else { [18:41:23.111] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:23.111] info, version) [18:41:23.111] } [18:41:23.111] base::stop(msg) [18:41:23.111] } [18:41:23.111] }) [18:41:23.111] } [18:41:23.111] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:23.111] base::options(mc.cores = 1L) [18:41:23.111] } [18:41:23.111] ...future.strategy.old <- future::plan("list") [18:41:23.111] options(future.plan = NULL) [18:41:23.111] Sys.unsetenv("R_FUTURE_PLAN") [18:41:23.111] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:23.111] } [18:41:23.111] ...future.workdir <- getwd() [18:41:23.111] } [18:41:23.111] ...future.oldOptions <- base::as.list(base::.Options) [18:41:23.111] ...future.oldEnvVars <- base::Sys.getenv() [18:41:23.111] } [18:41:23.111] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:23.111] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:23.111] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:23.111] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:23.111] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:23.111] future.stdout.windows.reencode = NULL, width = 80L) [18:41:23.111] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:23.111] base::names(...future.oldOptions)) [18:41:23.111] } [18:41:23.111] if (FALSE) { [18:41:23.111] } [18:41:23.111] else { [18:41:23.111] if (TRUE) { [18:41:23.111] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:23.111] open = "w") [18:41:23.111] } [18:41:23.111] else { [18:41:23.111] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:23.111] windows = "NUL", "/dev/null"), open = "w") [18:41:23.111] } [18:41:23.111] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:23.111] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:23.111] base::sink(type = "output", split = FALSE) [18:41:23.111] base::close(...future.stdout) [18:41:23.111] }, add = TRUE) [18:41:23.111] } [18:41:23.111] ...future.frame <- base::sys.nframe() [18:41:23.111] ...future.conditions <- base::list() [18:41:23.111] ...future.rng <- base::globalenv()$.Random.seed [18:41:23.111] if (FALSE) { [18:41:23.111] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:23.111] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:23.111] } [18:41:23.111] ...future.result <- base::tryCatch({ [18:41:23.111] base::withCallingHandlers({ [18:41:23.111] ...future.value <- base::withVisible(base::local({ [18:41:23.111] ...future.makeSendCondition <- base::local({ [18:41:23.111] sendCondition <- NULL [18:41:23.111] function(frame = 1L) { [18:41:23.111] if (is.function(sendCondition)) [18:41:23.111] return(sendCondition) [18:41:23.111] ns <- getNamespace("parallel") [18:41:23.111] if (exists("sendData", mode = "function", [18:41:23.111] envir = ns)) { [18:41:23.111] parallel_sendData <- get("sendData", mode = "function", [18:41:23.111] envir = ns) [18:41:23.111] envir <- sys.frame(frame) [18:41:23.111] master <- NULL [18:41:23.111] while (!identical(envir, .GlobalEnv) && [18:41:23.111] !identical(envir, emptyenv())) { [18:41:23.111] if (exists("master", mode = "list", envir = envir, [18:41:23.111] inherits = FALSE)) { [18:41:23.111] master <- get("master", mode = "list", [18:41:23.111] envir = envir, inherits = FALSE) [18:41:23.111] if (inherits(master, c("SOCKnode", [18:41:23.111] "SOCK0node"))) { [18:41:23.111] sendCondition <<- function(cond) { [18:41:23.111] data <- list(type = "VALUE", value = cond, [18:41:23.111] success = TRUE) [18:41:23.111] parallel_sendData(master, data) [18:41:23.111] } [18:41:23.111] return(sendCondition) [18:41:23.111] } [18:41:23.111] } [18:41:23.111] frame <- frame + 1L [18:41:23.111] envir <- sys.frame(frame) [18:41:23.111] } [18:41:23.111] } [18:41:23.111] sendCondition <<- function(cond) NULL [18:41:23.111] } [18:41:23.111] }) [18:41:23.111] withCallingHandlers({ [18:41:23.111] { [18:41:23.111] do.call(function(...) { [18:41:23.111] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:23.111] if (!identical(...future.globals.maxSize.org, [18:41:23.111] ...future.globals.maxSize)) { [18:41:23.111] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:23.111] on.exit(options(oopts), add = TRUE) [18:41:23.111] } [18:41:23.111] { [18:41:23.111] lapply(seq_along(...future.elements_ii), [18:41:23.111] FUN = function(jj) { [18:41:23.111] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:23.111] ...future.FUN(...future.X_jj, ...) [18:41:23.111] }) [18:41:23.111] } [18:41:23.111] }, args = future.call.arguments) [18:41:23.111] } [18:41:23.111] }, immediateCondition = function(cond) { [18:41:23.111] sendCondition <- ...future.makeSendCondition() [18:41:23.111] sendCondition(cond) [18:41:23.111] muffleCondition <- function (cond, pattern = "^muffle") [18:41:23.111] { [18:41:23.111] inherits <- base::inherits [18:41:23.111] invokeRestart <- base::invokeRestart [18:41:23.111] is.null <- base::is.null [18:41:23.111] muffled <- FALSE [18:41:23.111] if (inherits(cond, "message")) { [18:41:23.111] muffled <- grepl(pattern, "muffleMessage") [18:41:23.111] if (muffled) [18:41:23.111] invokeRestart("muffleMessage") [18:41:23.111] } [18:41:23.111] else if (inherits(cond, "warning")) { [18:41:23.111] muffled <- grepl(pattern, "muffleWarning") [18:41:23.111] if (muffled) [18:41:23.111] invokeRestart("muffleWarning") [18:41:23.111] } [18:41:23.111] else if (inherits(cond, "condition")) { [18:41:23.111] if (!is.null(pattern)) { [18:41:23.111] computeRestarts <- base::computeRestarts [18:41:23.111] grepl <- base::grepl [18:41:23.111] restarts <- computeRestarts(cond) [18:41:23.111] for (restart in restarts) { [18:41:23.111] name <- restart$name [18:41:23.111] if (is.null(name)) [18:41:23.111] next [18:41:23.111] if (!grepl(pattern, name)) [18:41:23.111] next [18:41:23.111] invokeRestart(restart) [18:41:23.111] muffled <- TRUE [18:41:23.111] break [18:41:23.111] } [18:41:23.111] } [18:41:23.111] } [18:41:23.111] invisible(muffled) [18:41:23.111] } [18:41:23.111] muffleCondition(cond) [18:41:23.111] }) [18:41:23.111] })) [18:41:23.111] future::FutureResult(value = ...future.value$value, [18:41:23.111] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:23.111] ...future.rng), globalenv = if (FALSE) [18:41:23.111] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:23.111] ...future.globalenv.names)) [18:41:23.111] else NULL, started = ...future.startTime, version = "1.8") [18:41:23.111] }, condition = base::local({ [18:41:23.111] c <- base::c [18:41:23.111] inherits <- base::inherits [18:41:23.111] invokeRestart <- base::invokeRestart [18:41:23.111] length <- base::length [18:41:23.111] list <- base::list [18:41:23.111] seq.int <- base::seq.int [18:41:23.111] signalCondition <- base::signalCondition [18:41:23.111] sys.calls <- base::sys.calls [18:41:23.111] `[[` <- base::`[[` [18:41:23.111] `+` <- base::`+` [18:41:23.111] `<<-` <- base::`<<-` [18:41:23.111] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:23.111] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:23.111] 3L)] [18:41:23.111] } [18:41:23.111] function(cond) { [18:41:23.111] is_error <- inherits(cond, "error") [18:41:23.111] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:23.111] NULL) [18:41:23.111] if (is_error) { [18:41:23.111] sessionInformation <- function() { [18:41:23.111] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:23.111] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:23.111] search = base::search(), system = base::Sys.info()) [18:41:23.111] } [18:41:23.111] ...future.conditions[[length(...future.conditions) + [18:41:23.111] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:23.111] cond$call), session = sessionInformation(), [18:41:23.111] timestamp = base::Sys.time(), signaled = 0L) [18:41:23.111] signalCondition(cond) [18:41:23.111] } [18:41:23.111] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:23.111] "immediateCondition"))) { [18:41:23.111] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:23.111] ...future.conditions[[length(...future.conditions) + [18:41:23.111] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:23.111] if (TRUE && !signal) { [18:41:23.111] muffleCondition <- function (cond, pattern = "^muffle") [18:41:23.111] { [18:41:23.111] inherits <- base::inherits [18:41:23.111] invokeRestart <- base::invokeRestart [18:41:23.111] is.null <- base::is.null [18:41:23.111] muffled <- FALSE [18:41:23.111] if (inherits(cond, "message")) { [18:41:23.111] muffled <- grepl(pattern, "muffleMessage") [18:41:23.111] if (muffled) [18:41:23.111] invokeRestart("muffleMessage") [18:41:23.111] } [18:41:23.111] else if (inherits(cond, "warning")) { [18:41:23.111] muffled <- grepl(pattern, "muffleWarning") [18:41:23.111] if (muffled) [18:41:23.111] invokeRestart("muffleWarning") [18:41:23.111] } [18:41:23.111] else if (inherits(cond, "condition")) { [18:41:23.111] if (!is.null(pattern)) { [18:41:23.111] computeRestarts <- base::computeRestarts [18:41:23.111] grepl <- base::grepl [18:41:23.111] restarts <- computeRestarts(cond) [18:41:23.111] for (restart in restarts) { [18:41:23.111] name <- restart$name [18:41:23.111] if (is.null(name)) [18:41:23.111] next [18:41:23.111] if (!grepl(pattern, name)) [18:41:23.111] next [18:41:23.111] invokeRestart(restart) [18:41:23.111] muffled <- TRUE [18:41:23.111] break [18:41:23.111] } [18:41:23.111] } [18:41:23.111] } [18:41:23.111] invisible(muffled) [18:41:23.111] } [18:41:23.111] muffleCondition(cond, pattern = "^muffle") [18:41:23.111] } [18:41:23.111] } [18:41:23.111] else { [18:41:23.111] if (TRUE) { [18:41:23.111] muffleCondition <- function (cond, pattern = "^muffle") [18:41:23.111] { [18:41:23.111] inherits <- base::inherits [18:41:23.111] invokeRestart <- base::invokeRestart [18:41:23.111] is.null <- base::is.null [18:41:23.111] muffled <- FALSE [18:41:23.111] if (inherits(cond, "message")) { [18:41:23.111] muffled <- grepl(pattern, "muffleMessage") [18:41:23.111] if (muffled) [18:41:23.111] invokeRestart("muffleMessage") [18:41:23.111] } [18:41:23.111] else if (inherits(cond, "warning")) { [18:41:23.111] muffled <- grepl(pattern, "muffleWarning") [18:41:23.111] if (muffled) [18:41:23.111] invokeRestart("muffleWarning") [18:41:23.111] } [18:41:23.111] else if (inherits(cond, "condition")) { [18:41:23.111] if (!is.null(pattern)) { [18:41:23.111] computeRestarts <- base::computeRestarts [18:41:23.111] grepl <- base::grepl [18:41:23.111] restarts <- computeRestarts(cond) [18:41:23.111] for (restart in restarts) { [18:41:23.111] name <- restart$name [18:41:23.111] if (is.null(name)) [18:41:23.111] next [18:41:23.111] if (!grepl(pattern, name)) [18:41:23.111] next [18:41:23.111] invokeRestart(restart) [18:41:23.111] muffled <- TRUE [18:41:23.111] break [18:41:23.111] } [18:41:23.111] } [18:41:23.111] } [18:41:23.111] invisible(muffled) [18:41:23.111] } [18:41:23.111] muffleCondition(cond, pattern = "^muffle") [18:41:23.111] } [18:41:23.111] } [18:41:23.111] } [18:41:23.111] })) [18:41:23.111] }, error = function(ex) { [18:41:23.111] base::structure(base::list(value = NULL, visible = NULL, [18:41:23.111] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:23.111] ...future.rng), started = ...future.startTime, [18:41:23.111] finished = Sys.time(), session_uuid = NA_character_, [18:41:23.111] version = "1.8"), class = "FutureResult") [18:41:23.111] }, finally = { [18:41:23.111] if (!identical(...future.workdir, getwd())) [18:41:23.111] setwd(...future.workdir) [18:41:23.111] { [18:41:23.111] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:23.111] ...future.oldOptions$nwarnings <- NULL [18:41:23.111] } [18:41:23.111] base::options(...future.oldOptions) [18:41:23.111] if (.Platform$OS.type == "windows") { [18:41:23.111] old_names <- names(...future.oldEnvVars) [18:41:23.111] envs <- base::Sys.getenv() [18:41:23.111] names <- names(envs) [18:41:23.111] common <- intersect(names, old_names) [18:41:23.111] added <- setdiff(names, old_names) [18:41:23.111] removed <- setdiff(old_names, names) [18:41:23.111] changed <- common[...future.oldEnvVars[common] != [18:41:23.111] envs[common]] [18:41:23.111] NAMES <- toupper(changed) [18:41:23.111] args <- list() [18:41:23.111] for (kk in seq_along(NAMES)) { [18:41:23.111] name <- changed[[kk]] [18:41:23.111] NAME <- NAMES[[kk]] [18:41:23.111] if (name != NAME && is.element(NAME, old_names)) [18:41:23.111] next [18:41:23.111] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:23.111] } [18:41:23.111] NAMES <- toupper(added) [18:41:23.111] for (kk in seq_along(NAMES)) { [18:41:23.111] name <- added[[kk]] [18:41:23.111] NAME <- NAMES[[kk]] [18:41:23.111] if (name != NAME && is.element(NAME, old_names)) [18:41:23.111] next [18:41:23.111] args[[name]] <- "" [18:41:23.111] } [18:41:23.111] NAMES <- toupper(removed) [18:41:23.111] for (kk in seq_along(NAMES)) { [18:41:23.111] name <- removed[[kk]] [18:41:23.111] NAME <- NAMES[[kk]] [18:41:23.111] if (name != NAME && is.element(NAME, old_names)) [18:41:23.111] next [18:41:23.111] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:23.111] } [18:41:23.111] if (length(args) > 0) [18:41:23.111] base::do.call(base::Sys.setenv, args = args) [18:41:23.111] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:23.111] } [18:41:23.111] else { [18:41:23.111] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:23.111] } [18:41:23.111] { [18:41:23.111] if (base::length(...future.futureOptionsAdded) > [18:41:23.111] 0L) { [18:41:23.111] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:23.111] base::names(opts) <- ...future.futureOptionsAdded [18:41:23.111] base::options(opts) [18:41:23.111] } [18:41:23.111] { [18:41:23.111] { [18:41:23.111] base::options(mc.cores = ...future.mc.cores.old) [18:41:23.111] NULL [18:41:23.111] } [18:41:23.111] options(future.plan = NULL) [18:41:23.111] if (is.na(NA_character_)) [18:41:23.111] Sys.unsetenv("R_FUTURE_PLAN") [18:41:23.111] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:23.111] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:23.111] .init = FALSE) [18:41:23.111] } [18:41:23.111] } [18:41:23.111] } [18:41:23.111] }) [18:41:23.111] if (TRUE) { [18:41:23.111] base::sink(type = "output", split = FALSE) [18:41:23.111] if (TRUE) { [18:41:23.111] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:23.111] } [18:41:23.111] else { [18:41:23.111] ...future.result["stdout"] <- base::list(NULL) [18:41:23.111] } [18:41:23.111] base::close(...future.stdout) [18:41:23.111] ...future.stdout <- NULL [18:41:23.111] } [18:41:23.111] ...future.result$conditions <- ...future.conditions [18:41:23.111] ...future.result$finished <- base::Sys.time() [18:41:23.111] ...future.result [18:41:23.111] } [18:41:23.116] Exporting 5 global objects (1.17 KiB) to cluster node #1 ... [18:41:23.117] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... [18:41:23.117] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... DONE [18:41:23.117] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... [18:41:23.118] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... DONE [18:41:23.118] Exporting '...future.elements_ii' (98 bytes) to cluster node #1 ... [18:41:23.118] Exporting '...future.elements_ii' (98 bytes) to cluster node #1 ... DONE [18:41:23.118] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:23.119] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:23.119] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:23.119] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:23.119] Exporting 5 global objects (1.17 KiB) to cluster node #1 ... DONE [18:41:23.120] MultisessionFuture started [18:41:23.120] - Launch lazy future ... done [18:41:23.120] run() for 'MultisessionFuture' ... done [18:41:23.121] Created future: [18:41:23.133] receiveMessageFromWorker() for ClusterFuture ... [18:41:23.134] - Validating connection of MultisessionFuture [18:41:23.134] - received message: FutureResult [18:41:23.134] - Received FutureResult [18:41:23.134] - Erased future from FutureRegistry [18:41:23.135] result() for ClusterFuture ... [18:41:23.135] - result already collected: FutureResult [18:41:23.135] result() for ClusterFuture ... done [18:41:23.135] receiveMessageFromWorker() for ClusterFuture ... done [18:41:23.121] MultisessionFuture: [18:41:23.121] Label: 'future_lapply-3' [18:41:23.121] Expression: [18:41:23.121] { [18:41:23.121] do.call(function(...) { [18:41:23.121] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:23.121] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:23.121] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:23.121] on.exit(options(oopts), add = TRUE) [18:41:23.121] } [18:41:23.121] { [18:41:23.121] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:23.121] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:23.121] ...future.FUN(...future.X_jj, ...) [18:41:23.121] }) [18:41:23.121] } [18:41:23.121] }, args = future.call.arguments) [18:41:23.121] } [18:41:23.121] Lazy evaluation: FALSE [18:41:23.121] Asynchronous evaluation: TRUE [18:41:23.121] Local evaluation: TRUE [18:41:23.121] Environment: R_GlobalEnv [18:41:23.121] Capture standard output: TRUE [18:41:23.121] Capture condition classes: 'condition' (excluding 'nothing') [18:41:23.121] Globals: 5 objects totaling 760 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 98 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:23.121] Packages: [18:41:23.121] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:23.121] Resolved: TRUE [18:41:23.121] Value: [18:41:23.121] Conditions captured: [18:41:23.121] Early signaling: FALSE [18:41:23.121] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:23.121] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:23.135] Chunk #3 of 4 ... DONE [18:41:23.136] Chunk #4 of 4 ... [18:41:23.136] - Finding globals in 'X' for chunk #4 ... [18:41:23.136] getGlobalsAndPackages() ... [18:41:23.136] Searching for globals... [18:41:23.136] [18:41:23.137] Searching for globals ... DONE [18:41:23.137] - globals: [0] [18:41:23.137] getGlobalsAndPackages() ... DONE [18:41:23.137] + additional globals found: [n=0] [18:41:23.137] + additional namespaces needed: [n=0] [18:41:23.137] - Finding globals in 'X' for chunk #4 ... DONE [18:41:23.137] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:23.138] - seeds: [18:41:23.138] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:23.138] getGlobalsAndPackages() ... [18:41:23.138] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:23.138] Resolving globals: FALSE [18:41:23.139] Tweak future expression to call with '...' arguments ... [18:41:23.139] { [18:41:23.139] do.call(function(...) { [18:41:23.139] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:23.139] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:23.139] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:23.139] on.exit(options(oopts), add = TRUE) [18:41:23.139] } [18:41:23.139] { [18:41:23.139] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:23.139] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:23.139] ...future.FUN(...future.X_jj, ...) [18:41:23.139] }) [18:41:23.139] } [18:41:23.139] }, args = future.call.arguments) [18:41:23.139] } [18:41:23.139] Tweak future expression to call with '...' arguments ... DONE [18:41:23.140] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:23.140] [18:41:23.140] getGlobalsAndPackages() ... DONE [18:41:23.140] run() for 'Future' ... [18:41:23.141] - state: 'created' [18:41:23.141] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:23.157] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:23.157] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:23.157] - Field: 'node' [18:41:23.157] - Field: 'label' [18:41:23.158] - Field: 'local' [18:41:23.158] - Field: 'owner' [18:41:23.158] - Field: 'envir' [18:41:23.158] - Field: 'workers' [18:41:23.158] - Field: 'packages' [18:41:23.158] - Field: 'gc' [18:41:23.159] - Field: 'conditions' [18:41:23.159] - Field: 'persistent' [18:41:23.159] - Field: 'expr' [18:41:23.159] - Field: 'uuid' [18:41:23.159] - Field: 'seed' [18:41:23.160] - Field: 'version' [18:41:23.160] - Field: 'result' [18:41:23.160] - Field: 'asynchronous' [18:41:23.160] - Field: 'calls' [18:41:23.160] - Field: 'globals' [18:41:23.160] - Field: 'stdout' [18:41:23.161] - Field: 'earlySignal' [18:41:23.161] - Field: 'lazy' [18:41:23.161] - Field: 'state' [18:41:23.161] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:23.161] - Launch lazy future ... [18:41:23.162] Packages needed by the future expression (n = 0): [18:41:23.162] Packages needed by future strategies (n = 0): [18:41:23.162] { [18:41:23.162] { [18:41:23.162] { [18:41:23.162] ...future.startTime <- base::Sys.time() [18:41:23.162] { [18:41:23.162] { [18:41:23.162] { [18:41:23.162] { [18:41:23.162] base::local({ [18:41:23.162] has_future <- base::requireNamespace("future", [18:41:23.162] quietly = TRUE) [18:41:23.162] if (has_future) { [18:41:23.162] ns <- base::getNamespace("future") [18:41:23.162] version <- ns[[".package"]][["version"]] [18:41:23.162] if (is.null(version)) [18:41:23.162] version <- utils::packageVersion("future") [18:41:23.162] } [18:41:23.162] else { [18:41:23.162] version <- NULL [18:41:23.162] } [18:41:23.162] if (!has_future || version < "1.8.0") { [18:41:23.162] info <- base::c(r_version = base::gsub("R version ", [18:41:23.162] "", base::R.version$version.string), [18:41:23.162] platform = base::sprintf("%s (%s-bit)", [18:41:23.162] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:23.162] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:23.162] "release", "version")], collapse = " "), [18:41:23.162] hostname = base::Sys.info()[["nodename"]]) [18:41:23.162] info <- base::sprintf("%s: %s", base::names(info), [18:41:23.162] info) [18:41:23.162] info <- base::paste(info, collapse = "; ") [18:41:23.162] if (!has_future) { [18:41:23.162] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:23.162] info) [18:41:23.162] } [18:41:23.162] else { [18:41:23.162] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:23.162] info, version) [18:41:23.162] } [18:41:23.162] base::stop(msg) [18:41:23.162] } [18:41:23.162] }) [18:41:23.162] } [18:41:23.162] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:23.162] base::options(mc.cores = 1L) [18:41:23.162] } [18:41:23.162] ...future.strategy.old <- future::plan("list") [18:41:23.162] options(future.plan = NULL) [18:41:23.162] Sys.unsetenv("R_FUTURE_PLAN") [18:41:23.162] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:23.162] } [18:41:23.162] ...future.workdir <- getwd() [18:41:23.162] } [18:41:23.162] ...future.oldOptions <- base::as.list(base::.Options) [18:41:23.162] ...future.oldEnvVars <- base::Sys.getenv() [18:41:23.162] } [18:41:23.162] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:23.162] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:23.162] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:23.162] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:23.162] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:23.162] future.stdout.windows.reencode = NULL, width = 80L) [18:41:23.162] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:23.162] base::names(...future.oldOptions)) [18:41:23.162] } [18:41:23.162] if (FALSE) { [18:41:23.162] } [18:41:23.162] else { [18:41:23.162] if (TRUE) { [18:41:23.162] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:23.162] open = "w") [18:41:23.162] } [18:41:23.162] else { [18:41:23.162] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:23.162] windows = "NUL", "/dev/null"), open = "w") [18:41:23.162] } [18:41:23.162] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:23.162] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:23.162] base::sink(type = "output", split = FALSE) [18:41:23.162] base::close(...future.stdout) [18:41:23.162] }, add = TRUE) [18:41:23.162] } [18:41:23.162] ...future.frame <- base::sys.nframe() [18:41:23.162] ...future.conditions <- base::list() [18:41:23.162] ...future.rng <- base::globalenv()$.Random.seed [18:41:23.162] if (FALSE) { [18:41:23.162] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:23.162] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:23.162] } [18:41:23.162] ...future.result <- base::tryCatch({ [18:41:23.162] base::withCallingHandlers({ [18:41:23.162] ...future.value <- base::withVisible(base::local({ [18:41:23.162] ...future.makeSendCondition <- base::local({ [18:41:23.162] sendCondition <- NULL [18:41:23.162] function(frame = 1L) { [18:41:23.162] if (is.function(sendCondition)) [18:41:23.162] return(sendCondition) [18:41:23.162] ns <- getNamespace("parallel") [18:41:23.162] if (exists("sendData", mode = "function", [18:41:23.162] envir = ns)) { [18:41:23.162] parallel_sendData <- get("sendData", mode = "function", [18:41:23.162] envir = ns) [18:41:23.162] envir <- sys.frame(frame) [18:41:23.162] master <- NULL [18:41:23.162] while (!identical(envir, .GlobalEnv) && [18:41:23.162] !identical(envir, emptyenv())) { [18:41:23.162] if (exists("master", mode = "list", envir = envir, [18:41:23.162] inherits = FALSE)) { [18:41:23.162] master <- get("master", mode = "list", [18:41:23.162] envir = envir, inherits = FALSE) [18:41:23.162] if (inherits(master, c("SOCKnode", [18:41:23.162] "SOCK0node"))) { [18:41:23.162] sendCondition <<- function(cond) { [18:41:23.162] data <- list(type = "VALUE", value = cond, [18:41:23.162] success = TRUE) [18:41:23.162] parallel_sendData(master, data) [18:41:23.162] } [18:41:23.162] return(sendCondition) [18:41:23.162] } [18:41:23.162] } [18:41:23.162] frame <- frame + 1L [18:41:23.162] envir <- sys.frame(frame) [18:41:23.162] } [18:41:23.162] } [18:41:23.162] sendCondition <<- function(cond) NULL [18:41:23.162] } [18:41:23.162] }) [18:41:23.162] withCallingHandlers({ [18:41:23.162] { [18:41:23.162] do.call(function(...) { [18:41:23.162] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:23.162] if (!identical(...future.globals.maxSize.org, [18:41:23.162] ...future.globals.maxSize)) { [18:41:23.162] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:23.162] on.exit(options(oopts), add = TRUE) [18:41:23.162] } [18:41:23.162] { [18:41:23.162] lapply(seq_along(...future.elements_ii), [18:41:23.162] FUN = function(jj) { [18:41:23.162] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:23.162] ...future.FUN(...future.X_jj, ...) [18:41:23.162] }) [18:41:23.162] } [18:41:23.162] }, args = future.call.arguments) [18:41:23.162] } [18:41:23.162] }, immediateCondition = function(cond) { [18:41:23.162] sendCondition <- ...future.makeSendCondition() [18:41:23.162] sendCondition(cond) [18:41:23.162] muffleCondition <- function (cond, pattern = "^muffle") [18:41:23.162] { [18:41:23.162] inherits <- base::inherits [18:41:23.162] invokeRestart <- base::invokeRestart [18:41:23.162] is.null <- base::is.null [18:41:23.162] muffled <- FALSE [18:41:23.162] if (inherits(cond, "message")) { [18:41:23.162] muffled <- grepl(pattern, "muffleMessage") [18:41:23.162] if (muffled) [18:41:23.162] invokeRestart("muffleMessage") [18:41:23.162] } [18:41:23.162] else if (inherits(cond, "warning")) { [18:41:23.162] muffled <- grepl(pattern, "muffleWarning") [18:41:23.162] if (muffled) [18:41:23.162] invokeRestart("muffleWarning") [18:41:23.162] } [18:41:23.162] else if (inherits(cond, "condition")) { [18:41:23.162] if (!is.null(pattern)) { [18:41:23.162] computeRestarts <- base::computeRestarts [18:41:23.162] grepl <- base::grepl [18:41:23.162] restarts <- computeRestarts(cond) [18:41:23.162] for (restart in restarts) { [18:41:23.162] name <- restart$name [18:41:23.162] if (is.null(name)) [18:41:23.162] next [18:41:23.162] if (!grepl(pattern, name)) [18:41:23.162] next [18:41:23.162] invokeRestart(restart) [18:41:23.162] muffled <- TRUE [18:41:23.162] break [18:41:23.162] } [18:41:23.162] } [18:41:23.162] } [18:41:23.162] invisible(muffled) [18:41:23.162] } [18:41:23.162] muffleCondition(cond) [18:41:23.162] }) [18:41:23.162] })) [18:41:23.162] future::FutureResult(value = ...future.value$value, [18:41:23.162] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:23.162] ...future.rng), globalenv = if (FALSE) [18:41:23.162] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:23.162] ...future.globalenv.names)) [18:41:23.162] else NULL, started = ...future.startTime, version = "1.8") [18:41:23.162] }, condition = base::local({ [18:41:23.162] c <- base::c [18:41:23.162] inherits <- base::inherits [18:41:23.162] invokeRestart <- base::invokeRestart [18:41:23.162] length <- base::length [18:41:23.162] list <- base::list [18:41:23.162] seq.int <- base::seq.int [18:41:23.162] signalCondition <- base::signalCondition [18:41:23.162] sys.calls <- base::sys.calls [18:41:23.162] `[[` <- base::`[[` [18:41:23.162] `+` <- base::`+` [18:41:23.162] `<<-` <- base::`<<-` [18:41:23.162] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:23.162] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:23.162] 3L)] [18:41:23.162] } [18:41:23.162] function(cond) { [18:41:23.162] is_error <- inherits(cond, "error") [18:41:23.162] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:23.162] NULL) [18:41:23.162] if (is_error) { [18:41:23.162] sessionInformation <- function() { [18:41:23.162] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:23.162] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:23.162] search = base::search(), system = base::Sys.info()) [18:41:23.162] } [18:41:23.162] ...future.conditions[[length(...future.conditions) + [18:41:23.162] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:23.162] cond$call), session = sessionInformation(), [18:41:23.162] timestamp = base::Sys.time(), signaled = 0L) [18:41:23.162] signalCondition(cond) [18:41:23.162] } [18:41:23.162] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:23.162] "immediateCondition"))) { [18:41:23.162] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:23.162] ...future.conditions[[length(...future.conditions) + [18:41:23.162] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:23.162] if (TRUE && !signal) { [18:41:23.162] muffleCondition <- function (cond, pattern = "^muffle") [18:41:23.162] { [18:41:23.162] inherits <- base::inherits [18:41:23.162] invokeRestart <- base::invokeRestart [18:41:23.162] is.null <- base::is.null [18:41:23.162] muffled <- FALSE [18:41:23.162] if (inherits(cond, "message")) { [18:41:23.162] muffled <- grepl(pattern, "muffleMessage") [18:41:23.162] if (muffled) [18:41:23.162] invokeRestart("muffleMessage") [18:41:23.162] } [18:41:23.162] else if (inherits(cond, "warning")) { [18:41:23.162] muffled <- grepl(pattern, "muffleWarning") [18:41:23.162] if (muffled) [18:41:23.162] invokeRestart("muffleWarning") [18:41:23.162] } [18:41:23.162] else if (inherits(cond, "condition")) { [18:41:23.162] if (!is.null(pattern)) { [18:41:23.162] computeRestarts <- base::computeRestarts [18:41:23.162] grepl <- base::grepl [18:41:23.162] restarts <- computeRestarts(cond) [18:41:23.162] for (restart in restarts) { [18:41:23.162] name <- restart$name [18:41:23.162] if (is.null(name)) [18:41:23.162] next [18:41:23.162] if (!grepl(pattern, name)) [18:41:23.162] next [18:41:23.162] invokeRestart(restart) [18:41:23.162] muffled <- TRUE [18:41:23.162] break [18:41:23.162] } [18:41:23.162] } [18:41:23.162] } [18:41:23.162] invisible(muffled) [18:41:23.162] } [18:41:23.162] muffleCondition(cond, pattern = "^muffle") [18:41:23.162] } [18:41:23.162] } [18:41:23.162] else { [18:41:23.162] if (TRUE) { [18:41:23.162] muffleCondition <- function (cond, pattern = "^muffle") [18:41:23.162] { [18:41:23.162] inherits <- base::inherits [18:41:23.162] invokeRestart <- base::invokeRestart [18:41:23.162] is.null <- base::is.null [18:41:23.162] muffled <- FALSE [18:41:23.162] if (inherits(cond, "message")) { [18:41:23.162] muffled <- grepl(pattern, "muffleMessage") [18:41:23.162] if (muffled) [18:41:23.162] invokeRestart("muffleMessage") [18:41:23.162] } [18:41:23.162] else if (inherits(cond, "warning")) { [18:41:23.162] muffled <- grepl(pattern, "muffleWarning") [18:41:23.162] if (muffled) [18:41:23.162] invokeRestart("muffleWarning") [18:41:23.162] } [18:41:23.162] else if (inherits(cond, "condition")) { [18:41:23.162] if (!is.null(pattern)) { [18:41:23.162] computeRestarts <- base::computeRestarts [18:41:23.162] grepl <- base::grepl [18:41:23.162] restarts <- computeRestarts(cond) [18:41:23.162] for (restart in restarts) { [18:41:23.162] name <- restart$name [18:41:23.162] if (is.null(name)) [18:41:23.162] next [18:41:23.162] if (!grepl(pattern, name)) [18:41:23.162] next [18:41:23.162] invokeRestart(restart) [18:41:23.162] muffled <- TRUE [18:41:23.162] break [18:41:23.162] } [18:41:23.162] } [18:41:23.162] } [18:41:23.162] invisible(muffled) [18:41:23.162] } [18:41:23.162] muffleCondition(cond, pattern = "^muffle") [18:41:23.162] } [18:41:23.162] } [18:41:23.162] } [18:41:23.162] })) [18:41:23.162] }, error = function(ex) { [18:41:23.162] base::structure(base::list(value = NULL, visible = NULL, [18:41:23.162] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:23.162] ...future.rng), started = ...future.startTime, [18:41:23.162] finished = Sys.time(), session_uuid = NA_character_, [18:41:23.162] version = "1.8"), class = "FutureResult") [18:41:23.162] }, finally = { [18:41:23.162] if (!identical(...future.workdir, getwd())) [18:41:23.162] setwd(...future.workdir) [18:41:23.162] { [18:41:23.162] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:23.162] ...future.oldOptions$nwarnings <- NULL [18:41:23.162] } [18:41:23.162] base::options(...future.oldOptions) [18:41:23.162] if (.Platform$OS.type == "windows") { [18:41:23.162] old_names <- names(...future.oldEnvVars) [18:41:23.162] envs <- base::Sys.getenv() [18:41:23.162] names <- names(envs) [18:41:23.162] common <- intersect(names, old_names) [18:41:23.162] added <- setdiff(names, old_names) [18:41:23.162] removed <- setdiff(old_names, names) [18:41:23.162] changed <- common[...future.oldEnvVars[common] != [18:41:23.162] envs[common]] [18:41:23.162] NAMES <- toupper(changed) [18:41:23.162] args <- list() [18:41:23.162] for (kk in seq_along(NAMES)) { [18:41:23.162] name <- changed[[kk]] [18:41:23.162] NAME <- NAMES[[kk]] [18:41:23.162] if (name != NAME && is.element(NAME, old_names)) [18:41:23.162] next [18:41:23.162] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:23.162] } [18:41:23.162] NAMES <- toupper(added) [18:41:23.162] for (kk in seq_along(NAMES)) { [18:41:23.162] name <- added[[kk]] [18:41:23.162] NAME <- NAMES[[kk]] [18:41:23.162] if (name != NAME && is.element(NAME, old_names)) [18:41:23.162] next [18:41:23.162] args[[name]] <- "" [18:41:23.162] } [18:41:23.162] NAMES <- toupper(removed) [18:41:23.162] for (kk in seq_along(NAMES)) { [18:41:23.162] name <- removed[[kk]] [18:41:23.162] NAME <- NAMES[[kk]] [18:41:23.162] if (name != NAME && is.element(NAME, old_names)) [18:41:23.162] next [18:41:23.162] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:23.162] } [18:41:23.162] if (length(args) > 0) [18:41:23.162] base::do.call(base::Sys.setenv, args = args) [18:41:23.162] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:23.162] } [18:41:23.162] else { [18:41:23.162] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:23.162] } [18:41:23.162] { [18:41:23.162] if (base::length(...future.futureOptionsAdded) > [18:41:23.162] 0L) { [18:41:23.162] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:23.162] base::names(opts) <- ...future.futureOptionsAdded [18:41:23.162] base::options(opts) [18:41:23.162] } [18:41:23.162] { [18:41:23.162] { [18:41:23.162] base::options(mc.cores = ...future.mc.cores.old) [18:41:23.162] NULL [18:41:23.162] } [18:41:23.162] options(future.plan = NULL) [18:41:23.162] if (is.na(NA_character_)) [18:41:23.162] Sys.unsetenv("R_FUTURE_PLAN") [18:41:23.162] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:23.162] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:23.162] .init = FALSE) [18:41:23.162] } [18:41:23.162] } [18:41:23.162] } [18:41:23.162] }) [18:41:23.162] if (TRUE) { [18:41:23.162] base::sink(type = "output", split = FALSE) [18:41:23.162] if (TRUE) { [18:41:23.162] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:23.162] } [18:41:23.162] else { [18:41:23.162] ...future.result["stdout"] <- base::list(NULL) [18:41:23.162] } [18:41:23.162] base::close(...future.stdout) [18:41:23.162] ...future.stdout <- NULL [18:41:23.162] } [18:41:23.162] ...future.result$conditions <- ...future.conditions [18:41:23.162] ...future.result$finished <- base::Sys.time() [18:41:23.162] ...future.result [18:41:23.162] } [18:41:23.168] Exporting 5 global objects (1.16 KiB) to cluster node #1 ... [18:41:23.168] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... [18:41:23.168] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... DONE [18:41:23.168] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... [18:41:23.169] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... DONE [18:41:23.169] Exporting '...future.elements_ii' (93 bytes) to cluster node #1 ... [18:41:23.169] Exporting '...future.elements_ii' (93 bytes) to cluster node #1 ... DONE [18:41:23.170] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:23.170] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:23.170] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:23.171] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:23.171] Exporting 5 global objects (1.16 KiB) to cluster node #1 ... DONE [18:41:23.171] MultisessionFuture started [18:41:23.171] - Launch lazy future ... done [18:41:23.172] run() for 'MultisessionFuture' ... done [18:41:23.172] Created future: [18:41:23.186] receiveMessageFromWorker() for ClusterFuture ... [18:41:23.186] - Validating connection of MultisessionFuture [18:41:23.186] - received message: FutureResult [18:41:23.187] - Received FutureResult [18:41:23.187] - Erased future from FutureRegistry [18:41:23.187] result() for ClusterFuture ... [18:41:23.187] - result already collected: FutureResult [18:41:23.187] result() for ClusterFuture ... done [18:41:23.187] receiveMessageFromWorker() for ClusterFuture ... done [18:41:23.172] MultisessionFuture: [18:41:23.172] Label: 'future_lapply-4' [18:41:23.172] Expression: [18:41:23.172] { [18:41:23.172] do.call(function(...) { [18:41:23.172] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:23.172] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:23.172] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:23.172] on.exit(options(oopts), add = TRUE) [18:41:23.172] } [18:41:23.172] { [18:41:23.172] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:23.172] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:23.172] ...future.FUN(...future.X_jj, ...) [18:41:23.172] }) [18:41:23.172] } [18:41:23.172] }, args = future.call.arguments) [18:41:23.172] } [18:41:23.172] Lazy evaluation: FALSE [18:41:23.172] Asynchronous evaluation: TRUE [18:41:23.172] Local evaluation: TRUE [18:41:23.172] Environment: R_GlobalEnv [18:41:23.172] Capture standard output: TRUE [18:41:23.172] Capture condition classes: 'condition' (excluding 'nothing') [18:41:23.172] Globals: 5 objects totaling 755 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 93 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:23.172] Packages: [18:41:23.172] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:23.172] Resolved: TRUE [18:41:23.172] Value: [18:41:23.172] Conditions captured: [18:41:23.172] Early signaling: FALSE [18:41:23.172] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:23.172] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:23.188] Chunk #4 of 4 ... DONE [18:41:23.188] Launching 4 futures (chunks) ... DONE [18:41:23.188] Resolving 4 futures (chunks) ... [18:41:23.188] resolve() on list ... [18:41:23.188] recursive: 0 [18:41:23.189] length: 4 [18:41:23.189] [18:41:23.189] Future #1 [18:41:23.189] result() for ClusterFuture ... [18:41:23.189] - result already collected: FutureResult [18:41:23.190] result() for ClusterFuture ... done [18:41:23.190] result() for ClusterFuture ... [18:41:23.190] - result already collected: FutureResult [18:41:23.190] result() for ClusterFuture ... done [18:41:23.190] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:23.190] - nx: 4 [18:41:23.191] - relay: TRUE [18:41:23.191] - stdout: TRUE [18:41:23.191] - signal: TRUE [18:41:23.191] - resignal: FALSE [18:41:23.191] - force: TRUE [18:41:23.191] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [18:41:23.191] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:41:23.192] - until=1 [18:41:23.192] - relaying element #1 [18:41:23.192] result() for ClusterFuture ... [18:41:23.192] - result already collected: FutureResult [18:41:23.192] result() for ClusterFuture ... done [18:41:23.192] result() for ClusterFuture ... [18:41:23.193] - result already collected: FutureResult [18:41:23.193] result() for ClusterFuture ... done [18:41:23.193] result() for ClusterFuture ... [18:41:23.193] - result already collected: FutureResult [18:41:23.193] result() for ClusterFuture ... done [18:41:23.193] result() for ClusterFuture ... [18:41:23.194] - result already collected: FutureResult [18:41:23.194] result() for ClusterFuture ... done [18:41:23.194] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:23.194] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:23.194] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:23.194] length: 3 (resolved future 1) [18:41:23.195] Future #2 [18:41:23.195] result() for ClusterFuture ... [18:41:23.195] - result already collected: FutureResult [18:41:23.195] result() for ClusterFuture ... done [18:41:23.195] result() for ClusterFuture ... [18:41:23.195] - result already collected: FutureResult [18:41:23.195] result() for ClusterFuture ... done [18:41:23.196] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:23.196] - nx: 4 [18:41:23.196] - relay: TRUE [18:41:23.196] - stdout: TRUE [18:41:23.196] - signal: TRUE [18:41:23.196] - resignal: FALSE [18:41:23.197] - force: TRUE [18:41:23.197] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:23.197] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:23.197] - until=2 [18:41:23.197] - relaying element #2 [18:41:23.197] result() for ClusterFuture ... [18:41:23.197] - result already collected: FutureResult [18:41:23.198] result() for ClusterFuture ... done [18:41:23.198] result() for ClusterFuture ... [18:41:23.198] - result already collected: FutureResult [18:41:23.198] result() for ClusterFuture ... done [18:41:23.198] result() for ClusterFuture ... [18:41:23.198] - result already collected: FutureResult [18:41:23.199] result() for ClusterFuture ... done [18:41:23.199] result() for ClusterFuture ... [18:41:23.199] - result already collected: FutureResult [18:41:23.199] result() for ClusterFuture ... done [18:41:23.199] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:23.199] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:23.200] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:23.200] length: 2 (resolved future 2) [18:41:23.200] Future #3 [18:41:23.200] result() for ClusterFuture ... [18:41:23.200] - result already collected: FutureResult [18:41:23.200] result() for ClusterFuture ... done [18:41:23.201] result() for ClusterFuture ... [18:41:23.201] - result already collected: FutureResult [18:41:23.201] result() for ClusterFuture ... done [18:41:23.201] signalConditionsASAP(MultisessionFuture, pos=3) ... [18:41:23.201] - nx: 4 [18:41:23.201] - relay: TRUE [18:41:23.201] - stdout: TRUE [18:41:23.202] - signal: TRUE [18:41:23.202] - resignal: FALSE [18:41:23.202] - force: TRUE [18:41:23.202] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:23.202] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:23.202] - until=3 [18:41:23.203] - relaying element #3 [18:41:23.203] result() for ClusterFuture ... [18:41:23.203] - result already collected: FutureResult [18:41:23.203] result() for ClusterFuture ... done [18:41:23.203] result() for ClusterFuture ... [18:41:23.203] - result already collected: FutureResult [18:41:23.203] result() for ClusterFuture ... done [18:41:23.204] result() for ClusterFuture ... [18:41:23.204] - result already collected: FutureResult [18:41:23.204] result() for ClusterFuture ... done [18:41:23.204] result() for ClusterFuture ... [18:41:23.204] - result already collected: FutureResult [18:41:23.204] result() for ClusterFuture ... done [18:41:23.205] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:23.205] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:23.205] signalConditionsASAP(MultisessionFuture, pos=3) ... done [18:41:23.205] length: 1 (resolved future 3) [18:41:23.205] Future #4 [18:41:23.205] result() for ClusterFuture ... [18:41:23.206] - result already collected: FutureResult [18:41:23.206] result() for ClusterFuture ... done [18:41:23.206] result() for ClusterFuture ... [18:41:23.206] - result already collected: FutureResult [18:41:23.206] result() for ClusterFuture ... done [18:41:23.206] signalConditionsASAP(MultisessionFuture, pos=4) ... [18:41:23.207] - nx: 4 [18:41:23.207] - relay: TRUE [18:41:23.207] - stdout: TRUE [18:41:23.207] - signal: TRUE [18:41:23.207] - resignal: FALSE [18:41:23.207] - force: TRUE [18:41:23.207] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:23.208] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:23.208] - until=4 [18:41:23.208] - relaying element #4 [18:41:23.208] result() for ClusterFuture ... [18:41:23.208] - result already collected: FutureResult [18:41:23.208] result() for ClusterFuture ... done [18:41:23.209] result() for ClusterFuture ... [18:41:23.209] - result already collected: FutureResult [18:41:23.209] result() for ClusterFuture ... done [18:41:23.209] result() for ClusterFuture ... [18:41:23.209] - result already collected: FutureResult [18:41:23.209] result() for ClusterFuture ... done [18:41:23.210] result() for ClusterFuture ... [18:41:23.210] - result already collected: FutureResult [18:41:23.210] result() for ClusterFuture ... done [18:41:23.210] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:23.210] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:23.210] signalConditionsASAP(MultisessionFuture, pos=4) ... done [18:41:23.210] length: 0 (resolved future 4) [18:41:23.211] Relaying remaining futures [18:41:23.211] signalConditionsASAP(NULL, pos=0) ... [18:41:23.211] - nx: 4 [18:41:23.211] - relay: TRUE [18:41:23.211] - stdout: TRUE [18:41:23.211] - signal: TRUE [18:41:23.212] - resignal: FALSE [18:41:23.212] - force: TRUE [18:41:23.212] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:23.212] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [18:41:23.212] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:23.212] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:23.213] signalConditionsASAP(NULL, pos=0) ... done [18:41:23.213] resolve() on list ... DONE [18:41:23.213] result() for ClusterFuture ... [18:41:23.213] - result already collected: FutureResult [18:41:23.213] result() for ClusterFuture ... done [18:41:23.213] result() for ClusterFuture ... [18:41:23.213] - result already collected: FutureResult [18:41:23.214] result() for ClusterFuture ... done [18:41:23.214] result() for ClusterFuture ... [18:41:23.214] - result already collected: FutureResult [18:41:23.214] result() for ClusterFuture ... done [18:41:23.214] result() for ClusterFuture ... [18:41:23.214] - result already collected: FutureResult [18:41:23.215] result() for ClusterFuture ... done [18:41:23.215] result() for ClusterFuture ... [18:41:23.215] - result already collected: FutureResult [18:41:23.215] result() for ClusterFuture ... done [18:41:23.215] result() for ClusterFuture ... [18:41:23.215] - result already collected: FutureResult [18:41:23.215] result() for ClusterFuture ... done [18:41:23.216] result() for ClusterFuture ... [18:41:23.216] - result already collected: FutureResult [18:41:23.216] result() for ClusterFuture ... done [18:41:23.216] result() for ClusterFuture ... [18:41:23.216] - result already collected: FutureResult [18:41:23.216] result() for ClusterFuture ... done [18:41:23.217] - Number of value chunks collected: 4 [18:41:23.217] Resolving 4 futures (chunks) ... DONE [18:41:23.217] Reducing values from 4 chunks ... [18:41:23.217] - Number of values collected after concatenation: 4 [18:41:23.217] - Number of values expected: 4 [18:41:23.217] Reducing values from 4 chunks ... DONE [18:41:23.218] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL [18:41:23.220] future_lapply() ... [18:41:23.223] Number of chunks: 4 [18:41:23.224] getGlobalsAndPackagesXApply() ... [18:41:23.224] - future.globals: TRUE [18:41:23.224] getGlobalsAndPackages() ... [18:41:23.224] Searching for globals... [18:41:23.225] - globals found: [2] 'FUN', '.Internal' [18:41:23.226] Searching for globals ... DONE [18:41:23.226] Resolving globals: FALSE [18:41:23.226] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:23.227] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:23.227] - globals: [1] 'FUN' [18:41:23.227] [18:41:23.227] getGlobalsAndPackages() ... DONE [18:41:23.227] - globals found/used: [n=1] 'FUN' [18:41:23.228] - needed namespaces: [n=0] [18:41:23.228] Finding globals ... DONE [18:41:23.228] - use_args: TRUE [18:41:23.228] - Getting '...' globals ... [18:41:23.229] resolve() on list ... [18:41:23.229] recursive: 0 [18:41:23.229] length: 1 [18:41:23.229] elements: '...' [18:41:23.229] length: 0 (resolved future 1) [18:41:23.229] resolve() on list ... DONE [18:41:23.230] - '...' content: [n=1] 'length' [18:41:23.230] List of 1 [18:41:23.230] $ ...:List of 1 [18:41:23.230] ..$ length: int 2 [18:41:23.230] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:23.230] - attr(*, "where")=List of 1 [18:41:23.230] ..$ ...: [18:41:23.230] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:23.230] - attr(*, "resolved")= logi TRUE [18:41:23.230] - attr(*, "total_size")= num NA [18:41:23.233] - Getting '...' globals ... DONE [18:41:23.233] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:23.234] List of 2 [18:41:23.234] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:23.234] $ ... :List of 1 [18:41:23.234] ..$ length: int 2 [18:41:23.234] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:23.234] - attr(*, "where")=List of 2 [18:41:23.234] ..$ ...future.FUN: [18:41:23.234] ..$ ... : [18:41:23.234] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:23.234] - attr(*, "resolved")= logi FALSE [18:41:23.234] - attr(*, "total_size")= int 4324 [18:41:23.238] Packages to be attached in all futures: [n=0] [18:41:23.238] getGlobalsAndPackagesXApply() ... DONE [18:41:23.238] Number of futures (= number of chunks): 4 [18:41:23.238] Launching 4 futures (chunks) ... [18:41:23.238] Chunk #1 of 4 ... [18:41:23.239] - Finding globals in 'X' for chunk #1 ... [18:41:23.239] getGlobalsAndPackages() ... [18:41:23.239] Searching for globals... [18:41:23.239] [18:41:23.239] Searching for globals ... DONE [18:41:23.240] - globals: [0] [18:41:23.240] getGlobalsAndPackages() ... DONE [18:41:23.240] + additional globals found: [n=0] [18:41:23.240] + additional namespaces needed: [n=0] [18:41:23.240] - Finding globals in 'X' for chunk #1 ... DONE [18:41:23.240] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:23.241] - seeds: [18:41:23.241] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:23.241] getGlobalsAndPackages() ... [18:41:23.241] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:23.241] Resolving globals: FALSE [18:41:23.241] Tweak future expression to call with '...' arguments ... [18:41:23.242] { [18:41:23.242] do.call(function(...) { [18:41:23.242] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:23.242] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:23.242] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:23.242] on.exit(options(oopts), add = TRUE) [18:41:23.242] } [18:41:23.242] { [18:41:23.242] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:23.242] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:23.242] ...future.FUN(...future.X_jj, ...) [18:41:23.242] }) [18:41:23.242] } [18:41:23.242] }, args = future.call.arguments) [18:41:23.242] } [18:41:23.242] Tweak future expression to call with '...' arguments ... DONE [18:41:23.243] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:23.243] [18:41:23.243] getGlobalsAndPackages() ... DONE [18:41:23.243] run() for 'Future' ... [18:41:23.243] - state: 'created' [18:41:23.244] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:23.259] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:23.259] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:23.259] - Field: 'node' [18:41:23.259] - Field: 'label' [18:41:23.260] - Field: 'local' [18:41:23.260] - Field: 'owner' [18:41:23.260] - Field: 'envir' [18:41:23.262] - Field: 'workers' [18:41:23.262] - Field: 'packages' [18:41:23.263] - Field: 'gc' [18:41:23.263] - Field: 'conditions' [18:41:23.263] - Field: 'persistent' [18:41:23.263] - Field: 'expr' [18:41:23.263] - Field: 'uuid' [18:41:23.263] - Field: 'seed' [18:41:23.264] - Field: 'version' [18:41:23.264] - Field: 'result' [18:41:23.264] - Field: 'asynchronous' [18:41:23.264] - Field: 'calls' [18:41:23.264] - Field: 'globals' [18:41:23.265] - Field: 'stdout' [18:41:23.265] - Field: 'earlySignal' [18:41:23.265] - Field: 'lazy' [18:41:23.265] - Field: 'state' [18:41:23.265] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:23.265] - Launch lazy future ... [18:41:23.266] Packages needed by the future expression (n = 0): [18:41:23.266] Packages needed by future strategies (n = 0): [18:41:23.266] { [18:41:23.266] { [18:41:23.266] { [18:41:23.266] ...future.startTime <- base::Sys.time() [18:41:23.266] { [18:41:23.266] { [18:41:23.266] { [18:41:23.266] { [18:41:23.266] base::local({ [18:41:23.266] has_future <- base::requireNamespace("future", [18:41:23.266] quietly = TRUE) [18:41:23.266] if (has_future) { [18:41:23.266] ns <- base::getNamespace("future") [18:41:23.266] version <- ns[[".package"]][["version"]] [18:41:23.266] if (is.null(version)) [18:41:23.266] version <- utils::packageVersion("future") [18:41:23.266] } [18:41:23.266] else { [18:41:23.266] version <- NULL [18:41:23.266] } [18:41:23.266] if (!has_future || version < "1.8.0") { [18:41:23.266] info <- base::c(r_version = base::gsub("R version ", [18:41:23.266] "", base::R.version$version.string), [18:41:23.266] platform = base::sprintf("%s (%s-bit)", [18:41:23.266] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:23.266] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:23.266] "release", "version")], collapse = " "), [18:41:23.266] hostname = base::Sys.info()[["nodename"]]) [18:41:23.266] info <- base::sprintf("%s: %s", base::names(info), [18:41:23.266] info) [18:41:23.266] info <- base::paste(info, collapse = "; ") [18:41:23.266] if (!has_future) { [18:41:23.266] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:23.266] info) [18:41:23.266] } [18:41:23.266] else { [18:41:23.266] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:23.266] info, version) [18:41:23.266] } [18:41:23.266] base::stop(msg) [18:41:23.266] } [18:41:23.266] }) [18:41:23.266] } [18:41:23.266] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:23.266] base::options(mc.cores = 1L) [18:41:23.266] } [18:41:23.266] ...future.strategy.old <- future::plan("list") [18:41:23.266] options(future.plan = NULL) [18:41:23.266] Sys.unsetenv("R_FUTURE_PLAN") [18:41:23.266] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:23.266] } [18:41:23.266] ...future.workdir <- getwd() [18:41:23.266] } [18:41:23.266] ...future.oldOptions <- base::as.list(base::.Options) [18:41:23.266] ...future.oldEnvVars <- base::Sys.getenv() [18:41:23.266] } [18:41:23.266] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:23.266] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:23.266] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:23.266] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:23.266] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:23.266] future.stdout.windows.reencode = NULL, width = 80L) [18:41:23.266] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:23.266] base::names(...future.oldOptions)) [18:41:23.266] } [18:41:23.266] if (FALSE) { [18:41:23.266] } [18:41:23.266] else { [18:41:23.266] if (TRUE) { [18:41:23.266] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:23.266] open = "w") [18:41:23.266] } [18:41:23.266] else { [18:41:23.266] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:23.266] windows = "NUL", "/dev/null"), open = "w") [18:41:23.266] } [18:41:23.266] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:23.266] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:23.266] base::sink(type = "output", split = FALSE) [18:41:23.266] base::close(...future.stdout) [18:41:23.266] }, add = TRUE) [18:41:23.266] } [18:41:23.266] ...future.frame <- base::sys.nframe() [18:41:23.266] ...future.conditions <- base::list() [18:41:23.266] ...future.rng <- base::globalenv()$.Random.seed [18:41:23.266] if (FALSE) { [18:41:23.266] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:23.266] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:23.266] } [18:41:23.266] ...future.result <- base::tryCatch({ [18:41:23.266] base::withCallingHandlers({ [18:41:23.266] ...future.value <- base::withVisible(base::local({ [18:41:23.266] ...future.makeSendCondition <- base::local({ [18:41:23.266] sendCondition <- NULL [18:41:23.266] function(frame = 1L) { [18:41:23.266] if (is.function(sendCondition)) [18:41:23.266] return(sendCondition) [18:41:23.266] ns <- getNamespace("parallel") [18:41:23.266] if (exists("sendData", mode = "function", [18:41:23.266] envir = ns)) { [18:41:23.266] parallel_sendData <- get("sendData", mode = "function", [18:41:23.266] envir = ns) [18:41:23.266] envir <- sys.frame(frame) [18:41:23.266] master <- NULL [18:41:23.266] while (!identical(envir, .GlobalEnv) && [18:41:23.266] !identical(envir, emptyenv())) { [18:41:23.266] if (exists("master", mode = "list", envir = envir, [18:41:23.266] inherits = FALSE)) { [18:41:23.266] master <- get("master", mode = "list", [18:41:23.266] envir = envir, inherits = FALSE) [18:41:23.266] if (inherits(master, c("SOCKnode", [18:41:23.266] "SOCK0node"))) { [18:41:23.266] sendCondition <<- function(cond) { [18:41:23.266] data <- list(type = "VALUE", value = cond, [18:41:23.266] success = TRUE) [18:41:23.266] parallel_sendData(master, data) [18:41:23.266] } [18:41:23.266] return(sendCondition) [18:41:23.266] } [18:41:23.266] } [18:41:23.266] frame <- frame + 1L [18:41:23.266] envir <- sys.frame(frame) [18:41:23.266] } [18:41:23.266] } [18:41:23.266] sendCondition <<- function(cond) NULL [18:41:23.266] } [18:41:23.266] }) [18:41:23.266] withCallingHandlers({ [18:41:23.266] { [18:41:23.266] do.call(function(...) { [18:41:23.266] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:23.266] if (!identical(...future.globals.maxSize.org, [18:41:23.266] ...future.globals.maxSize)) { [18:41:23.266] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:23.266] on.exit(options(oopts), add = TRUE) [18:41:23.266] } [18:41:23.266] { [18:41:23.266] lapply(seq_along(...future.elements_ii), [18:41:23.266] FUN = function(jj) { [18:41:23.266] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:23.266] ...future.FUN(...future.X_jj, ...) [18:41:23.266] }) [18:41:23.266] } [18:41:23.266] }, args = future.call.arguments) [18:41:23.266] } [18:41:23.266] }, immediateCondition = function(cond) { [18:41:23.266] sendCondition <- ...future.makeSendCondition() [18:41:23.266] sendCondition(cond) [18:41:23.266] muffleCondition <- function (cond, pattern = "^muffle") [18:41:23.266] { [18:41:23.266] inherits <- base::inherits [18:41:23.266] invokeRestart <- base::invokeRestart [18:41:23.266] is.null <- base::is.null [18:41:23.266] muffled <- FALSE [18:41:23.266] if (inherits(cond, "message")) { [18:41:23.266] muffled <- grepl(pattern, "muffleMessage") [18:41:23.266] if (muffled) [18:41:23.266] invokeRestart("muffleMessage") [18:41:23.266] } [18:41:23.266] else if (inherits(cond, "warning")) { [18:41:23.266] muffled <- grepl(pattern, "muffleWarning") [18:41:23.266] if (muffled) [18:41:23.266] invokeRestart("muffleWarning") [18:41:23.266] } [18:41:23.266] else if (inherits(cond, "condition")) { [18:41:23.266] if (!is.null(pattern)) { [18:41:23.266] computeRestarts <- base::computeRestarts [18:41:23.266] grepl <- base::grepl [18:41:23.266] restarts <- computeRestarts(cond) [18:41:23.266] for (restart in restarts) { [18:41:23.266] name <- restart$name [18:41:23.266] if (is.null(name)) [18:41:23.266] next [18:41:23.266] if (!grepl(pattern, name)) [18:41:23.266] next [18:41:23.266] invokeRestart(restart) [18:41:23.266] muffled <- TRUE [18:41:23.266] break [18:41:23.266] } [18:41:23.266] } [18:41:23.266] } [18:41:23.266] invisible(muffled) [18:41:23.266] } [18:41:23.266] muffleCondition(cond) [18:41:23.266] }) [18:41:23.266] })) [18:41:23.266] future::FutureResult(value = ...future.value$value, [18:41:23.266] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:23.266] ...future.rng), globalenv = if (FALSE) [18:41:23.266] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:23.266] ...future.globalenv.names)) [18:41:23.266] else NULL, started = ...future.startTime, version = "1.8") [18:41:23.266] }, condition = base::local({ [18:41:23.266] c <- base::c [18:41:23.266] inherits <- base::inherits [18:41:23.266] invokeRestart <- base::invokeRestart [18:41:23.266] length <- base::length [18:41:23.266] list <- base::list [18:41:23.266] seq.int <- base::seq.int [18:41:23.266] signalCondition <- base::signalCondition [18:41:23.266] sys.calls <- base::sys.calls [18:41:23.266] `[[` <- base::`[[` [18:41:23.266] `+` <- base::`+` [18:41:23.266] `<<-` <- base::`<<-` [18:41:23.266] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:23.266] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:23.266] 3L)] [18:41:23.266] } [18:41:23.266] function(cond) { [18:41:23.266] is_error <- inherits(cond, "error") [18:41:23.266] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:23.266] NULL) [18:41:23.266] if (is_error) { [18:41:23.266] sessionInformation <- function() { [18:41:23.266] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:23.266] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:23.266] search = base::search(), system = base::Sys.info()) [18:41:23.266] } [18:41:23.266] ...future.conditions[[length(...future.conditions) + [18:41:23.266] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:23.266] cond$call), session = sessionInformation(), [18:41:23.266] timestamp = base::Sys.time(), signaled = 0L) [18:41:23.266] signalCondition(cond) [18:41:23.266] } [18:41:23.266] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:23.266] "immediateCondition"))) { [18:41:23.266] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:23.266] ...future.conditions[[length(...future.conditions) + [18:41:23.266] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:23.266] if (TRUE && !signal) { [18:41:23.266] muffleCondition <- function (cond, pattern = "^muffle") [18:41:23.266] { [18:41:23.266] inherits <- base::inherits [18:41:23.266] invokeRestart <- base::invokeRestart [18:41:23.266] is.null <- base::is.null [18:41:23.266] muffled <- FALSE [18:41:23.266] if (inherits(cond, "message")) { [18:41:23.266] muffled <- grepl(pattern, "muffleMessage") [18:41:23.266] if (muffled) [18:41:23.266] invokeRestart("muffleMessage") [18:41:23.266] } [18:41:23.266] else if (inherits(cond, "warning")) { [18:41:23.266] muffled <- grepl(pattern, "muffleWarning") [18:41:23.266] if (muffled) [18:41:23.266] invokeRestart("muffleWarning") [18:41:23.266] } [18:41:23.266] else if (inherits(cond, "condition")) { [18:41:23.266] if (!is.null(pattern)) { [18:41:23.266] computeRestarts <- base::computeRestarts [18:41:23.266] grepl <- base::grepl [18:41:23.266] restarts <- computeRestarts(cond) [18:41:23.266] for (restart in restarts) { [18:41:23.266] name <- restart$name [18:41:23.266] if (is.null(name)) [18:41:23.266] next [18:41:23.266] if (!grepl(pattern, name)) [18:41:23.266] next [18:41:23.266] invokeRestart(restart) [18:41:23.266] muffled <- TRUE [18:41:23.266] break [18:41:23.266] } [18:41:23.266] } [18:41:23.266] } [18:41:23.266] invisible(muffled) [18:41:23.266] } [18:41:23.266] muffleCondition(cond, pattern = "^muffle") [18:41:23.266] } [18:41:23.266] } [18:41:23.266] else { [18:41:23.266] if (TRUE) { [18:41:23.266] muffleCondition <- function (cond, pattern = "^muffle") [18:41:23.266] { [18:41:23.266] inherits <- base::inherits [18:41:23.266] invokeRestart <- base::invokeRestart [18:41:23.266] is.null <- base::is.null [18:41:23.266] muffled <- FALSE [18:41:23.266] if (inherits(cond, "message")) { [18:41:23.266] muffled <- grepl(pattern, "muffleMessage") [18:41:23.266] if (muffled) [18:41:23.266] invokeRestart("muffleMessage") [18:41:23.266] } [18:41:23.266] else if (inherits(cond, "warning")) { [18:41:23.266] muffled <- grepl(pattern, "muffleWarning") [18:41:23.266] if (muffled) [18:41:23.266] invokeRestart("muffleWarning") [18:41:23.266] } [18:41:23.266] else if (inherits(cond, "condition")) { [18:41:23.266] if (!is.null(pattern)) { [18:41:23.266] computeRestarts <- base::computeRestarts [18:41:23.266] grepl <- base::grepl [18:41:23.266] restarts <- computeRestarts(cond) [18:41:23.266] for (restart in restarts) { [18:41:23.266] name <- restart$name [18:41:23.266] if (is.null(name)) [18:41:23.266] next [18:41:23.266] if (!grepl(pattern, name)) [18:41:23.266] next [18:41:23.266] invokeRestart(restart) [18:41:23.266] muffled <- TRUE [18:41:23.266] break [18:41:23.266] } [18:41:23.266] } [18:41:23.266] } [18:41:23.266] invisible(muffled) [18:41:23.266] } [18:41:23.266] muffleCondition(cond, pattern = "^muffle") [18:41:23.266] } [18:41:23.266] } [18:41:23.266] } [18:41:23.266] })) [18:41:23.266] }, error = function(ex) { [18:41:23.266] base::structure(base::list(value = NULL, visible = NULL, [18:41:23.266] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:23.266] ...future.rng), started = ...future.startTime, [18:41:23.266] finished = Sys.time(), session_uuid = NA_character_, [18:41:23.266] version = "1.8"), class = "FutureResult") [18:41:23.266] }, finally = { [18:41:23.266] if (!identical(...future.workdir, getwd())) [18:41:23.266] setwd(...future.workdir) [18:41:23.266] { [18:41:23.266] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:23.266] ...future.oldOptions$nwarnings <- NULL [18:41:23.266] } [18:41:23.266] base::options(...future.oldOptions) [18:41:23.266] if (.Platform$OS.type == "windows") { [18:41:23.266] old_names <- names(...future.oldEnvVars) [18:41:23.266] envs <- base::Sys.getenv() [18:41:23.266] names <- names(envs) [18:41:23.266] common <- intersect(names, old_names) [18:41:23.266] added <- setdiff(names, old_names) [18:41:23.266] removed <- setdiff(old_names, names) [18:41:23.266] changed <- common[...future.oldEnvVars[common] != [18:41:23.266] envs[common]] [18:41:23.266] NAMES <- toupper(changed) [18:41:23.266] args <- list() [18:41:23.266] for (kk in seq_along(NAMES)) { [18:41:23.266] name <- changed[[kk]] [18:41:23.266] NAME <- NAMES[[kk]] [18:41:23.266] if (name != NAME && is.element(NAME, old_names)) [18:41:23.266] next [18:41:23.266] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:23.266] } [18:41:23.266] NAMES <- toupper(added) [18:41:23.266] for (kk in seq_along(NAMES)) { [18:41:23.266] name <- added[[kk]] [18:41:23.266] NAME <- NAMES[[kk]] [18:41:23.266] if (name != NAME && is.element(NAME, old_names)) [18:41:23.266] next [18:41:23.266] args[[name]] <- "" [18:41:23.266] } [18:41:23.266] NAMES <- toupper(removed) [18:41:23.266] for (kk in seq_along(NAMES)) { [18:41:23.266] name <- removed[[kk]] [18:41:23.266] NAME <- NAMES[[kk]] [18:41:23.266] if (name != NAME && is.element(NAME, old_names)) [18:41:23.266] next [18:41:23.266] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:23.266] } [18:41:23.266] if (length(args) > 0) [18:41:23.266] base::do.call(base::Sys.setenv, args = args) [18:41:23.266] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:23.266] } [18:41:23.266] else { [18:41:23.266] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:23.266] } [18:41:23.266] { [18:41:23.266] if (base::length(...future.futureOptionsAdded) > [18:41:23.266] 0L) { [18:41:23.266] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:23.266] base::names(opts) <- ...future.futureOptionsAdded [18:41:23.266] base::options(opts) [18:41:23.266] } [18:41:23.266] { [18:41:23.266] { [18:41:23.266] base::options(mc.cores = ...future.mc.cores.old) [18:41:23.266] NULL [18:41:23.266] } [18:41:23.266] options(future.plan = NULL) [18:41:23.266] if (is.na(NA_character_)) [18:41:23.266] Sys.unsetenv("R_FUTURE_PLAN") [18:41:23.266] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:23.266] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:23.266] .init = FALSE) [18:41:23.266] } [18:41:23.266] } [18:41:23.266] } [18:41:23.266] }) [18:41:23.266] if (TRUE) { [18:41:23.266] base::sink(type = "output", split = FALSE) [18:41:23.266] if (TRUE) { [18:41:23.266] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:23.266] } [18:41:23.266] else { [18:41:23.266] ...future.result["stdout"] <- base::list(NULL) [18:41:23.266] } [18:41:23.266] base::close(...future.stdout) [18:41:23.266] ...future.stdout <- NULL [18:41:23.266] } [18:41:23.266] ...future.result$conditions <- ...future.conditions [18:41:23.266] ...future.result$finished <- base::Sys.time() [18:41:23.266] ...future.result [18:41:23.266] } [18:41:23.272] Exporting 5 global objects (1.17 KiB) to cluster node #1 ... [18:41:23.272] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... [18:41:23.272] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... DONE [18:41:23.272] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... [18:41:23.273] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... DONE [18:41:23.273] Exporting '...future.elements_ii' (96 bytes) to cluster node #1 ... [18:41:23.273] Exporting '...future.elements_ii' (96 bytes) to cluster node #1 ... DONE [18:41:23.274] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:23.274] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:23.274] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:23.274] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:23.275] Exporting 5 global objects (1.17 KiB) to cluster node #1 ... DONE [18:41:23.275] MultisessionFuture started [18:41:23.275] - Launch lazy future ... done [18:41:23.275] run() for 'MultisessionFuture' ... done [18:41:23.276] Created future: [18:41:23.290] receiveMessageFromWorker() for ClusterFuture ... [18:41:23.290] - Validating connection of MultisessionFuture [18:41:23.290] - received message: FutureResult [18:41:23.291] - Received FutureResult [18:41:23.291] - Erased future from FutureRegistry [18:41:23.291] result() for ClusterFuture ... [18:41:23.291] - result already collected: FutureResult [18:41:23.291] result() for ClusterFuture ... done [18:41:23.291] receiveMessageFromWorker() for ClusterFuture ... done [18:41:23.276] MultisessionFuture: [18:41:23.276] Label: 'future_lapply-1' [18:41:23.276] Expression: [18:41:23.276] { [18:41:23.276] do.call(function(...) { [18:41:23.276] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:23.276] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:23.276] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:23.276] on.exit(options(oopts), add = TRUE) [18:41:23.276] } [18:41:23.276] { [18:41:23.276] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:23.276] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:23.276] ...future.FUN(...future.X_jj, ...) [18:41:23.276] }) [18:41:23.276] } [18:41:23.276] }, args = future.call.arguments) [18:41:23.276] } [18:41:23.276] Lazy evaluation: FALSE [18:41:23.276] Asynchronous evaluation: TRUE [18:41:23.276] Local evaluation: TRUE [18:41:23.276] Environment: R_GlobalEnv [18:41:23.276] Capture standard output: TRUE [18:41:23.276] Capture condition classes: 'condition' (excluding 'nothing') [18:41:23.276] Globals: 5 objects totaling 758 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 96 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:23.276] Packages: [18:41:23.276] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:23.276] Resolved: TRUE [18:41:23.276] Value: [18:41:23.276] Conditions captured: [18:41:23.276] Early signaling: FALSE [18:41:23.276] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:23.276] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:23.292] Chunk #1 of 4 ... DONE [18:41:23.292] Chunk #2 of 4 ... [18:41:23.292] - Finding globals in 'X' for chunk #2 ... [18:41:23.292] getGlobalsAndPackages() ... [18:41:23.293] Searching for globals... [18:41:23.293] [18:41:23.293] Searching for globals ... DONE [18:41:23.293] - globals: [0] [18:41:23.293] getGlobalsAndPackages() ... DONE [18:41:23.293] + additional globals found: [n=0] [18:41:23.294] + additional namespaces needed: [n=0] [18:41:23.294] - Finding globals in 'X' for chunk #2 ... DONE [18:41:23.294] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:23.294] - seeds: [18:41:23.294] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:23.294] getGlobalsAndPackages() ... [18:41:23.295] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:23.295] Resolving globals: FALSE [18:41:23.295] Tweak future expression to call with '...' arguments ... [18:41:23.295] { [18:41:23.295] do.call(function(...) { [18:41:23.295] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:23.295] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:23.295] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:23.295] on.exit(options(oopts), add = TRUE) [18:41:23.295] } [18:41:23.295] { [18:41:23.295] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:23.295] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:23.295] ...future.FUN(...future.X_jj, ...) [18:41:23.295] }) [18:41:23.295] } [18:41:23.295] }, args = future.call.arguments) [18:41:23.295] } [18:41:23.296] Tweak future expression to call with '...' arguments ... DONE [18:41:23.296] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:23.296] [18:41:23.296] getGlobalsAndPackages() ... DONE [18:41:23.297] run() for 'Future' ... [18:41:23.297] - state: 'created' [18:41:23.297] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:23.313] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:23.313] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:23.313] - Field: 'node' [18:41:23.313] - Field: 'label' [18:41:23.314] - Field: 'local' [18:41:23.314] - Field: 'owner' [18:41:23.314] - Field: 'envir' [18:41:23.314] - Field: 'workers' [18:41:23.314] - Field: 'packages' [18:41:23.314] - Field: 'gc' [18:41:23.315] - Field: 'conditions' [18:41:23.315] - Field: 'persistent' [18:41:23.315] - Field: 'expr' [18:41:23.315] - Field: 'uuid' [18:41:23.315] - Field: 'seed' [18:41:23.315] - Field: 'version' [18:41:23.316] - Field: 'result' [18:41:23.316] - Field: 'asynchronous' [18:41:23.316] - Field: 'calls' [18:41:23.316] - Field: 'globals' [18:41:23.316] - Field: 'stdout' [18:41:23.316] - Field: 'earlySignal' [18:41:23.317] - Field: 'lazy' [18:41:23.317] - Field: 'state' [18:41:23.317] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:23.317] - Launch lazy future ... [18:41:23.317] Packages needed by the future expression (n = 0): [18:41:23.318] Packages needed by future strategies (n = 0): [18:41:23.318] { [18:41:23.318] { [18:41:23.318] { [18:41:23.318] ...future.startTime <- base::Sys.time() [18:41:23.318] { [18:41:23.318] { [18:41:23.318] { [18:41:23.318] { [18:41:23.318] base::local({ [18:41:23.318] has_future <- base::requireNamespace("future", [18:41:23.318] quietly = TRUE) [18:41:23.318] if (has_future) { [18:41:23.318] ns <- base::getNamespace("future") [18:41:23.318] version <- ns[[".package"]][["version"]] [18:41:23.318] if (is.null(version)) [18:41:23.318] version <- utils::packageVersion("future") [18:41:23.318] } [18:41:23.318] else { [18:41:23.318] version <- NULL [18:41:23.318] } [18:41:23.318] if (!has_future || version < "1.8.0") { [18:41:23.318] info <- base::c(r_version = base::gsub("R version ", [18:41:23.318] "", base::R.version$version.string), [18:41:23.318] platform = base::sprintf("%s (%s-bit)", [18:41:23.318] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:23.318] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:23.318] "release", "version")], collapse = " "), [18:41:23.318] hostname = base::Sys.info()[["nodename"]]) [18:41:23.318] info <- base::sprintf("%s: %s", base::names(info), [18:41:23.318] info) [18:41:23.318] info <- base::paste(info, collapse = "; ") [18:41:23.318] if (!has_future) { [18:41:23.318] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:23.318] info) [18:41:23.318] } [18:41:23.318] else { [18:41:23.318] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:23.318] info, version) [18:41:23.318] } [18:41:23.318] base::stop(msg) [18:41:23.318] } [18:41:23.318] }) [18:41:23.318] } [18:41:23.318] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:23.318] base::options(mc.cores = 1L) [18:41:23.318] } [18:41:23.318] ...future.strategy.old <- future::plan("list") [18:41:23.318] options(future.plan = NULL) [18:41:23.318] Sys.unsetenv("R_FUTURE_PLAN") [18:41:23.318] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:23.318] } [18:41:23.318] ...future.workdir <- getwd() [18:41:23.318] } [18:41:23.318] ...future.oldOptions <- base::as.list(base::.Options) [18:41:23.318] ...future.oldEnvVars <- base::Sys.getenv() [18:41:23.318] } [18:41:23.318] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:23.318] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:23.318] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:23.318] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:23.318] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:23.318] future.stdout.windows.reencode = NULL, width = 80L) [18:41:23.318] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:23.318] base::names(...future.oldOptions)) [18:41:23.318] } [18:41:23.318] if (FALSE) { [18:41:23.318] } [18:41:23.318] else { [18:41:23.318] if (TRUE) { [18:41:23.318] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:23.318] open = "w") [18:41:23.318] } [18:41:23.318] else { [18:41:23.318] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:23.318] windows = "NUL", "/dev/null"), open = "w") [18:41:23.318] } [18:41:23.318] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:23.318] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:23.318] base::sink(type = "output", split = FALSE) [18:41:23.318] base::close(...future.stdout) [18:41:23.318] }, add = TRUE) [18:41:23.318] } [18:41:23.318] ...future.frame <- base::sys.nframe() [18:41:23.318] ...future.conditions <- base::list() [18:41:23.318] ...future.rng <- base::globalenv()$.Random.seed [18:41:23.318] if (FALSE) { [18:41:23.318] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:23.318] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:23.318] } [18:41:23.318] ...future.result <- base::tryCatch({ [18:41:23.318] base::withCallingHandlers({ [18:41:23.318] ...future.value <- base::withVisible(base::local({ [18:41:23.318] ...future.makeSendCondition <- base::local({ [18:41:23.318] sendCondition <- NULL [18:41:23.318] function(frame = 1L) { [18:41:23.318] if (is.function(sendCondition)) [18:41:23.318] return(sendCondition) [18:41:23.318] ns <- getNamespace("parallel") [18:41:23.318] if (exists("sendData", mode = "function", [18:41:23.318] envir = ns)) { [18:41:23.318] parallel_sendData <- get("sendData", mode = "function", [18:41:23.318] envir = ns) [18:41:23.318] envir <- sys.frame(frame) [18:41:23.318] master <- NULL [18:41:23.318] while (!identical(envir, .GlobalEnv) && [18:41:23.318] !identical(envir, emptyenv())) { [18:41:23.318] if (exists("master", mode = "list", envir = envir, [18:41:23.318] inherits = FALSE)) { [18:41:23.318] master <- get("master", mode = "list", [18:41:23.318] envir = envir, inherits = FALSE) [18:41:23.318] if (inherits(master, c("SOCKnode", [18:41:23.318] "SOCK0node"))) { [18:41:23.318] sendCondition <<- function(cond) { [18:41:23.318] data <- list(type = "VALUE", value = cond, [18:41:23.318] success = TRUE) [18:41:23.318] parallel_sendData(master, data) [18:41:23.318] } [18:41:23.318] return(sendCondition) [18:41:23.318] } [18:41:23.318] } [18:41:23.318] frame <- frame + 1L [18:41:23.318] envir <- sys.frame(frame) [18:41:23.318] } [18:41:23.318] } [18:41:23.318] sendCondition <<- function(cond) NULL [18:41:23.318] } [18:41:23.318] }) [18:41:23.318] withCallingHandlers({ [18:41:23.318] { [18:41:23.318] do.call(function(...) { [18:41:23.318] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:23.318] if (!identical(...future.globals.maxSize.org, [18:41:23.318] ...future.globals.maxSize)) { [18:41:23.318] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:23.318] on.exit(options(oopts), add = TRUE) [18:41:23.318] } [18:41:23.318] { [18:41:23.318] lapply(seq_along(...future.elements_ii), [18:41:23.318] FUN = function(jj) { [18:41:23.318] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:23.318] ...future.FUN(...future.X_jj, ...) [18:41:23.318] }) [18:41:23.318] } [18:41:23.318] }, args = future.call.arguments) [18:41:23.318] } [18:41:23.318] }, immediateCondition = function(cond) { [18:41:23.318] sendCondition <- ...future.makeSendCondition() [18:41:23.318] sendCondition(cond) [18:41:23.318] muffleCondition <- function (cond, pattern = "^muffle") [18:41:23.318] { [18:41:23.318] inherits <- base::inherits [18:41:23.318] invokeRestart <- base::invokeRestart [18:41:23.318] is.null <- base::is.null [18:41:23.318] muffled <- FALSE [18:41:23.318] if (inherits(cond, "message")) { [18:41:23.318] muffled <- grepl(pattern, "muffleMessage") [18:41:23.318] if (muffled) [18:41:23.318] invokeRestart("muffleMessage") [18:41:23.318] } [18:41:23.318] else if (inherits(cond, "warning")) { [18:41:23.318] muffled <- grepl(pattern, "muffleWarning") [18:41:23.318] if (muffled) [18:41:23.318] invokeRestart("muffleWarning") [18:41:23.318] } [18:41:23.318] else if (inherits(cond, "condition")) { [18:41:23.318] if (!is.null(pattern)) { [18:41:23.318] computeRestarts <- base::computeRestarts [18:41:23.318] grepl <- base::grepl [18:41:23.318] restarts <- computeRestarts(cond) [18:41:23.318] for (restart in restarts) { [18:41:23.318] name <- restart$name [18:41:23.318] if (is.null(name)) [18:41:23.318] next [18:41:23.318] if (!grepl(pattern, name)) [18:41:23.318] next [18:41:23.318] invokeRestart(restart) [18:41:23.318] muffled <- TRUE [18:41:23.318] break [18:41:23.318] } [18:41:23.318] } [18:41:23.318] } [18:41:23.318] invisible(muffled) [18:41:23.318] } [18:41:23.318] muffleCondition(cond) [18:41:23.318] }) [18:41:23.318] })) [18:41:23.318] future::FutureResult(value = ...future.value$value, [18:41:23.318] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:23.318] ...future.rng), globalenv = if (FALSE) [18:41:23.318] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:23.318] ...future.globalenv.names)) [18:41:23.318] else NULL, started = ...future.startTime, version = "1.8") [18:41:23.318] }, condition = base::local({ [18:41:23.318] c <- base::c [18:41:23.318] inherits <- base::inherits [18:41:23.318] invokeRestart <- base::invokeRestart [18:41:23.318] length <- base::length [18:41:23.318] list <- base::list [18:41:23.318] seq.int <- base::seq.int [18:41:23.318] signalCondition <- base::signalCondition [18:41:23.318] sys.calls <- base::sys.calls [18:41:23.318] `[[` <- base::`[[` [18:41:23.318] `+` <- base::`+` [18:41:23.318] `<<-` <- base::`<<-` [18:41:23.318] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:23.318] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:23.318] 3L)] [18:41:23.318] } [18:41:23.318] function(cond) { [18:41:23.318] is_error <- inherits(cond, "error") [18:41:23.318] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:23.318] NULL) [18:41:23.318] if (is_error) { [18:41:23.318] sessionInformation <- function() { [18:41:23.318] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:23.318] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:23.318] search = base::search(), system = base::Sys.info()) [18:41:23.318] } [18:41:23.318] ...future.conditions[[length(...future.conditions) + [18:41:23.318] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:23.318] cond$call), session = sessionInformation(), [18:41:23.318] timestamp = base::Sys.time(), signaled = 0L) [18:41:23.318] signalCondition(cond) [18:41:23.318] } [18:41:23.318] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:23.318] "immediateCondition"))) { [18:41:23.318] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:23.318] ...future.conditions[[length(...future.conditions) + [18:41:23.318] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:23.318] if (TRUE && !signal) { [18:41:23.318] muffleCondition <- function (cond, pattern = "^muffle") [18:41:23.318] { [18:41:23.318] inherits <- base::inherits [18:41:23.318] invokeRestart <- base::invokeRestart [18:41:23.318] is.null <- base::is.null [18:41:23.318] muffled <- FALSE [18:41:23.318] if (inherits(cond, "message")) { [18:41:23.318] muffled <- grepl(pattern, "muffleMessage") [18:41:23.318] if (muffled) [18:41:23.318] invokeRestart("muffleMessage") [18:41:23.318] } [18:41:23.318] else if (inherits(cond, "warning")) { [18:41:23.318] muffled <- grepl(pattern, "muffleWarning") [18:41:23.318] if (muffled) [18:41:23.318] invokeRestart("muffleWarning") [18:41:23.318] } [18:41:23.318] else if (inherits(cond, "condition")) { [18:41:23.318] if (!is.null(pattern)) { [18:41:23.318] computeRestarts <- base::computeRestarts [18:41:23.318] grepl <- base::grepl [18:41:23.318] restarts <- computeRestarts(cond) [18:41:23.318] for (restart in restarts) { [18:41:23.318] name <- restart$name [18:41:23.318] if (is.null(name)) [18:41:23.318] next [18:41:23.318] if (!grepl(pattern, name)) [18:41:23.318] next [18:41:23.318] invokeRestart(restart) [18:41:23.318] muffled <- TRUE [18:41:23.318] break [18:41:23.318] } [18:41:23.318] } [18:41:23.318] } [18:41:23.318] invisible(muffled) [18:41:23.318] } [18:41:23.318] muffleCondition(cond, pattern = "^muffle") [18:41:23.318] } [18:41:23.318] } [18:41:23.318] else { [18:41:23.318] if (TRUE) { [18:41:23.318] muffleCondition <- function (cond, pattern = "^muffle") [18:41:23.318] { [18:41:23.318] inherits <- base::inherits [18:41:23.318] invokeRestart <- base::invokeRestart [18:41:23.318] is.null <- base::is.null [18:41:23.318] muffled <- FALSE [18:41:23.318] if (inherits(cond, "message")) { [18:41:23.318] muffled <- grepl(pattern, "muffleMessage") [18:41:23.318] if (muffled) [18:41:23.318] invokeRestart("muffleMessage") [18:41:23.318] } [18:41:23.318] else if (inherits(cond, "warning")) { [18:41:23.318] muffled <- grepl(pattern, "muffleWarning") [18:41:23.318] if (muffled) [18:41:23.318] invokeRestart("muffleWarning") [18:41:23.318] } [18:41:23.318] else if (inherits(cond, "condition")) { [18:41:23.318] if (!is.null(pattern)) { [18:41:23.318] computeRestarts <- base::computeRestarts [18:41:23.318] grepl <- base::grepl [18:41:23.318] restarts <- computeRestarts(cond) [18:41:23.318] for (restart in restarts) { [18:41:23.318] name <- restart$name [18:41:23.318] if (is.null(name)) [18:41:23.318] next [18:41:23.318] if (!grepl(pattern, name)) [18:41:23.318] next [18:41:23.318] invokeRestart(restart) [18:41:23.318] muffled <- TRUE [18:41:23.318] break [18:41:23.318] } [18:41:23.318] } [18:41:23.318] } [18:41:23.318] invisible(muffled) [18:41:23.318] } [18:41:23.318] muffleCondition(cond, pattern = "^muffle") [18:41:23.318] } [18:41:23.318] } [18:41:23.318] } [18:41:23.318] })) [18:41:23.318] }, error = function(ex) { [18:41:23.318] base::structure(base::list(value = NULL, visible = NULL, [18:41:23.318] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:23.318] ...future.rng), started = ...future.startTime, [18:41:23.318] finished = Sys.time(), session_uuid = NA_character_, [18:41:23.318] version = "1.8"), class = "FutureResult") [18:41:23.318] }, finally = { [18:41:23.318] if (!identical(...future.workdir, getwd())) [18:41:23.318] setwd(...future.workdir) [18:41:23.318] { [18:41:23.318] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:23.318] ...future.oldOptions$nwarnings <- NULL [18:41:23.318] } [18:41:23.318] base::options(...future.oldOptions) [18:41:23.318] if (.Platform$OS.type == "windows") { [18:41:23.318] old_names <- names(...future.oldEnvVars) [18:41:23.318] envs <- base::Sys.getenv() [18:41:23.318] names <- names(envs) [18:41:23.318] common <- intersect(names, old_names) [18:41:23.318] added <- setdiff(names, old_names) [18:41:23.318] removed <- setdiff(old_names, names) [18:41:23.318] changed <- common[...future.oldEnvVars[common] != [18:41:23.318] envs[common]] [18:41:23.318] NAMES <- toupper(changed) [18:41:23.318] args <- list() [18:41:23.318] for (kk in seq_along(NAMES)) { [18:41:23.318] name <- changed[[kk]] [18:41:23.318] NAME <- NAMES[[kk]] [18:41:23.318] if (name != NAME && is.element(NAME, old_names)) [18:41:23.318] next [18:41:23.318] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:23.318] } [18:41:23.318] NAMES <- toupper(added) [18:41:23.318] for (kk in seq_along(NAMES)) { [18:41:23.318] name <- added[[kk]] [18:41:23.318] NAME <- NAMES[[kk]] [18:41:23.318] if (name != NAME && is.element(NAME, old_names)) [18:41:23.318] next [18:41:23.318] args[[name]] <- "" [18:41:23.318] } [18:41:23.318] NAMES <- toupper(removed) [18:41:23.318] for (kk in seq_along(NAMES)) { [18:41:23.318] name <- removed[[kk]] [18:41:23.318] NAME <- NAMES[[kk]] [18:41:23.318] if (name != NAME && is.element(NAME, old_names)) [18:41:23.318] next [18:41:23.318] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:23.318] } [18:41:23.318] if (length(args) > 0) [18:41:23.318] base::do.call(base::Sys.setenv, args = args) [18:41:23.318] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:23.318] } [18:41:23.318] else { [18:41:23.318] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:23.318] } [18:41:23.318] { [18:41:23.318] if (base::length(...future.futureOptionsAdded) > [18:41:23.318] 0L) { [18:41:23.318] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:23.318] base::names(opts) <- ...future.futureOptionsAdded [18:41:23.318] base::options(opts) [18:41:23.318] } [18:41:23.318] { [18:41:23.318] { [18:41:23.318] base::options(mc.cores = ...future.mc.cores.old) [18:41:23.318] NULL [18:41:23.318] } [18:41:23.318] options(future.plan = NULL) [18:41:23.318] if (is.na(NA_character_)) [18:41:23.318] Sys.unsetenv("R_FUTURE_PLAN") [18:41:23.318] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:23.318] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:23.318] .init = FALSE) [18:41:23.318] } [18:41:23.318] } [18:41:23.318] } [18:41:23.318] }) [18:41:23.318] if (TRUE) { [18:41:23.318] base::sink(type = "output", split = FALSE) [18:41:23.318] if (TRUE) { [18:41:23.318] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:23.318] } [18:41:23.318] else { [18:41:23.318] ...future.result["stdout"] <- base::list(NULL) [18:41:23.318] } [18:41:23.318] base::close(...future.stdout) [18:41:23.318] ...future.stdout <- NULL [18:41:23.318] } [18:41:23.318] ...future.result$conditions <- ...future.conditions [18:41:23.318] ...future.result$finished <- base::Sys.time() [18:41:23.318] ...future.result [18:41:23.318] } [18:41:23.324] Exporting 5 global objects (1.17 KiB) to cluster node #1 ... [18:41:23.324] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... [18:41:23.325] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... DONE [18:41:23.326] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... [18:41:23.326] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... DONE [18:41:23.327] Exporting '...future.elements_ii' (96 bytes) to cluster node #1 ... [18:41:23.327] Exporting '...future.elements_ii' (96 bytes) to cluster node #1 ... DONE [18:41:23.328] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:23.328] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:23.328] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:23.329] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:23.329] Exporting 5 global objects (1.17 KiB) to cluster node #1 ... DONE [18:41:23.330] MultisessionFuture started [18:41:23.330] - Launch lazy future ... done [18:41:23.330] run() for 'MultisessionFuture' ... done [18:41:23.330] Created future: [18:41:23.343] receiveMessageFromWorker() for ClusterFuture ... [18:41:23.344] - Validating connection of MultisessionFuture [18:41:23.344] - received message: FutureResult [18:41:23.344] - Received FutureResult [18:41:23.344] - Erased future from FutureRegistry [18:41:23.345] result() for ClusterFuture ... [18:41:23.345] - result already collected: FutureResult [18:41:23.345] result() for ClusterFuture ... done [18:41:23.345] receiveMessageFromWorker() for ClusterFuture ... done [18:41:23.330] MultisessionFuture: [18:41:23.330] Label: 'future_lapply-2' [18:41:23.330] Expression: [18:41:23.330] { [18:41:23.330] do.call(function(...) { [18:41:23.330] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:23.330] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:23.330] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:23.330] on.exit(options(oopts), add = TRUE) [18:41:23.330] } [18:41:23.330] { [18:41:23.330] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:23.330] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:23.330] ...future.FUN(...future.X_jj, ...) [18:41:23.330] }) [18:41:23.330] } [18:41:23.330] }, args = future.call.arguments) [18:41:23.330] } [18:41:23.330] Lazy evaluation: FALSE [18:41:23.330] Asynchronous evaluation: TRUE [18:41:23.330] Local evaluation: TRUE [18:41:23.330] Environment: R_GlobalEnv [18:41:23.330] Capture standard output: TRUE [18:41:23.330] Capture condition classes: 'condition' (excluding 'nothing') [18:41:23.330] Globals: 5 objects totaling 758 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 96 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:23.330] Packages: [18:41:23.330] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:23.330] Resolved: TRUE [18:41:23.330] Value: [18:41:23.330] Conditions captured: [18:41:23.330] Early signaling: FALSE [18:41:23.330] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:23.330] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:23.346] Chunk #2 of 4 ... DONE [18:41:23.346] Chunk #3 of 4 ... [18:41:23.346] - Finding globals in 'X' for chunk #3 ... [18:41:23.346] getGlobalsAndPackages() ... [18:41:23.346] Searching for globals... [18:41:23.347] [18:41:23.347] Searching for globals ... DONE [18:41:23.347] - globals: [0] [18:41:23.347] getGlobalsAndPackages() ... DONE [18:41:23.347] + additional globals found: [n=0] [18:41:23.347] + additional namespaces needed: [n=0] [18:41:23.348] - Finding globals in 'X' for chunk #3 ... DONE [18:41:23.348] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:23.348] - seeds: [18:41:23.348] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:23.348] getGlobalsAndPackages() ... [18:41:23.348] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:23.349] Resolving globals: FALSE [18:41:23.349] Tweak future expression to call with '...' arguments ... [18:41:23.349] { [18:41:23.349] do.call(function(...) { [18:41:23.349] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:23.349] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:23.349] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:23.349] on.exit(options(oopts), add = TRUE) [18:41:23.349] } [18:41:23.349] { [18:41:23.349] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:23.349] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:23.349] ...future.FUN(...future.X_jj, ...) [18:41:23.349] }) [18:41:23.349] } [18:41:23.349] }, args = future.call.arguments) [18:41:23.349] } [18:41:23.349] Tweak future expression to call with '...' arguments ... DONE [18:41:23.350] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:23.350] [18:41:23.350] getGlobalsAndPackages() ... DONE [18:41:23.351] run() for 'Future' ... [18:41:23.351] - state: 'created' [18:41:23.351] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:23.367] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:23.367] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:23.368] - Field: 'node' [18:41:23.368] - Field: 'label' [18:41:23.368] - Field: 'local' [18:41:23.368] - Field: 'owner' [18:41:23.368] - Field: 'envir' [18:41:23.368] - Field: 'workers' [18:41:23.369] - Field: 'packages' [18:41:23.369] - Field: 'gc' [18:41:23.369] - Field: 'conditions' [18:41:23.369] - Field: 'persistent' [18:41:23.369] - Field: 'expr' [18:41:23.369] - Field: 'uuid' [18:41:23.370] - Field: 'seed' [18:41:23.370] - Field: 'version' [18:41:23.370] - Field: 'result' [18:41:23.370] - Field: 'asynchronous' [18:41:23.370] - Field: 'calls' [18:41:23.370] - Field: 'globals' [18:41:23.371] - Field: 'stdout' [18:41:23.371] - Field: 'earlySignal' [18:41:23.371] - Field: 'lazy' [18:41:23.371] - Field: 'state' [18:41:23.371] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:23.371] - Launch lazy future ... [18:41:23.372] Packages needed by the future expression (n = 0): [18:41:23.372] Packages needed by future strategies (n = 0): [18:41:23.373] { [18:41:23.373] { [18:41:23.373] { [18:41:23.373] ...future.startTime <- base::Sys.time() [18:41:23.373] { [18:41:23.373] { [18:41:23.373] { [18:41:23.373] { [18:41:23.373] base::local({ [18:41:23.373] has_future <- base::requireNamespace("future", [18:41:23.373] quietly = TRUE) [18:41:23.373] if (has_future) { [18:41:23.373] ns <- base::getNamespace("future") [18:41:23.373] version <- ns[[".package"]][["version"]] [18:41:23.373] if (is.null(version)) [18:41:23.373] version <- utils::packageVersion("future") [18:41:23.373] } [18:41:23.373] else { [18:41:23.373] version <- NULL [18:41:23.373] } [18:41:23.373] if (!has_future || version < "1.8.0") { [18:41:23.373] info <- base::c(r_version = base::gsub("R version ", [18:41:23.373] "", base::R.version$version.string), [18:41:23.373] platform = base::sprintf("%s (%s-bit)", [18:41:23.373] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:23.373] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:23.373] "release", "version")], collapse = " "), [18:41:23.373] hostname = base::Sys.info()[["nodename"]]) [18:41:23.373] info <- base::sprintf("%s: %s", base::names(info), [18:41:23.373] info) [18:41:23.373] info <- base::paste(info, collapse = "; ") [18:41:23.373] if (!has_future) { [18:41:23.373] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:23.373] info) [18:41:23.373] } [18:41:23.373] else { [18:41:23.373] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:23.373] info, version) [18:41:23.373] } [18:41:23.373] base::stop(msg) [18:41:23.373] } [18:41:23.373] }) [18:41:23.373] } [18:41:23.373] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:23.373] base::options(mc.cores = 1L) [18:41:23.373] } [18:41:23.373] ...future.strategy.old <- future::plan("list") [18:41:23.373] options(future.plan = NULL) [18:41:23.373] Sys.unsetenv("R_FUTURE_PLAN") [18:41:23.373] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:23.373] } [18:41:23.373] ...future.workdir <- getwd() [18:41:23.373] } [18:41:23.373] ...future.oldOptions <- base::as.list(base::.Options) [18:41:23.373] ...future.oldEnvVars <- base::Sys.getenv() [18:41:23.373] } [18:41:23.373] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:23.373] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:23.373] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:23.373] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:23.373] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:23.373] future.stdout.windows.reencode = NULL, width = 80L) [18:41:23.373] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:23.373] base::names(...future.oldOptions)) [18:41:23.373] } [18:41:23.373] if (FALSE) { [18:41:23.373] } [18:41:23.373] else { [18:41:23.373] if (TRUE) { [18:41:23.373] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:23.373] open = "w") [18:41:23.373] } [18:41:23.373] else { [18:41:23.373] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:23.373] windows = "NUL", "/dev/null"), open = "w") [18:41:23.373] } [18:41:23.373] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:23.373] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:23.373] base::sink(type = "output", split = FALSE) [18:41:23.373] base::close(...future.stdout) [18:41:23.373] }, add = TRUE) [18:41:23.373] } [18:41:23.373] ...future.frame <- base::sys.nframe() [18:41:23.373] ...future.conditions <- base::list() [18:41:23.373] ...future.rng <- base::globalenv()$.Random.seed [18:41:23.373] if (FALSE) { [18:41:23.373] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:23.373] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:23.373] } [18:41:23.373] ...future.result <- base::tryCatch({ [18:41:23.373] base::withCallingHandlers({ [18:41:23.373] ...future.value <- base::withVisible(base::local({ [18:41:23.373] ...future.makeSendCondition <- base::local({ [18:41:23.373] sendCondition <- NULL [18:41:23.373] function(frame = 1L) { [18:41:23.373] if (is.function(sendCondition)) [18:41:23.373] return(sendCondition) [18:41:23.373] ns <- getNamespace("parallel") [18:41:23.373] if (exists("sendData", mode = "function", [18:41:23.373] envir = ns)) { [18:41:23.373] parallel_sendData <- get("sendData", mode = "function", [18:41:23.373] envir = ns) [18:41:23.373] envir <- sys.frame(frame) [18:41:23.373] master <- NULL [18:41:23.373] while (!identical(envir, .GlobalEnv) && [18:41:23.373] !identical(envir, emptyenv())) { [18:41:23.373] if (exists("master", mode = "list", envir = envir, [18:41:23.373] inherits = FALSE)) { [18:41:23.373] master <- get("master", mode = "list", [18:41:23.373] envir = envir, inherits = FALSE) [18:41:23.373] if (inherits(master, c("SOCKnode", [18:41:23.373] "SOCK0node"))) { [18:41:23.373] sendCondition <<- function(cond) { [18:41:23.373] data <- list(type = "VALUE", value = cond, [18:41:23.373] success = TRUE) [18:41:23.373] parallel_sendData(master, data) [18:41:23.373] } [18:41:23.373] return(sendCondition) [18:41:23.373] } [18:41:23.373] } [18:41:23.373] frame <- frame + 1L [18:41:23.373] envir <- sys.frame(frame) [18:41:23.373] } [18:41:23.373] } [18:41:23.373] sendCondition <<- function(cond) NULL [18:41:23.373] } [18:41:23.373] }) [18:41:23.373] withCallingHandlers({ [18:41:23.373] { [18:41:23.373] do.call(function(...) { [18:41:23.373] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:23.373] if (!identical(...future.globals.maxSize.org, [18:41:23.373] ...future.globals.maxSize)) { [18:41:23.373] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:23.373] on.exit(options(oopts), add = TRUE) [18:41:23.373] } [18:41:23.373] { [18:41:23.373] lapply(seq_along(...future.elements_ii), [18:41:23.373] FUN = function(jj) { [18:41:23.373] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:23.373] ...future.FUN(...future.X_jj, ...) [18:41:23.373] }) [18:41:23.373] } [18:41:23.373] }, args = future.call.arguments) [18:41:23.373] } [18:41:23.373] }, immediateCondition = function(cond) { [18:41:23.373] sendCondition <- ...future.makeSendCondition() [18:41:23.373] sendCondition(cond) [18:41:23.373] muffleCondition <- function (cond, pattern = "^muffle") [18:41:23.373] { [18:41:23.373] inherits <- base::inherits [18:41:23.373] invokeRestart <- base::invokeRestart [18:41:23.373] is.null <- base::is.null [18:41:23.373] muffled <- FALSE [18:41:23.373] if (inherits(cond, "message")) { [18:41:23.373] muffled <- grepl(pattern, "muffleMessage") [18:41:23.373] if (muffled) [18:41:23.373] invokeRestart("muffleMessage") [18:41:23.373] } [18:41:23.373] else if (inherits(cond, "warning")) { [18:41:23.373] muffled <- grepl(pattern, "muffleWarning") [18:41:23.373] if (muffled) [18:41:23.373] invokeRestart("muffleWarning") [18:41:23.373] } [18:41:23.373] else if (inherits(cond, "condition")) { [18:41:23.373] if (!is.null(pattern)) { [18:41:23.373] computeRestarts <- base::computeRestarts [18:41:23.373] grepl <- base::grepl [18:41:23.373] restarts <- computeRestarts(cond) [18:41:23.373] for (restart in restarts) { [18:41:23.373] name <- restart$name [18:41:23.373] if (is.null(name)) [18:41:23.373] next [18:41:23.373] if (!grepl(pattern, name)) [18:41:23.373] next [18:41:23.373] invokeRestart(restart) [18:41:23.373] muffled <- TRUE [18:41:23.373] break [18:41:23.373] } [18:41:23.373] } [18:41:23.373] } [18:41:23.373] invisible(muffled) [18:41:23.373] } [18:41:23.373] muffleCondition(cond) [18:41:23.373] }) [18:41:23.373] })) [18:41:23.373] future::FutureResult(value = ...future.value$value, [18:41:23.373] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:23.373] ...future.rng), globalenv = if (FALSE) [18:41:23.373] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:23.373] ...future.globalenv.names)) [18:41:23.373] else NULL, started = ...future.startTime, version = "1.8") [18:41:23.373] }, condition = base::local({ [18:41:23.373] c <- base::c [18:41:23.373] inherits <- base::inherits [18:41:23.373] invokeRestart <- base::invokeRestart [18:41:23.373] length <- base::length [18:41:23.373] list <- base::list [18:41:23.373] seq.int <- base::seq.int [18:41:23.373] signalCondition <- base::signalCondition [18:41:23.373] sys.calls <- base::sys.calls [18:41:23.373] `[[` <- base::`[[` [18:41:23.373] `+` <- base::`+` [18:41:23.373] `<<-` <- base::`<<-` [18:41:23.373] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:23.373] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:23.373] 3L)] [18:41:23.373] } [18:41:23.373] function(cond) { [18:41:23.373] is_error <- inherits(cond, "error") [18:41:23.373] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:23.373] NULL) [18:41:23.373] if (is_error) { [18:41:23.373] sessionInformation <- function() { [18:41:23.373] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:23.373] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:23.373] search = base::search(), system = base::Sys.info()) [18:41:23.373] } [18:41:23.373] ...future.conditions[[length(...future.conditions) + [18:41:23.373] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:23.373] cond$call), session = sessionInformation(), [18:41:23.373] timestamp = base::Sys.time(), signaled = 0L) [18:41:23.373] signalCondition(cond) [18:41:23.373] } [18:41:23.373] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:23.373] "immediateCondition"))) { [18:41:23.373] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:23.373] ...future.conditions[[length(...future.conditions) + [18:41:23.373] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:23.373] if (TRUE && !signal) { [18:41:23.373] muffleCondition <- function (cond, pattern = "^muffle") [18:41:23.373] { [18:41:23.373] inherits <- base::inherits [18:41:23.373] invokeRestart <- base::invokeRestart [18:41:23.373] is.null <- base::is.null [18:41:23.373] muffled <- FALSE [18:41:23.373] if (inherits(cond, "message")) { [18:41:23.373] muffled <- grepl(pattern, "muffleMessage") [18:41:23.373] if (muffled) [18:41:23.373] invokeRestart("muffleMessage") [18:41:23.373] } [18:41:23.373] else if (inherits(cond, "warning")) { [18:41:23.373] muffled <- grepl(pattern, "muffleWarning") [18:41:23.373] if (muffled) [18:41:23.373] invokeRestart("muffleWarning") [18:41:23.373] } [18:41:23.373] else if (inherits(cond, "condition")) { [18:41:23.373] if (!is.null(pattern)) { [18:41:23.373] computeRestarts <- base::computeRestarts [18:41:23.373] grepl <- base::grepl [18:41:23.373] restarts <- computeRestarts(cond) [18:41:23.373] for (restart in restarts) { [18:41:23.373] name <- restart$name [18:41:23.373] if (is.null(name)) [18:41:23.373] next [18:41:23.373] if (!grepl(pattern, name)) [18:41:23.373] next [18:41:23.373] invokeRestart(restart) [18:41:23.373] muffled <- TRUE [18:41:23.373] break [18:41:23.373] } [18:41:23.373] } [18:41:23.373] } [18:41:23.373] invisible(muffled) [18:41:23.373] } [18:41:23.373] muffleCondition(cond, pattern = "^muffle") [18:41:23.373] } [18:41:23.373] } [18:41:23.373] else { [18:41:23.373] if (TRUE) { [18:41:23.373] muffleCondition <- function (cond, pattern = "^muffle") [18:41:23.373] { [18:41:23.373] inherits <- base::inherits [18:41:23.373] invokeRestart <- base::invokeRestart [18:41:23.373] is.null <- base::is.null [18:41:23.373] muffled <- FALSE [18:41:23.373] if (inherits(cond, "message")) { [18:41:23.373] muffled <- grepl(pattern, "muffleMessage") [18:41:23.373] if (muffled) [18:41:23.373] invokeRestart("muffleMessage") [18:41:23.373] } [18:41:23.373] else if (inherits(cond, "warning")) { [18:41:23.373] muffled <- grepl(pattern, "muffleWarning") [18:41:23.373] if (muffled) [18:41:23.373] invokeRestart("muffleWarning") [18:41:23.373] } [18:41:23.373] else if (inherits(cond, "condition")) { [18:41:23.373] if (!is.null(pattern)) { [18:41:23.373] computeRestarts <- base::computeRestarts [18:41:23.373] grepl <- base::grepl [18:41:23.373] restarts <- computeRestarts(cond) [18:41:23.373] for (restart in restarts) { [18:41:23.373] name <- restart$name [18:41:23.373] if (is.null(name)) [18:41:23.373] next [18:41:23.373] if (!grepl(pattern, name)) [18:41:23.373] next [18:41:23.373] invokeRestart(restart) [18:41:23.373] muffled <- TRUE [18:41:23.373] break [18:41:23.373] } [18:41:23.373] } [18:41:23.373] } [18:41:23.373] invisible(muffled) [18:41:23.373] } [18:41:23.373] muffleCondition(cond, pattern = "^muffle") [18:41:23.373] } [18:41:23.373] } [18:41:23.373] } [18:41:23.373] })) [18:41:23.373] }, error = function(ex) { [18:41:23.373] base::structure(base::list(value = NULL, visible = NULL, [18:41:23.373] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:23.373] ...future.rng), started = ...future.startTime, [18:41:23.373] finished = Sys.time(), session_uuid = NA_character_, [18:41:23.373] version = "1.8"), class = "FutureResult") [18:41:23.373] }, finally = { [18:41:23.373] if (!identical(...future.workdir, getwd())) [18:41:23.373] setwd(...future.workdir) [18:41:23.373] { [18:41:23.373] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:23.373] ...future.oldOptions$nwarnings <- NULL [18:41:23.373] } [18:41:23.373] base::options(...future.oldOptions) [18:41:23.373] if (.Platform$OS.type == "windows") { [18:41:23.373] old_names <- names(...future.oldEnvVars) [18:41:23.373] envs <- base::Sys.getenv() [18:41:23.373] names <- names(envs) [18:41:23.373] common <- intersect(names, old_names) [18:41:23.373] added <- setdiff(names, old_names) [18:41:23.373] removed <- setdiff(old_names, names) [18:41:23.373] changed <- common[...future.oldEnvVars[common] != [18:41:23.373] envs[common]] [18:41:23.373] NAMES <- toupper(changed) [18:41:23.373] args <- list() [18:41:23.373] for (kk in seq_along(NAMES)) { [18:41:23.373] name <- changed[[kk]] [18:41:23.373] NAME <- NAMES[[kk]] [18:41:23.373] if (name != NAME && is.element(NAME, old_names)) [18:41:23.373] next [18:41:23.373] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:23.373] } [18:41:23.373] NAMES <- toupper(added) [18:41:23.373] for (kk in seq_along(NAMES)) { [18:41:23.373] name <- added[[kk]] [18:41:23.373] NAME <- NAMES[[kk]] [18:41:23.373] if (name != NAME && is.element(NAME, old_names)) [18:41:23.373] next [18:41:23.373] args[[name]] <- "" [18:41:23.373] } [18:41:23.373] NAMES <- toupper(removed) [18:41:23.373] for (kk in seq_along(NAMES)) { [18:41:23.373] name <- removed[[kk]] [18:41:23.373] NAME <- NAMES[[kk]] [18:41:23.373] if (name != NAME && is.element(NAME, old_names)) [18:41:23.373] next [18:41:23.373] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:23.373] } [18:41:23.373] if (length(args) > 0) [18:41:23.373] base::do.call(base::Sys.setenv, args = args) [18:41:23.373] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:23.373] } [18:41:23.373] else { [18:41:23.373] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:23.373] } [18:41:23.373] { [18:41:23.373] if (base::length(...future.futureOptionsAdded) > [18:41:23.373] 0L) { [18:41:23.373] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:23.373] base::names(opts) <- ...future.futureOptionsAdded [18:41:23.373] base::options(opts) [18:41:23.373] } [18:41:23.373] { [18:41:23.373] { [18:41:23.373] base::options(mc.cores = ...future.mc.cores.old) [18:41:23.373] NULL [18:41:23.373] } [18:41:23.373] options(future.plan = NULL) [18:41:23.373] if (is.na(NA_character_)) [18:41:23.373] Sys.unsetenv("R_FUTURE_PLAN") [18:41:23.373] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:23.373] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:23.373] .init = FALSE) [18:41:23.373] } [18:41:23.373] } [18:41:23.373] } [18:41:23.373] }) [18:41:23.373] if (TRUE) { [18:41:23.373] base::sink(type = "output", split = FALSE) [18:41:23.373] if (TRUE) { [18:41:23.373] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:23.373] } [18:41:23.373] else { [18:41:23.373] ...future.result["stdout"] <- base::list(NULL) [18:41:23.373] } [18:41:23.373] base::close(...future.stdout) [18:41:23.373] ...future.stdout <- NULL [18:41:23.373] } [18:41:23.373] ...future.result$conditions <- ...future.conditions [18:41:23.373] ...future.result$finished <- base::Sys.time() [18:41:23.373] ...future.result [18:41:23.373] } [18:41:23.378] Exporting 5 global objects (1.17 KiB) to cluster node #1 ... [18:41:23.378] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... [18:41:23.378] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... DONE [18:41:23.379] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... [18:41:23.379] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... DONE [18:41:23.379] Exporting '...future.elements_ii' (98 bytes) to cluster node #1 ... [18:41:23.379] Exporting '...future.elements_ii' (98 bytes) to cluster node #1 ... DONE [18:41:23.380] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:23.380] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:23.380] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:23.381] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:23.381] Exporting 5 global objects (1.17 KiB) to cluster node #1 ... DONE [18:41:23.381] MultisessionFuture started [18:41:23.381] - Launch lazy future ... done [18:41:23.382] run() for 'MultisessionFuture' ... done [18:41:23.382] Created future: [18:41:23.396] receiveMessageFromWorker() for ClusterFuture ... [18:41:23.397] - Validating connection of MultisessionFuture [18:41:23.397] - received message: FutureResult [18:41:23.397] - Received FutureResult [18:41:23.397] - Erased future from FutureRegistry [18:41:23.397] result() for ClusterFuture ... [18:41:23.398] - result already collected: FutureResult [18:41:23.398] result() for ClusterFuture ... done [18:41:23.398] receiveMessageFromWorker() for ClusterFuture ... done [18:41:23.382] MultisessionFuture: [18:41:23.382] Label: 'future_lapply-3' [18:41:23.382] Expression: [18:41:23.382] { [18:41:23.382] do.call(function(...) { [18:41:23.382] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:23.382] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:23.382] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:23.382] on.exit(options(oopts), add = TRUE) [18:41:23.382] } [18:41:23.382] { [18:41:23.382] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:23.382] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:23.382] ...future.FUN(...future.X_jj, ...) [18:41:23.382] }) [18:41:23.382] } [18:41:23.382] }, args = future.call.arguments) [18:41:23.382] } [18:41:23.382] Lazy evaluation: FALSE [18:41:23.382] Asynchronous evaluation: TRUE [18:41:23.382] Local evaluation: TRUE [18:41:23.382] Environment: R_GlobalEnv [18:41:23.382] Capture standard output: TRUE [18:41:23.382] Capture condition classes: 'condition' (excluding 'nothing') [18:41:23.382] Globals: 5 objects totaling 760 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 98 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:23.382] Packages: [18:41:23.382] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:23.382] Resolved: TRUE [18:41:23.382] Value: [18:41:23.382] Conditions captured: [18:41:23.382] Early signaling: FALSE [18:41:23.382] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:23.382] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:23.398] Chunk #3 of 4 ... DONE [18:41:23.399] Chunk #4 of 4 ... [18:41:23.399] - Finding globals in 'X' for chunk #4 ... [18:41:23.399] getGlobalsAndPackages() ... [18:41:23.399] Searching for globals... [18:41:23.399] [18:41:23.400] Searching for globals ... DONE [18:41:23.400] - globals: [0] [18:41:23.400] getGlobalsAndPackages() ... DONE [18:41:23.400] + additional globals found: [n=0] [18:41:23.400] + additional namespaces needed: [n=0] [18:41:23.400] - Finding globals in 'X' for chunk #4 ... DONE [18:41:23.400] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:23.401] - seeds: [18:41:23.401] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:23.401] getGlobalsAndPackages() ... [18:41:23.401] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:23.401] Resolving globals: FALSE [18:41:23.401] Tweak future expression to call with '...' arguments ... [18:41:23.402] { [18:41:23.402] do.call(function(...) { [18:41:23.402] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:23.402] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:23.402] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:23.402] on.exit(options(oopts), add = TRUE) [18:41:23.402] } [18:41:23.402] { [18:41:23.402] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:23.402] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:23.402] ...future.FUN(...future.X_jj, ...) [18:41:23.402] }) [18:41:23.402] } [18:41:23.402] }, args = future.call.arguments) [18:41:23.402] } [18:41:23.402] Tweak future expression to call with '...' arguments ... DONE [18:41:23.403] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:23.403] [18:41:23.403] getGlobalsAndPackages() ... DONE [18:41:23.403] run() for 'Future' ... [18:41:23.403] - state: 'created' [18:41:23.404] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:23.418] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:23.419] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:23.419] - Field: 'node' [18:41:23.419] - Field: 'label' [18:41:23.419] - Field: 'local' [18:41:23.419] - Field: 'owner' [18:41:23.420] - Field: 'envir' [18:41:23.420] - Field: 'workers' [18:41:23.420] - Field: 'packages' [18:41:23.420] - Field: 'gc' [18:41:23.420] - Field: 'conditions' [18:41:23.420] - Field: 'persistent' [18:41:23.421] - Field: 'expr' [18:41:23.421] - Field: 'uuid' [18:41:23.421] - Field: 'seed' [18:41:23.421] - Field: 'version' [18:41:23.421] - Field: 'result' [18:41:23.421] - Field: 'asynchronous' [18:41:23.422] - Field: 'calls' [18:41:23.422] - Field: 'globals' [18:41:23.422] - Field: 'stdout' [18:41:23.422] - Field: 'earlySignal' [18:41:23.422] - Field: 'lazy' [18:41:23.422] - Field: 'state' [18:41:23.423] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:23.423] - Launch lazy future ... [18:41:23.423] Packages needed by the future expression (n = 0): [18:41:23.423] Packages needed by future strategies (n = 0): [18:41:23.424] { [18:41:23.424] { [18:41:23.424] { [18:41:23.424] ...future.startTime <- base::Sys.time() [18:41:23.424] { [18:41:23.424] { [18:41:23.424] { [18:41:23.424] { [18:41:23.424] base::local({ [18:41:23.424] has_future <- base::requireNamespace("future", [18:41:23.424] quietly = TRUE) [18:41:23.424] if (has_future) { [18:41:23.424] ns <- base::getNamespace("future") [18:41:23.424] version <- ns[[".package"]][["version"]] [18:41:23.424] if (is.null(version)) [18:41:23.424] version <- utils::packageVersion("future") [18:41:23.424] } [18:41:23.424] else { [18:41:23.424] version <- NULL [18:41:23.424] } [18:41:23.424] if (!has_future || version < "1.8.0") { [18:41:23.424] info <- base::c(r_version = base::gsub("R version ", [18:41:23.424] "", base::R.version$version.string), [18:41:23.424] platform = base::sprintf("%s (%s-bit)", [18:41:23.424] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:23.424] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:23.424] "release", "version")], collapse = " "), [18:41:23.424] hostname = base::Sys.info()[["nodename"]]) [18:41:23.424] info <- base::sprintf("%s: %s", base::names(info), [18:41:23.424] info) [18:41:23.424] info <- base::paste(info, collapse = "; ") [18:41:23.424] if (!has_future) { [18:41:23.424] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:23.424] info) [18:41:23.424] } [18:41:23.424] else { [18:41:23.424] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:23.424] info, version) [18:41:23.424] } [18:41:23.424] base::stop(msg) [18:41:23.424] } [18:41:23.424] }) [18:41:23.424] } [18:41:23.424] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:23.424] base::options(mc.cores = 1L) [18:41:23.424] } [18:41:23.424] ...future.strategy.old <- future::plan("list") [18:41:23.424] options(future.plan = NULL) [18:41:23.424] Sys.unsetenv("R_FUTURE_PLAN") [18:41:23.424] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:23.424] } [18:41:23.424] ...future.workdir <- getwd() [18:41:23.424] } [18:41:23.424] ...future.oldOptions <- base::as.list(base::.Options) [18:41:23.424] ...future.oldEnvVars <- base::Sys.getenv() [18:41:23.424] } [18:41:23.424] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:23.424] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:23.424] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:23.424] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:23.424] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:23.424] future.stdout.windows.reencode = NULL, width = 80L) [18:41:23.424] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:23.424] base::names(...future.oldOptions)) [18:41:23.424] } [18:41:23.424] if (FALSE) { [18:41:23.424] } [18:41:23.424] else { [18:41:23.424] if (TRUE) { [18:41:23.424] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:23.424] open = "w") [18:41:23.424] } [18:41:23.424] else { [18:41:23.424] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:23.424] windows = "NUL", "/dev/null"), open = "w") [18:41:23.424] } [18:41:23.424] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:23.424] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:23.424] base::sink(type = "output", split = FALSE) [18:41:23.424] base::close(...future.stdout) [18:41:23.424] }, add = TRUE) [18:41:23.424] } [18:41:23.424] ...future.frame <- base::sys.nframe() [18:41:23.424] ...future.conditions <- base::list() [18:41:23.424] ...future.rng <- base::globalenv()$.Random.seed [18:41:23.424] if (FALSE) { [18:41:23.424] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:23.424] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:23.424] } [18:41:23.424] ...future.result <- base::tryCatch({ [18:41:23.424] base::withCallingHandlers({ [18:41:23.424] ...future.value <- base::withVisible(base::local({ [18:41:23.424] ...future.makeSendCondition <- base::local({ [18:41:23.424] sendCondition <- NULL [18:41:23.424] function(frame = 1L) { [18:41:23.424] if (is.function(sendCondition)) [18:41:23.424] return(sendCondition) [18:41:23.424] ns <- getNamespace("parallel") [18:41:23.424] if (exists("sendData", mode = "function", [18:41:23.424] envir = ns)) { [18:41:23.424] parallel_sendData <- get("sendData", mode = "function", [18:41:23.424] envir = ns) [18:41:23.424] envir <- sys.frame(frame) [18:41:23.424] master <- NULL [18:41:23.424] while (!identical(envir, .GlobalEnv) && [18:41:23.424] !identical(envir, emptyenv())) { [18:41:23.424] if (exists("master", mode = "list", envir = envir, [18:41:23.424] inherits = FALSE)) { [18:41:23.424] master <- get("master", mode = "list", [18:41:23.424] envir = envir, inherits = FALSE) [18:41:23.424] if (inherits(master, c("SOCKnode", [18:41:23.424] "SOCK0node"))) { [18:41:23.424] sendCondition <<- function(cond) { [18:41:23.424] data <- list(type = "VALUE", value = cond, [18:41:23.424] success = TRUE) [18:41:23.424] parallel_sendData(master, data) [18:41:23.424] } [18:41:23.424] return(sendCondition) [18:41:23.424] } [18:41:23.424] } [18:41:23.424] frame <- frame + 1L [18:41:23.424] envir <- sys.frame(frame) [18:41:23.424] } [18:41:23.424] } [18:41:23.424] sendCondition <<- function(cond) NULL [18:41:23.424] } [18:41:23.424] }) [18:41:23.424] withCallingHandlers({ [18:41:23.424] { [18:41:23.424] do.call(function(...) { [18:41:23.424] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:23.424] if (!identical(...future.globals.maxSize.org, [18:41:23.424] ...future.globals.maxSize)) { [18:41:23.424] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:23.424] on.exit(options(oopts), add = TRUE) [18:41:23.424] } [18:41:23.424] { [18:41:23.424] lapply(seq_along(...future.elements_ii), [18:41:23.424] FUN = function(jj) { [18:41:23.424] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:23.424] ...future.FUN(...future.X_jj, ...) [18:41:23.424] }) [18:41:23.424] } [18:41:23.424] }, args = future.call.arguments) [18:41:23.424] } [18:41:23.424] }, immediateCondition = function(cond) { [18:41:23.424] sendCondition <- ...future.makeSendCondition() [18:41:23.424] sendCondition(cond) [18:41:23.424] muffleCondition <- function (cond, pattern = "^muffle") [18:41:23.424] { [18:41:23.424] inherits <- base::inherits [18:41:23.424] invokeRestart <- base::invokeRestart [18:41:23.424] is.null <- base::is.null [18:41:23.424] muffled <- FALSE [18:41:23.424] if (inherits(cond, "message")) { [18:41:23.424] muffled <- grepl(pattern, "muffleMessage") [18:41:23.424] if (muffled) [18:41:23.424] invokeRestart("muffleMessage") [18:41:23.424] } [18:41:23.424] else if (inherits(cond, "warning")) { [18:41:23.424] muffled <- grepl(pattern, "muffleWarning") [18:41:23.424] if (muffled) [18:41:23.424] invokeRestart("muffleWarning") [18:41:23.424] } [18:41:23.424] else if (inherits(cond, "condition")) { [18:41:23.424] if (!is.null(pattern)) { [18:41:23.424] computeRestarts <- base::computeRestarts [18:41:23.424] grepl <- base::grepl [18:41:23.424] restarts <- computeRestarts(cond) [18:41:23.424] for (restart in restarts) { [18:41:23.424] name <- restart$name [18:41:23.424] if (is.null(name)) [18:41:23.424] next [18:41:23.424] if (!grepl(pattern, name)) [18:41:23.424] next [18:41:23.424] invokeRestart(restart) [18:41:23.424] muffled <- TRUE [18:41:23.424] break [18:41:23.424] } [18:41:23.424] } [18:41:23.424] } [18:41:23.424] invisible(muffled) [18:41:23.424] } [18:41:23.424] muffleCondition(cond) [18:41:23.424] }) [18:41:23.424] })) [18:41:23.424] future::FutureResult(value = ...future.value$value, [18:41:23.424] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:23.424] ...future.rng), globalenv = if (FALSE) [18:41:23.424] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:23.424] ...future.globalenv.names)) [18:41:23.424] else NULL, started = ...future.startTime, version = "1.8") [18:41:23.424] }, condition = base::local({ [18:41:23.424] c <- base::c [18:41:23.424] inherits <- base::inherits [18:41:23.424] invokeRestart <- base::invokeRestart [18:41:23.424] length <- base::length [18:41:23.424] list <- base::list [18:41:23.424] seq.int <- base::seq.int [18:41:23.424] signalCondition <- base::signalCondition [18:41:23.424] sys.calls <- base::sys.calls [18:41:23.424] `[[` <- base::`[[` [18:41:23.424] `+` <- base::`+` [18:41:23.424] `<<-` <- base::`<<-` [18:41:23.424] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:23.424] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:23.424] 3L)] [18:41:23.424] } [18:41:23.424] function(cond) { [18:41:23.424] is_error <- inherits(cond, "error") [18:41:23.424] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:23.424] NULL) [18:41:23.424] if (is_error) { [18:41:23.424] sessionInformation <- function() { [18:41:23.424] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:23.424] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:23.424] search = base::search(), system = base::Sys.info()) [18:41:23.424] } [18:41:23.424] ...future.conditions[[length(...future.conditions) + [18:41:23.424] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:23.424] cond$call), session = sessionInformation(), [18:41:23.424] timestamp = base::Sys.time(), signaled = 0L) [18:41:23.424] signalCondition(cond) [18:41:23.424] } [18:41:23.424] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:23.424] "immediateCondition"))) { [18:41:23.424] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:23.424] ...future.conditions[[length(...future.conditions) + [18:41:23.424] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:23.424] if (TRUE && !signal) { [18:41:23.424] muffleCondition <- function (cond, pattern = "^muffle") [18:41:23.424] { [18:41:23.424] inherits <- base::inherits [18:41:23.424] invokeRestart <- base::invokeRestart [18:41:23.424] is.null <- base::is.null [18:41:23.424] muffled <- FALSE [18:41:23.424] if (inherits(cond, "message")) { [18:41:23.424] muffled <- grepl(pattern, "muffleMessage") [18:41:23.424] if (muffled) [18:41:23.424] invokeRestart("muffleMessage") [18:41:23.424] } [18:41:23.424] else if (inherits(cond, "warning")) { [18:41:23.424] muffled <- grepl(pattern, "muffleWarning") [18:41:23.424] if (muffled) [18:41:23.424] invokeRestart("muffleWarning") [18:41:23.424] } [18:41:23.424] else if (inherits(cond, "condition")) { [18:41:23.424] if (!is.null(pattern)) { [18:41:23.424] computeRestarts <- base::computeRestarts [18:41:23.424] grepl <- base::grepl [18:41:23.424] restarts <- computeRestarts(cond) [18:41:23.424] for (restart in restarts) { [18:41:23.424] name <- restart$name [18:41:23.424] if (is.null(name)) [18:41:23.424] next [18:41:23.424] if (!grepl(pattern, name)) [18:41:23.424] next [18:41:23.424] invokeRestart(restart) [18:41:23.424] muffled <- TRUE [18:41:23.424] break [18:41:23.424] } [18:41:23.424] } [18:41:23.424] } [18:41:23.424] invisible(muffled) [18:41:23.424] } [18:41:23.424] muffleCondition(cond, pattern = "^muffle") [18:41:23.424] } [18:41:23.424] } [18:41:23.424] else { [18:41:23.424] if (TRUE) { [18:41:23.424] muffleCondition <- function (cond, pattern = "^muffle") [18:41:23.424] { [18:41:23.424] inherits <- base::inherits [18:41:23.424] invokeRestart <- base::invokeRestart [18:41:23.424] is.null <- base::is.null [18:41:23.424] muffled <- FALSE [18:41:23.424] if (inherits(cond, "message")) { [18:41:23.424] muffled <- grepl(pattern, "muffleMessage") [18:41:23.424] if (muffled) [18:41:23.424] invokeRestart("muffleMessage") [18:41:23.424] } [18:41:23.424] else if (inherits(cond, "warning")) { [18:41:23.424] muffled <- grepl(pattern, "muffleWarning") [18:41:23.424] if (muffled) [18:41:23.424] invokeRestart("muffleWarning") [18:41:23.424] } [18:41:23.424] else if (inherits(cond, "condition")) { [18:41:23.424] if (!is.null(pattern)) { [18:41:23.424] computeRestarts <- base::computeRestarts [18:41:23.424] grepl <- base::grepl [18:41:23.424] restarts <- computeRestarts(cond) [18:41:23.424] for (restart in restarts) { [18:41:23.424] name <- restart$name [18:41:23.424] if (is.null(name)) [18:41:23.424] next [18:41:23.424] if (!grepl(pattern, name)) [18:41:23.424] next [18:41:23.424] invokeRestart(restart) [18:41:23.424] muffled <- TRUE [18:41:23.424] break [18:41:23.424] } [18:41:23.424] } [18:41:23.424] } [18:41:23.424] invisible(muffled) [18:41:23.424] } [18:41:23.424] muffleCondition(cond, pattern = "^muffle") [18:41:23.424] } [18:41:23.424] } [18:41:23.424] } [18:41:23.424] })) [18:41:23.424] }, error = function(ex) { [18:41:23.424] base::structure(base::list(value = NULL, visible = NULL, [18:41:23.424] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:23.424] ...future.rng), started = ...future.startTime, [18:41:23.424] finished = Sys.time(), session_uuid = NA_character_, [18:41:23.424] version = "1.8"), class = "FutureResult") [18:41:23.424] }, finally = { [18:41:23.424] if (!identical(...future.workdir, getwd())) [18:41:23.424] setwd(...future.workdir) [18:41:23.424] { [18:41:23.424] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:23.424] ...future.oldOptions$nwarnings <- NULL [18:41:23.424] } [18:41:23.424] base::options(...future.oldOptions) [18:41:23.424] if (.Platform$OS.type == "windows") { [18:41:23.424] old_names <- names(...future.oldEnvVars) [18:41:23.424] envs <- base::Sys.getenv() [18:41:23.424] names <- names(envs) [18:41:23.424] common <- intersect(names, old_names) [18:41:23.424] added <- setdiff(names, old_names) [18:41:23.424] removed <- setdiff(old_names, names) [18:41:23.424] changed <- common[...future.oldEnvVars[common] != [18:41:23.424] envs[common]] [18:41:23.424] NAMES <- toupper(changed) [18:41:23.424] args <- list() [18:41:23.424] for (kk in seq_along(NAMES)) { [18:41:23.424] name <- changed[[kk]] [18:41:23.424] NAME <- NAMES[[kk]] [18:41:23.424] if (name != NAME && is.element(NAME, old_names)) [18:41:23.424] next [18:41:23.424] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:23.424] } [18:41:23.424] NAMES <- toupper(added) [18:41:23.424] for (kk in seq_along(NAMES)) { [18:41:23.424] name <- added[[kk]] [18:41:23.424] NAME <- NAMES[[kk]] [18:41:23.424] if (name != NAME && is.element(NAME, old_names)) [18:41:23.424] next [18:41:23.424] args[[name]] <- "" [18:41:23.424] } [18:41:23.424] NAMES <- toupper(removed) [18:41:23.424] for (kk in seq_along(NAMES)) { [18:41:23.424] name <- removed[[kk]] [18:41:23.424] NAME <- NAMES[[kk]] [18:41:23.424] if (name != NAME && is.element(NAME, old_names)) [18:41:23.424] next [18:41:23.424] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:23.424] } [18:41:23.424] if (length(args) > 0) [18:41:23.424] base::do.call(base::Sys.setenv, args = args) [18:41:23.424] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:23.424] } [18:41:23.424] else { [18:41:23.424] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:23.424] } [18:41:23.424] { [18:41:23.424] if (base::length(...future.futureOptionsAdded) > [18:41:23.424] 0L) { [18:41:23.424] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:23.424] base::names(opts) <- ...future.futureOptionsAdded [18:41:23.424] base::options(opts) [18:41:23.424] } [18:41:23.424] { [18:41:23.424] { [18:41:23.424] base::options(mc.cores = ...future.mc.cores.old) [18:41:23.424] NULL [18:41:23.424] } [18:41:23.424] options(future.plan = NULL) [18:41:23.424] if (is.na(NA_character_)) [18:41:23.424] Sys.unsetenv("R_FUTURE_PLAN") [18:41:23.424] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:23.424] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:23.424] .init = FALSE) [18:41:23.424] } [18:41:23.424] } [18:41:23.424] } [18:41:23.424] }) [18:41:23.424] if (TRUE) { [18:41:23.424] base::sink(type = "output", split = FALSE) [18:41:23.424] if (TRUE) { [18:41:23.424] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:23.424] } [18:41:23.424] else { [18:41:23.424] ...future.result["stdout"] <- base::list(NULL) [18:41:23.424] } [18:41:23.424] base::close(...future.stdout) [18:41:23.424] ...future.stdout <- NULL [18:41:23.424] } [18:41:23.424] ...future.result$conditions <- ...future.conditions [18:41:23.424] ...future.result$finished <- base::Sys.time() [18:41:23.424] ...future.result [18:41:23.424] } [18:41:23.429] Exporting 5 global objects (1.16 KiB) to cluster node #1 ... [18:41:23.429] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... [18:41:23.430] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... DONE [18:41:23.430] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... [18:41:23.430] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... DONE [18:41:23.430] Exporting '...future.elements_ii' (93 bytes) to cluster node #1 ... [18:41:23.431] Exporting '...future.elements_ii' (93 bytes) to cluster node #1 ... DONE [18:41:23.431] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:23.431] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:23.432] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:23.432] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:23.432] Exporting 5 global objects (1.16 KiB) to cluster node #1 ... DONE [18:41:23.433] MultisessionFuture started [18:41:23.433] - Launch lazy future ... done [18:41:23.433] run() for 'MultisessionFuture' ... done [18:41:23.433] Created future: [18:41:23.447] receiveMessageFromWorker() for ClusterFuture ... [18:41:23.447] - Validating connection of MultisessionFuture [18:41:23.448] - received message: FutureResult [18:41:23.448] - Received FutureResult [18:41:23.448] - Erased future from FutureRegistry [18:41:23.448] result() for ClusterFuture ... [18:41:23.448] - result already collected: FutureResult [18:41:23.448] result() for ClusterFuture ... done [18:41:23.449] receiveMessageFromWorker() for ClusterFuture ... done [18:41:23.433] MultisessionFuture: [18:41:23.433] Label: 'future_lapply-4' [18:41:23.433] Expression: [18:41:23.433] { [18:41:23.433] do.call(function(...) { [18:41:23.433] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:23.433] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:23.433] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:23.433] on.exit(options(oopts), add = TRUE) [18:41:23.433] } [18:41:23.433] { [18:41:23.433] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:23.433] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:23.433] ...future.FUN(...future.X_jj, ...) [18:41:23.433] }) [18:41:23.433] } [18:41:23.433] }, args = future.call.arguments) [18:41:23.433] } [18:41:23.433] Lazy evaluation: FALSE [18:41:23.433] Asynchronous evaluation: TRUE [18:41:23.433] Local evaluation: TRUE [18:41:23.433] Environment: R_GlobalEnv [18:41:23.433] Capture standard output: TRUE [18:41:23.433] Capture condition classes: 'condition' (excluding 'nothing') [18:41:23.433] Globals: 5 objects totaling 755 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 93 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:23.433] Packages: [18:41:23.433] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:23.433] Resolved: TRUE [18:41:23.433] Value: [18:41:23.433] Conditions captured: [18:41:23.433] Early signaling: FALSE [18:41:23.433] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:23.433] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:23.449] Chunk #4 of 4 ... DONE [18:41:23.449] Launching 4 futures (chunks) ... DONE [18:41:23.449] Resolving 4 futures (chunks) ... [18:41:23.449] resolve() on list ... [18:41:23.450] recursive: 0 [18:41:23.450] length: 4 [18:41:23.450] [18:41:23.450] Future #1 [18:41:23.450] result() for ClusterFuture ... [18:41:23.450] - result already collected: FutureResult [18:41:23.451] result() for ClusterFuture ... done [18:41:23.451] result() for ClusterFuture ... [18:41:23.451] - result already collected: FutureResult [18:41:23.451] result() for ClusterFuture ... done [18:41:23.451] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:23.451] - nx: 4 [18:41:23.452] - relay: TRUE [18:41:23.452] - stdout: TRUE [18:41:23.452] - signal: TRUE [18:41:23.452] - resignal: FALSE [18:41:23.452] - force: TRUE [18:41:23.452] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [18:41:23.452] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:41:23.453] - until=1 [18:41:23.453] - relaying element #1 [18:41:23.453] result() for ClusterFuture ... [18:41:23.453] - result already collected: FutureResult [18:41:23.453] result() for ClusterFuture ... done [18:41:23.453] result() for ClusterFuture ... [18:41:23.454] - result already collected: FutureResult [18:41:23.454] result() for ClusterFuture ... done [18:41:23.454] result() for ClusterFuture ... [18:41:23.454] - result already collected: FutureResult [18:41:23.454] result() for ClusterFuture ... done [18:41:23.454] result() for ClusterFuture ... [18:41:23.454] - result already collected: FutureResult [18:41:23.455] result() for ClusterFuture ... done [18:41:23.455] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:23.455] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:23.455] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:23.455] length: 3 (resolved future 1) [18:41:23.455] Future #2 [18:41:23.456] result() for ClusterFuture ... [18:41:23.456] - result already collected: FutureResult [18:41:23.456] result() for ClusterFuture ... done [18:41:23.456] result() for ClusterFuture ... [18:41:23.456] - result already collected: FutureResult [18:41:23.456] result() for ClusterFuture ... done [18:41:23.457] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:23.457] - nx: 4 [18:41:23.457] - relay: TRUE [18:41:23.457] - stdout: TRUE [18:41:23.457] - signal: TRUE [18:41:23.457] - resignal: FALSE [18:41:23.457] - force: TRUE [18:41:23.458] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:23.458] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:23.458] - until=2 [18:41:23.458] - relaying element #2 [18:41:23.458] result() for ClusterFuture ... [18:41:23.458] - result already collected: FutureResult [18:41:23.459] result() for ClusterFuture ... done [18:41:23.459] result() for ClusterFuture ... [18:41:23.459] - result already collected: FutureResult [18:41:23.459] result() for ClusterFuture ... done [18:41:23.459] result() for ClusterFuture ... [18:41:23.459] - result already collected: FutureResult [18:41:23.460] result() for ClusterFuture ... done [18:41:23.460] result() for ClusterFuture ... [18:41:23.460] - result already collected: FutureResult [18:41:23.460] result() for ClusterFuture ... done [18:41:23.460] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:23.460] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:23.460] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:23.461] length: 2 (resolved future 2) [18:41:23.461] Future #3 [18:41:23.461] result() for ClusterFuture ... [18:41:23.461] - result already collected: FutureResult [18:41:23.461] result() for ClusterFuture ... done [18:41:23.461] result() for ClusterFuture ... [18:41:23.462] - result already collected: FutureResult [18:41:23.462] result() for ClusterFuture ... done [18:41:23.462] signalConditionsASAP(MultisessionFuture, pos=3) ... [18:41:23.462] - nx: 4 [18:41:23.462] - relay: TRUE [18:41:23.462] - stdout: TRUE [18:41:23.463] - signal: TRUE [18:41:23.463] - resignal: FALSE [18:41:23.463] - force: TRUE [18:41:23.463] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:23.463] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:23.463] - until=3 [18:41:23.463] - relaying element #3 [18:41:23.464] result() for ClusterFuture ... [18:41:23.464] - result already collected: FutureResult [18:41:23.464] result() for ClusterFuture ... done [18:41:23.464] result() for ClusterFuture ... [18:41:23.464] - result already collected: FutureResult [18:41:23.464] result() for ClusterFuture ... done [18:41:23.465] result() for ClusterFuture ... [18:41:23.465] - result already collected: FutureResult [18:41:23.465] result() for ClusterFuture ... done [18:41:23.465] result() for ClusterFuture ... [18:41:23.465] - result already collected: FutureResult [18:41:23.465] result() for ClusterFuture ... done [18:41:23.465] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:23.466] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:23.466] signalConditionsASAP(MultisessionFuture, pos=3) ... done [18:41:23.466] length: 1 (resolved future 3) [18:41:23.466] Future #4 [18:41:23.466] result() for ClusterFuture ... [18:41:23.466] - result already collected: FutureResult [18:41:23.467] result() for ClusterFuture ... done [18:41:23.467] result() for ClusterFuture ... [18:41:23.467] - result already collected: FutureResult [18:41:23.467] result() for ClusterFuture ... done [18:41:23.467] signalConditionsASAP(MultisessionFuture, pos=4) ... [18:41:23.467] - nx: 4 [18:41:23.468] - relay: TRUE [18:41:23.468] - stdout: TRUE [18:41:23.468] - signal: TRUE [18:41:23.468] - resignal: FALSE [18:41:23.468] - force: TRUE [18:41:23.468] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:23.468] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:23.469] - until=4 [18:41:23.469] - relaying element #4 [18:41:23.469] result() for ClusterFuture ... [18:41:23.469] - result already collected: FutureResult [18:41:23.469] result() for ClusterFuture ... done [18:41:23.469] result() for ClusterFuture ... [18:41:23.469] - result already collected: FutureResult [18:41:23.470] result() for ClusterFuture ... done [18:41:23.470] result() for ClusterFuture ... [18:41:23.470] - result already collected: FutureResult [18:41:23.470] result() for ClusterFuture ... done [18:41:23.470] result() for ClusterFuture ... [18:41:23.470] - result already collected: FutureResult [18:41:23.471] result() for ClusterFuture ... done [18:41:23.471] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:23.471] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:23.471] signalConditionsASAP(MultisessionFuture, pos=4) ... done [18:41:23.471] length: 0 (resolved future 4) [18:41:23.471] Relaying remaining futures [18:41:23.472] signalConditionsASAP(NULL, pos=0) ... [18:41:23.472] - nx: 4 [18:41:23.472] - relay: TRUE [18:41:23.472] - stdout: TRUE [18:41:23.472] - signal: TRUE [18:41:23.472] - resignal: FALSE [18:41:23.472] - force: TRUE [18:41:23.473] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:23.473] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [18:41:23.473] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:23.473] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:23.473] signalConditionsASAP(NULL, pos=0) ... done [18:41:23.473] resolve() on list ... DONE [18:41:23.474] result() for ClusterFuture ... [18:41:23.474] - result already collected: FutureResult [18:41:23.474] result() for ClusterFuture ... done [18:41:23.474] result() for ClusterFuture ... [18:41:23.474] - result already collected: FutureResult [18:41:23.474] result() for ClusterFuture ... done [18:41:23.475] result() for ClusterFuture ... [18:41:23.475] - result already collected: FutureResult [18:41:23.475] result() for ClusterFuture ... done [18:41:23.475] result() for ClusterFuture ... [18:41:23.475] - result already collected: FutureResult [18:41:23.475] result() for ClusterFuture ... done [18:41:23.475] result() for ClusterFuture ... [18:41:23.476] - result already collected: FutureResult [18:41:23.476] result() for ClusterFuture ... done [18:41:23.476] result() for ClusterFuture ... [18:41:23.476] - result already collected: FutureResult [18:41:23.476] result() for ClusterFuture ... done [18:41:23.476] result() for ClusterFuture ... [18:41:23.477] - result already collected: FutureResult [18:41:23.477] result() for ClusterFuture ... done [18:41:23.477] result() for ClusterFuture ... [18:41:23.477] - result already collected: FutureResult [18:41:23.477] result() for ClusterFuture ... done [18:41:23.477] - Number of value chunks collected: 4 [18:41:23.477] Resolving 4 futures (chunks) ... DONE [18:41:23.478] Reducing values from 4 chunks ... [18:41:23.478] - Number of values collected after concatenation: 4 [18:41:23.478] - Number of values expected: 4 [18:41:23.478] Reducing values from 4 chunks ... DONE [18:41:23.478] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL - future_lapply(x, FUN = base::vector, ...) ... [18:41:23.481] future_lapply() ... [18:41:23.484] Number of chunks: 4 [18:41:23.484] getGlobalsAndPackagesXApply() ... [18:41:23.484] - future.globals: TRUE [18:41:23.484] getGlobalsAndPackages() ... [18:41:23.485] Searching for globals... [18:41:23.488] - globals found: [2] 'FUN', '.Internal' [18:41:23.488] Searching for globals ... DONE [18:41:23.489] Resolving globals: FALSE [18:41:23.489] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:23.490] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:23.490] - globals: [1] 'FUN' [18:41:23.490] [18:41:23.490] getGlobalsAndPackages() ... DONE [18:41:23.490] - globals found/used: [n=1] 'FUN' [18:41:23.490] - needed namespaces: [n=0] [18:41:23.491] Finding globals ... DONE [18:41:23.491] - use_args: TRUE [18:41:23.491] - Getting '...' globals ... [18:41:23.491] resolve() on list ... [18:41:23.491] recursive: 0 [18:41:23.492] length: 1 [18:41:23.492] elements: '...' [18:41:23.492] length: 0 (resolved future 1) [18:41:23.492] resolve() on list ... DONE [18:41:23.492] - '...' content: [n=1] 'length' [18:41:23.492] List of 1 [18:41:23.492] $ ...:List of 1 [18:41:23.492] ..$ length: int 2 [18:41:23.492] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:23.492] - attr(*, "where")=List of 1 [18:41:23.492] ..$ ...: [18:41:23.492] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:23.492] - attr(*, "resolved")= logi TRUE [18:41:23.492] - attr(*, "total_size")= num NA [18:41:23.496] - Getting '...' globals ... DONE [18:41:23.496] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:23.496] List of 2 [18:41:23.496] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:23.496] $ ... :List of 1 [18:41:23.496] ..$ length: int 2 [18:41:23.496] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:23.496] - attr(*, "where")=List of 2 [18:41:23.496] ..$ ...future.FUN: [18:41:23.496] ..$ ... : [18:41:23.496] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:23.496] - attr(*, "resolved")= logi FALSE [18:41:23.496] - attr(*, "total_size")= int 4406 [18:41:23.500] Packages to be attached in all futures: [n=0] [18:41:23.500] getGlobalsAndPackagesXApply() ... DONE [18:41:23.500] Number of futures (= number of chunks): 4 [18:41:23.500] Launching 4 futures (chunks) ... [18:41:23.501] Chunk #1 of 4 ... [18:41:23.501] - Finding globals in 'X' for chunk #1 ... [18:41:23.501] getGlobalsAndPackages() ... [18:41:23.501] Searching for globals... [18:41:23.501] [18:41:23.502] Searching for globals ... DONE [18:41:23.502] - globals: [0] [18:41:23.502] getGlobalsAndPackages() ... DONE [18:41:23.502] + additional globals found: [n=0] [18:41:23.502] + additional namespaces needed: [n=0] [18:41:23.503] - Finding globals in 'X' for chunk #1 ... DONE [18:41:23.503] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:23.503] - seeds: [18:41:23.503] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:23.503] getGlobalsAndPackages() ... [18:41:23.503] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:23.504] Resolving globals: FALSE [18:41:23.504] Tweak future expression to call with '...' arguments ... [18:41:23.504] { [18:41:23.504] do.call(function(...) { [18:41:23.504] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:23.504] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:23.504] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:23.504] on.exit(options(oopts), add = TRUE) [18:41:23.504] } [18:41:23.504] { [18:41:23.504] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:23.504] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:23.504] ...future.FUN(...future.X_jj, ...) [18:41:23.504] }) [18:41:23.504] } [18:41:23.504] }, args = future.call.arguments) [18:41:23.504] } [18:41:23.505] Tweak future expression to call with '...' arguments ... DONE [18:41:23.505] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:23.505] [18:41:23.505] getGlobalsAndPackages() ... DONE [18:41:23.506] run() for 'Future' ... [18:41:23.506] - state: 'created' [18:41:23.506] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:23.521] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:23.521] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:23.521] - Field: 'node' [18:41:23.522] - Field: 'label' [18:41:23.522] - Field: 'local' [18:41:23.522] - Field: 'owner' [18:41:23.522] - Field: 'envir' [18:41:23.522] - Field: 'workers' [18:41:23.522] - Field: 'packages' [18:41:23.523] - Field: 'gc' [18:41:23.523] - Field: 'conditions' [18:41:23.523] - Field: 'persistent' [18:41:23.523] - Field: 'expr' [18:41:23.523] - Field: 'uuid' [18:41:23.524] - Field: 'seed' [18:41:23.524] - Field: 'version' [18:41:23.524] - Field: 'result' [18:41:23.524] - Field: 'asynchronous' [18:41:23.524] - Field: 'calls' [18:41:23.524] - Field: 'globals' [18:41:23.525] - Field: 'stdout' [18:41:23.525] - Field: 'earlySignal' [18:41:23.525] - Field: 'lazy' [18:41:23.525] - Field: 'state' [18:41:23.525] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:23.525] - Launch lazy future ... [18:41:23.526] Packages needed by the future expression (n = 0): [18:41:23.526] Packages needed by future strategies (n = 0): [18:41:23.526] { [18:41:23.526] { [18:41:23.526] { [18:41:23.526] ...future.startTime <- base::Sys.time() [18:41:23.526] { [18:41:23.526] { [18:41:23.526] { [18:41:23.526] { [18:41:23.526] base::local({ [18:41:23.526] has_future <- base::requireNamespace("future", [18:41:23.526] quietly = TRUE) [18:41:23.526] if (has_future) { [18:41:23.526] ns <- base::getNamespace("future") [18:41:23.526] version <- ns[[".package"]][["version"]] [18:41:23.526] if (is.null(version)) [18:41:23.526] version <- utils::packageVersion("future") [18:41:23.526] } [18:41:23.526] else { [18:41:23.526] version <- NULL [18:41:23.526] } [18:41:23.526] if (!has_future || version < "1.8.0") { [18:41:23.526] info <- base::c(r_version = base::gsub("R version ", [18:41:23.526] "", base::R.version$version.string), [18:41:23.526] platform = base::sprintf("%s (%s-bit)", [18:41:23.526] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:23.526] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:23.526] "release", "version")], collapse = " "), [18:41:23.526] hostname = base::Sys.info()[["nodename"]]) [18:41:23.526] info <- base::sprintf("%s: %s", base::names(info), [18:41:23.526] info) [18:41:23.526] info <- base::paste(info, collapse = "; ") [18:41:23.526] if (!has_future) { [18:41:23.526] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:23.526] info) [18:41:23.526] } [18:41:23.526] else { [18:41:23.526] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:23.526] info, version) [18:41:23.526] } [18:41:23.526] base::stop(msg) [18:41:23.526] } [18:41:23.526] }) [18:41:23.526] } [18:41:23.526] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:23.526] base::options(mc.cores = 1L) [18:41:23.526] } [18:41:23.526] ...future.strategy.old <- future::plan("list") [18:41:23.526] options(future.plan = NULL) [18:41:23.526] Sys.unsetenv("R_FUTURE_PLAN") [18:41:23.526] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:23.526] } [18:41:23.526] ...future.workdir <- getwd() [18:41:23.526] } [18:41:23.526] ...future.oldOptions <- base::as.list(base::.Options) [18:41:23.526] ...future.oldEnvVars <- base::Sys.getenv() [18:41:23.526] } [18:41:23.526] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:23.526] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:23.526] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:23.526] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:23.526] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:23.526] future.stdout.windows.reencode = NULL, width = 80L) [18:41:23.526] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:23.526] base::names(...future.oldOptions)) [18:41:23.526] } [18:41:23.526] if (FALSE) { [18:41:23.526] } [18:41:23.526] else { [18:41:23.526] if (TRUE) { [18:41:23.526] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:23.526] open = "w") [18:41:23.526] } [18:41:23.526] else { [18:41:23.526] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:23.526] windows = "NUL", "/dev/null"), open = "w") [18:41:23.526] } [18:41:23.526] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:23.526] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:23.526] base::sink(type = "output", split = FALSE) [18:41:23.526] base::close(...future.stdout) [18:41:23.526] }, add = TRUE) [18:41:23.526] } [18:41:23.526] ...future.frame <- base::sys.nframe() [18:41:23.526] ...future.conditions <- base::list() [18:41:23.526] ...future.rng <- base::globalenv()$.Random.seed [18:41:23.526] if (FALSE) { [18:41:23.526] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:23.526] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:23.526] } [18:41:23.526] ...future.result <- base::tryCatch({ [18:41:23.526] base::withCallingHandlers({ [18:41:23.526] ...future.value <- base::withVisible(base::local({ [18:41:23.526] ...future.makeSendCondition <- base::local({ [18:41:23.526] sendCondition <- NULL [18:41:23.526] function(frame = 1L) { [18:41:23.526] if (is.function(sendCondition)) [18:41:23.526] return(sendCondition) [18:41:23.526] ns <- getNamespace("parallel") [18:41:23.526] if (exists("sendData", mode = "function", [18:41:23.526] envir = ns)) { [18:41:23.526] parallel_sendData <- get("sendData", mode = "function", [18:41:23.526] envir = ns) [18:41:23.526] envir <- sys.frame(frame) [18:41:23.526] master <- NULL [18:41:23.526] while (!identical(envir, .GlobalEnv) && [18:41:23.526] !identical(envir, emptyenv())) { [18:41:23.526] if (exists("master", mode = "list", envir = envir, [18:41:23.526] inherits = FALSE)) { [18:41:23.526] master <- get("master", mode = "list", [18:41:23.526] envir = envir, inherits = FALSE) [18:41:23.526] if (inherits(master, c("SOCKnode", [18:41:23.526] "SOCK0node"))) { [18:41:23.526] sendCondition <<- function(cond) { [18:41:23.526] data <- list(type = "VALUE", value = cond, [18:41:23.526] success = TRUE) [18:41:23.526] parallel_sendData(master, data) [18:41:23.526] } [18:41:23.526] return(sendCondition) [18:41:23.526] } [18:41:23.526] } [18:41:23.526] frame <- frame + 1L [18:41:23.526] envir <- sys.frame(frame) [18:41:23.526] } [18:41:23.526] } [18:41:23.526] sendCondition <<- function(cond) NULL [18:41:23.526] } [18:41:23.526] }) [18:41:23.526] withCallingHandlers({ [18:41:23.526] { [18:41:23.526] do.call(function(...) { [18:41:23.526] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:23.526] if (!identical(...future.globals.maxSize.org, [18:41:23.526] ...future.globals.maxSize)) { [18:41:23.526] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:23.526] on.exit(options(oopts), add = TRUE) [18:41:23.526] } [18:41:23.526] { [18:41:23.526] lapply(seq_along(...future.elements_ii), [18:41:23.526] FUN = function(jj) { [18:41:23.526] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:23.526] ...future.FUN(...future.X_jj, ...) [18:41:23.526] }) [18:41:23.526] } [18:41:23.526] }, args = future.call.arguments) [18:41:23.526] } [18:41:23.526] }, immediateCondition = function(cond) { [18:41:23.526] sendCondition <- ...future.makeSendCondition() [18:41:23.526] sendCondition(cond) [18:41:23.526] muffleCondition <- function (cond, pattern = "^muffle") [18:41:23.526] { [18:41:23.526] inherits <- base::inherits [18:41:23.526] invokeRestart <- base::invokeRestart [18:41:23.526] is.null <- base::is.null [18:41:23.526] muffled <- FALSE [18:41:23.526] if (inherits(cond, "message")) { [18:41:23.526] muffled <- grepl(pattern, "muffleMessage") [18:41:23.526] if (muffled) [18:41:23.526] invokeRestart("muffleMessage") [18:41:23.526] } [18:41:23.526] else if (inherits(cond, "warning")) { [18:41:23.526] muffled <- grepl(pattern, "muffleWarning") [18:41:23.526] if (muffled) [18:41:23.526] invokeRestart("muffleWarning") [18:41:23.526] } [18:41:23.526] else if (inherits(cond, "condition")) { [18:41:23.526] if (!is.null(pattern)) { [18:41:23.526] computeRestarts <- base::computeRestarts [18:41:23.526] grepl <- base::grepl [18:41:23.526] restarts <- computeRestarts(cond) [18:41:23.526] for (restart in restarts) { [18:41:23.526] name <- restart$name [18:41:23.526] if (is.null(name)) [18:41:23.526] next [18:41:23.526] if (!grepl(pattern, name)) [18:41:23.526] next [18:41:23.526] invokeRestart(restart) [18:41:23.526] muffled <- TRUE [18:41:23.526] break [18:41:23.526] } [18:41:23.526] } [18:41:23.526] } [18:41:23.526] invisible(muffled) [18:41:23.526] } [18:41:23.526] muffleCondition(cond) [18:41:23.526] }) [18:41:23.526] })) [18:41:23.526] future::FutureResult(value = ...future.value$value, [18:41:23.526] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:23.526] ...future.rng), globalenv = if (FALSE) [18:41:23.526] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:23.526] ...future.globalenv.names)) [18:41:23.526] else NULL, started = ...future.startTime, version = "1.8") [18:41:23.526] }, condition = base::local({ [18:41:23.526] c <- base::c [18:41:23.526] inherits <- base::inherits [18:41:23.526] invokeRestart <- base::invokeRestart [18:41:23.526] length <- base::length [18:41:23.526] list <- base::list [18:41:23.526] seq.int <- base::seq.int [18:41:23.526] signalCondition <- base::signalCondition [18:41:23.526] sys.calls <- base::sys.calls [18:41:23.526] `[[` <- base::`[[` [18:41:23.526] `+` <- base::`+` [18:41:23.526] `<<-` <- base::`<<-` [18:41:23.526] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:23.526] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:23.526] 3L)] [18:41:23.526] } [18:41:23.526] function(cond) { [18:41:23.526] is_error <- inherits(cond, "error") [18:41:23.526] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:23.526] NULL) [18:41:23.526] if (is_error) { [18:41:23.526] sessionInformation <- function() { [18:41:23.526] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:23.526] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:23.526] search = base::search(), system = base::Sys.info()) [18:41:23.526] } [18:41:23.526] ...future.conditions[[length(...future.conditions) + [18:41:23.526] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:23.526] cond$call), session = sessionInformation(), [18:41:23.526] timestamp = base::Sys.time(), signaled = 0L) [18:41:23.526] signalCondition(cond) [18:41:23.526] } [18:41:23.526] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:23.526] "immediateCondition"))) { [18:41:23.526] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:23.526] ...future.conditions[[length(...future.conditions) + [18:41:23.526] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:23.526] if (TRUE && !signal) { [18:41:23.526] muffleCondition <- function (cond, pattern = "^muffle") [18:41:23.526] { [18:41:23.526] inherits <- base::inherits [18:41:23.526] invokeRestart <- base::invokeRestart [18:41:23.526] is.null <- base::is.null [18:41:23.526] muffled <- FALSE [18:41:23.526] if (inherits(cond, "message")) { [18:41:23.526] muffled <- grepl(pattern, "muffleMessage") [18:41:23.526] if (muffled) [18:41:23.526] invokeRestart("muffleMessage") [18:41:23.526] } [18:41:23.526] else if (inherits(cond, "warning")) { [18:41:23.526] muffled <- grepl(pattern, "muffleWarning") [18:41:23.526] if (muffled) [18:41:23.526] invokeRestart("muffleWarning") [18:41:23.526] } [18:41:23.526] else if (inherits(cond, "condition")) { [18:41:23.526] if (!is.null(pattern)) { [18:41:23.526] computeRestarts <- base::computeRestarts [18:41:23.526] grepl <- base::grepl [18:41:23.526] restarts <- computeRestarts(cond) [18:41:23.526] for (restart in restarts) { [18:41:23.526] name <- restart$name [18:41:23.526] if (is.null(name)) [18:41:23.526] next [18:41:23.526] if (!grepl(pattern, name)) [18:41:23.526] next [18:41:23.526] invokeRestart(restart) [18:41:23.526] muffled <- TRUE [18:41:23.526] break [18:41:23.526] } [18:41:23.526] } [18:41:23.526] } [18:41:23.526] invisible(muffled) [18:41:23.526] } [18:41:23.526] muffleCondition(cond, pattern = "^muffle") [18:41:23.526] } [18:41:23.526] } [18:41:23.526] else { [18:41:23.526] if (TRUE) { [18:41:23.526] muffleCondition <- function (cond, pattern = "^muffle") [18:41:23.526] { [18:41:23.526] inherits <- base::inherits [18:41:23.526] invokeRestart <- base::invokeRestart [18:41:23.526] is.null <- base::is.null [18:41:23.526] muffled <- FALSE [18:41:23.526] if (inherits(cond, "message")) { [18:41:23.526] muffled <- grepl(pattern, "muffleMessage") [18:41:23.526] if (muffled) [18:41:23.526] invokeRestart("muffleMessage") [18:41:23.526] } [18:41:23.526] else if (inherits(cond, "warning")) { [18:41:23.526] muffled <- grepl(pattern, "muffleWarning") [18:41:23.526] if (muffled) [18:41:23.526] invokeRestart("muffleWarning") [18:41:23.526] } [18:41:23.526] else if (inherits(cond, "condition")) { [18:41:23.526] if (!is.null(pattern)) { [18:41:23.526] computeRestarts <- base::computeRestarts [18:41:23.526] grepl <- base::grepl [18:41:23.526] restarts <- computeRestarts(cond) [18:41:23.526] for (restart in restarts) { [18:41:23.526] name <- restart$name [18:41:23.526] if (is.null(name)) [18:41:23.526] next [18:41:23.526] if (!grepl(pattern, name)) [18:41:23.526] next [18:41:23.526] invokeRestart(restart) [18:41:23.526] muffled <- TRUE [18:41:23.526] break [18:41:23.526] } [18:41:23.526] } [18:41:23.526] } [18:41:23.526] invisible(muffled) [18:41:23.526] } [18:41:23.526] muffleCondition(cond, pattern = "^muffle") [18:41:23.526] } [18:41:23.526] } [18:41:23.526] } [18:41:23.526] })) [18:41:23.526] }, error = function(ex) { [18:41:23.526] base::structure(base::list(value = NULL, visible = NULL, [18:41:23.526] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:23.526] ...future.rng), started = ...future.startTime, [18:41:23.526] finished = Sys.time(), session_uuid = NA_character_, [18:41:23.526] version = "1.8"), class = "FutureResult") [18:41:23.526] }, finally = { [18:41:23.526] if (!identical(...future.workdir, getwd())) [18:41:23.526] setwd(...future.workdir) [18:41:23.526] { [18:41:23.526] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:23.526] ...future.oldOptions$nwarnings <- NULL [18:41:23.526] } [18:41:23.526] base::options(...future.oldOptions) [18:41:23.526] if (.Platform$OS.type == "windows") { [18:41:23.526] old_names <- names(...future.oldEnvVars) [18:41:23.526] envs <- base::Sys.getenv() [18:41:23.526] names <- names(envs) [18:41:23.526] common <- intersect(names, old_names) [18:41:23.526] added <- setdiff(names, old_names) [18:41:23.526] removed <- setdiff(old_names, names) [18:41:23.526] changed <- common[...future.oldEnvVars[common] != [18:41:23.526] envs[common]] [18:41:23.526] NAMES <- toupper(changed) [18:41:23.526] args <- list() [18:41:23.526] for (kk in seq_along(NAMES)) { [18:41:23.526] name <- changed[[kk]] [18:41:23.526] NAME <- NAMES[[kk]] [18:41:23.526] if (name != NAME && is.element(NAME, old_names)) [18:41:23.526] next [18:41:23.526] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:23.526] } [18:41:23.526] NAMES <- toupper(added) [18:41:23.526] for (kk in seq_along(NAMES)) { [18:41:23.526] name <- added[[kk]] [18:41:23.526] NAME <- NAMES[[kk]] [18:41:23.526] if (name != NAME && is.element(NAME, old_names)) [18:41:23.526] next [18:41:23.526] args[[name]] <- "" [18:41:23.526] } [18:41:23.526] NAMES <- toupper(removed) [18:41:23.526] for (kk in seq_along(NAMES)) { [18:41:23.526] name <- removed[[kk]] [18:41:23.526] NAME <- NAMES[[kk]] [18:41:23.526] if (name != NAME && is.element(NAME, old_names)) [18:41:23.526] next [18:41:23.526] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:23.526] } [18:41:23.526] if (length(args) > 0) [18:41:23.526] base::do.call(base::Sys.setenv, args = args) [18:41:23.526] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:23.526] } [18:41:23.526] else { [18:41:23.526] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:23.526] } [18:41:23.526] { [18:41:23.526] if (base::length(...future.futureOptionsAdded) > [18:41:23.526] 0L) { [18:41:23.526] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:23.526] base::names(opts) <- ...future.futureOptionsAdded [18:41:23.526] base::options(opts) [18:41:23.526] } [18:41:23.526] { [18:41:23.526] { [18:41:23.526] base::options(mc.cores = ...future.mc.cores.old) [18:41:23.526] NULL [18:41:23.526] } [18:41:23.526] options(future.plan = NULL) [18:41:23.526] if (is.na(NA_character_)) [18:41:23.526] Sys.unsetenv("R_FUTURE_PLAN") [18:41:23.526] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:23.526] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:23.526] .init = FALSE) [18:41:23.526] } [18:41:23.526] } [18:41:23.526] } [18:41:23.526] }) [18:41:23.526] if (TRUE) { [18:41:23.526] base::sink(type = "output", split = FALSE) [18:41:23.526] if (TRUE) { [18:41:23.526] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:23.526] } [18:41:23.526] else { [18:41:23.526] ...future.result["stdout"] <- base::list(NULL) [18:41:23.526] } [18:41:23.526] base::close(...future.stdout) [18:41:23.526] ...future.stdout <- NULL [18:41:23.526] } [18:41:23.526] ...future.result$conditions <- ...future.conditions [18:41:23.526] ...future.result$finished <- base::Sys.time() [18:41:23.526] ...future.result [18:41:23.526] } [18:41:23.532] Exporting 5 global objects (1.17 KiB) to cluster node #1 ... [18:41:23.532] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... [18:41:23.532] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... DONE [18:41:23.532] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... [18:41:23.533] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... DONE [18:41:23.533] Exporting '...future.elements_ii' (96 bytes) to cluster node #1 ... [18:41:23.533] Exporting '...future.elements_ii' (96 bytes) to cluster node #1 ... DONE [18:41:23.534] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:23.534] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:23.534] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:23.534] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:23.535] Exporting 5 global objects (1.17 KiB) to cluster node #1 ... DONE [18:41:23.535] MultisessionFuture started [18:41:23.535] - Launch lazy future ... done [18:41:23.535] run() for 'MultisessionFuture' ... done [18:41:23.536] Created future: [18:41:23.549] receiveMessageFromWorker() for ClusterFuture ... [18:41:23.549] - Validating connection of MultisessionFuture [18:41:23.549] - received message: FutureResult [18:41:23.549] - Received FutureResult [18:41:23.550] - Erased future from FutureRegistry [18:41:23.550] result() for ClusterFuture ... [18:41:23.550] - result already collected: FutureResult [18:41:23.550] result() for ClusterFuture ... done [18:41:23.550] receiveMessageFromWorker() for ClusterFuture ... done [18:41:23.536] MultisessionFuture: [18:41:23.536] Label: 'future_lapply-1' [18:41:23.536] Expression: [18:41:23.536] { [18:41:23.536] do.call(function(...) { [18:41:23.536] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:23.536] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:23.536] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:23.536] on.exit(options(oopts), add = TRUE) [18:41:23.536] } [18:41:23.536] { [18:41:23.536] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:23.536] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:23.536] ...future.FUN(...future.X_jj, ...) [18:41:23.536] }) [18:41:23.536] } [18:41:23.536] }, args = future.call.arguments) [18:41:23.536] } [18:41:23.536] Lazy evaluation: FALSE [18:41:23.536] Asynchronous evaluation: TRUE [18:41:23.536] Local evaluation: TRUE [18:41:23.536] Environment: R_GlobalEnv [18:41:23.536] Capture standard output: TRUE [18:41:23.536] Capture condition classes: 'condition' (excluding 'nothing') [18:41:23.536] Globals: 5 objects totaling 758 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 96 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:23.536] Packages: [18:41:23.536] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:23.536] Resolved: TRUE [18:41:23.536] Value: [18:41:23.536] Conditions captured: [18:41:23.536] Early signaling: FALSE [18:41:23.536] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:23.536] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:23.551] Chunk #1 of 4 ... DONE [18:41:23.551] Chunk #2 of 4 ... [18:41:23.551] - Finding globals in 'X' for chunk #2 ... [18:41:23.551] getGlobalsAndPackages() ... [18:41:23.551] Searching for globals... [18:41:23.552] [18:41:23.552] Searching for globals ... DONE [18:41:23.552] - globals: [0] [18:41:23.552] getGlobalsAndPackages() ... DONE [18:41:23.552] + additional globals found: [n=0] [18:41:23.552] + additional namespaces needed: [n=0] [18:41:23.553] - Finding globals in 'X' for chunk #2 ... DONE [18:41:23.553] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:23.553] - seeds: [18:41:23.553] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:23.553] getGlobalsAndPackages() ... [18:41:23.553] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:23.554] Resolving globals: FALSE [18:41:23.554] Tweak future expression to call with '...' arguments ... [18:41:23.554] { [18:41:23.554] do.call(function(...) { [18:41:23.554] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:23.554] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:23.554] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:23.554] on.exit(options(oopts), add = TRUE) [18:41:23.554] } [18:41:23.554] { [18:41:23.554] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:23.554] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:23.554] ...future.FUN(...future.X_jj, ...) [18:41:23.554] }) [18:41:23.554] } [18:41:23.554] }, args = future.call.arguments) [18:41:23.554] } [18:41:23.554] Tweak future expression to call with '...' arguments ... DONE [18:41:23.555] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:23.555] [18:41:23.555] getGlobalsAndPackages() ... DONE [18:41:23.555] run() for 'Future' ... [18:41:23.556] - state: 'created' [18:41:23.556] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:23.571] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:23.571] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:23.571] - Field: 'node' [18:41:23.571] - Field: 'label' [18:41:23.571] - Field: 'local' [18:41:23.572] - Field: 'owner' [18:41:23.572] - Field: 'envir' [18:41:23.572] - Field: 'workers' [18:41:23.572] - Field: 'packages' [18:41:23.572] - Field: 'gc' [18:41:23.572] - Field: 'conditions' [18:41:23.573] - Field: 'persistent' [18:41:23.573] - Field: 'expr' [18:41:23.573] - Field: 'uuid' [18:41:23.573] - Field: 'seed' [18:41:23.573] - Field: 'version' [18:41:23.573] - Field: 'result' [18:41:23.574] - Field: 'asynchronous' [18:41:23.574] - Field: 'calls' [18:41:23.574] - Field: 'globals' [18:41:23.574] - Field: 'stdout' [18:41:23.574] - Field: 'earlySignal' [18:41:23.574] - Field: 'lazy' [18:41:23.575] - Field: 'state' [18:41:23.575] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:23.575] - Launch lazy future ... [18:41:23.575] Packages needed by the future expression (n = 0): [18:41:23.575] Packages needed by future strategies (n = 0): [18:41:23.576] { [18:41:23.576] { [18:41:23.576] { [18:41:23.576] ...future.startTime <- base::Sys.time() [18:41:23.576] { [18:41:23.576] { [18:41:23.576] { [18:41:23.576] { [18:41:23.576] base::local({ [18:41:23.576] has_future <- base::requireNamespace("future", [18:41:23.576] quietly = TRUE) [18:41:23.576] if (has_future) { [18:41:23.576] ns <- base::getNamespace("future") [18:41:23.576] version <- ns[[".package"]][["version"]] [18:41:23.576] if (is.null(version)) [18:41:23.576] version <- utils::packageVersion("future") [18:41:23.576] } [18:41:23.576] else { [18:41:23.576] version <- NULL [18:41:23.576] } [18:41:23.576] if (!has_future || version < "1.8.0") { [18:41:23.576] info <- base::c(r_version = base::gsub("R version ", [18:41:23.576] "", base::R.version$version.string), [18:41:23.576] platform = base::sprintf("%s (%s-bit)", [18:41:23.576] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:23.576] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:23.576] "release", "version")], collapse = " "), [18:41:23.576] hostname = base::Sys.info()[["nodename"]]) [18:41:23.576] info <- base::sprintf("%s: %s", base::names(info), [18:41:23.576] info) [18:41:23.576] info <- base::paste(info, collapse = "; ") [18:41:23.576] if (!has_future) { [18:41:23.576] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:23.576] info) [18:41:23.576] } [18:41:23.576] else { [18:41:23.576] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:23.576] info, version) [18:41:23.576] } [18:41:23.576] base::stop(msg) [18:41:23.576] } [18:41:23.576] }) [18:41:23.576] } [18:41:23.576] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:23.576] base::options(mc.cores = 1L) [18:41:23.576] } [18:41:23.576] ...future.strategy.old <- future::plan("list") [18:41:23.576] options(future.plan = NULL) [18:41:23.576] Sys.unsetenv("R_FUTURE_PLAN") [18:41:23.576] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:23.576] } [18:41:23.576] ...future.workdir <- getwd() [18:41:23.576] } [18:41:23.576] ...future.oldOptions <- base::as.list(base::.Options) [18:41:23.576] ...future.oldEnvVars <- base::Sys.getenv() [18:41:23.576] } [18:41:23.576] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:23.576] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:23.576] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:23.576] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:23.576] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:23.576] future.stdout.windows.reencode = NULL, width = 80L) [18:41:23.576] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:23.576] base::names(...future.oldOptions)) [18:41:23.576] } [18:41:23.576] if (FALSE) { [18:41:23.576] } [18:41:23.576] else { [18:41:23.576] if (TRUE) { [18:41:23.576] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:23.576] open = "w") [18:41:23.576] } [18:41:23.576] else { [18:41:23.576] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:23.576] windows = "NUL", "/dev/null"), open = "w") [18:41:23.576] } [18:41:23.576] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:23.576] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:23.576] base::sink(type = "output", split = FALSE) [18:41:23.576] base::close(...future.stdout) [18:41:23.576] }, add = TRUE) [18:41:23.576] } [18:41:23.576] ...future.frame <- base::sys.nframe() [18:41:23.576] ...future.conditions <- base::list() [18:41:23.576] ...future.rng <- base::globalenv()$.Random.seed [18:41:23.576] if (FALSE) { [18:41:23.576] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:23.576] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:23.576] } [18:41:23.576] ...future.result <- base::tryCatch({ [18:41:23.576] base::withCallingHandlers({ [18:41:23.576] ...future.value <- base::withVisible(base::local({ [18:41:23.576] ...future.makeSendCondition <- base::local({ [18:41:23.576] sendCondition <- NULL [18:41:23.576] function(frame = 1L) { [18:41:23.576] if (is.function(sendCondition)) [18:41:23.576] return(sendCondition) [18:41:23.576] ns <- getNamespace("parallel") [18:41:23.576] if (exists("sendData", mode = "function", [18:41:23.576] envir = ns)) { [18:41:23.576] parallel_sendData <- get("sendData", mode = "function", [18:41:23.576] envir = ns) [18:41:23.576] envir <- sys.frame(frame) [18:41:23.576] master <- NULL [18:41:23.576] while (!identical(envir, .GlobalEnv) && [18:41:23.576] !identical(envir, emptyenv())) { [18:41:23.576] if (exists("master", mode = "list", envir = envir, [18:41:23.576] inherits = FALSE)) { [18:41:23.576] master <- get("master", mode = "list", [18:41:23.576] envir = envir, inherits = FALSE) [18:41:23.576] if (inherits(master, c("SOCKnode", [18:41:23.576] "SOCK0node"))) { [18:41:23.576] sendCondition <<- function(cond) { [18:41:23.576] data <- list(type = "VALUE", value = cond, [18:41:23.576] success = TRUE) [18:41:23.576] parallel_sendData(master, data) [18:41:23.576] } [18:41:23.576] return(sendCondition) [18:41:23.576] } [18:41:23.576] } [18:41:23.576] frame <- frame + 1L [18:41:23.576] envir <- sys.frame(frame) [18:41:23.576] } [18:41:23.576] } [18:41:23.576] sendCondition <<- function(cond) NULL [18:41:23.576] } [18:41:23.576] }) [18:41:23.576] withCallingHandlers({ [18:41:23.576] { [18:41:23.576] do.call(function(...) { [18:41:23.576] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:23.576] if (!identical(...future.globals.maxSize.org, [18:41:23.576] ...future.globals.maxSize)) { [18:41:23.576] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:23.576] on.exit(options(oopts), add = TRUE) [18:41:23.576] } [18:41:23.576] { [18:41:23.576] lapply(seq_along(...future.elements_ii), [18:41:23.576] FUN = function(jj) { [18:41:23.576] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:23.576] ...future.FUN(...future.X_jj, ...) [18:41:23.576] }) [18:41:23.576] } [18:41:23.576] }, args = future.call.arguments) [18:41:23.576] } [18:41:23.576] }, immediateCondition = function(cond) { [18:41:23.576] sendCondition <- ...future.makeSendCondition() [18:41:23.576] sendCondition(cond) [18:41:23.576] muffleCondition <- function (cond, pattern = "^muffle") [18:41:23.576] { [18:41:23.576] inherits <- base::inherits [18:41:23.576] invokeRestart <- base::invokeRestart [18:41:23.576] is.null <- base::is.null [18:41:23.576] muffled <- FALSE [18:41:23.576] if (inherits(cond, "message")) { [18:41:23.576] muffled <- grepl(pattern, "muffleMessage") [18:41:23.576] if (muffled) [18:41:23.576] invokeRestart("muffleMessage") [18:41:23.576] } [18:41:23.576] else if (inherits(cond, "warning")) { [18:41:23.576] muffled <- grepl(pattern, "muffleWarning") [18:41:23.576] if (muffled) [18:41:23.576] invokeRestart("muffleWarning") [18:41:23.576] } [18:41:23.576] else if (inherits(cond, "condition")) { [18:41:23.576] if (!is.null(pattern)) { [18:41:23.576] computeRestarts <- base::computeRestarts [18:41:23.576] grepl <- base::grepl [18:41:23.576] restarts <- computeRestarts(cond) [18:41:23.576] for (restart in restarts) { [18:41:23.576] name <- restart$name [18:41:23.576] if (is.null(name)) [18:41:23.576] next [18:41:23.576] if (!grepl(pattern, name)) [18:41:23.576] next [18:41:23.576] invokeRestart(restart) [18:41:23.576] muffled <- TRUE [18:41:23.576] break [18:41:23.576] } [18:41:23.576] } [18:41:23.576] } [18:41:23.576] invisible(muffled) [18:41:23.576] } [18:41:23.576] muffleCondition(cond) [18:41:23.576] }) [18:41:23.576] })) [18:41:23.576] future::FutureResult(value = ...future.value$value, [18:41:23.576] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:23.576] ...future.rng), globalenv = if (FALSE) [18:41:23.576] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:23.576] ...future.globalenv.names)) [18:41:23.576] else NULL, started = ...future.startTime, version = "1.8") [18:41:23.576] }, condition = base::local({ [18:41:23.576] c <- base::c [18:41:23.576] inherits <- base::inherits [18:41:23.576] invokeRestart <- base::invokeRestart [18:41:23.576] length <- base::length [18:41:23.576] list <- base::list [18:41:23.576] seq.int <- base::seq.int [18:41:23.576] signalCondition <- base::signalCondition [18:41:23.576] sys.calls <- base::sys.calls [18:41:23.576] `[[` <- base::`[[` [18:41:23.576] `+` <- base::`+` [18:41:23.576] `<<-` <- base::`<<-` [18:41:23.576] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:23.576] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:23.576] 3L)] [18:41:23.576] } [18:41:23.576] function(cond) { [18:41:23.576] is_error <- inherits(cond, "error") [18:41:23.576] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:23.576] NULL) [18:41:23.576] if (is_error) { [18:41:23.576] sessionInformation <- function() { [18:41:23.576] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:23.576] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:23.576] search = base::search(), system = base::Sys.info()) [18:41:23.576] } [18:41:23.576] ...future.conditions[[length(...future.conditions) + [18:41:23.576] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:23.576] cond$call), session = sessionInformation(), [18:41:23.576] timestamp = base::Sys.time(), signaled = 0L) [18:41:23.576] signalCondition(cond) [18:41:23.576] } [18:41:23.576] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:23.576] "immediateCondition"))) { [18:41:23.576] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:23.576] ...future.conditions[[length(...future.conditions) + [18:41:23.576] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:23.576] if (TRUE && !signal) { [18:41:23.576] muffleCondition <- function (cond, pattern = "^muffle") [18:41:23.576] { [18:41:23.576] inherits <- base::inherits [18:41:23.576] invokeRestart <- base::invokeRestart [18:41:23.576] is.null <- base::is.null [18:41:23.576] muffled <- FALSE [18:41:23.576] if (inherits(cond, "message")) { [18:41:23.576] muffled <- grepl(pattern, "muffleMessage") [18:41:23.576] if (muffled) [18:41:23.576] invokeRestart("muffleMessage") [18:41:23.576] } [18:41:23.576] else if (inherits(cond, "warning")) { [18:41:23.576] muffled <- grepl(pattern, "muffleWarning") [18:41:23.576] if (muffled) [18:41:23.576] invokeRestart("muffleWarning") [18:41:23.576] } [18:41:23.576] else if (inherits(cond, "condition")) { [18:41:23.576] if (!is.null(pattern)) { [18:41:23.576] computeRestarts <- base::computeRestarts [18:41:23.576] grepl <- base::grepl [18:41:23.576] restarts <- computeRestarts(cond) [18:41:23.576] for (restart in restarts) { [18:41:23.576] name <- restart$name [18:41:23.576] if (is.null(name)) [18:41:23.576] next [18:41:23.576] if (!grepl(pattern, name)) [18:41:23.576] next [18:41:23.576] invokeRestart(restart) [18:41:23.576] muffled <- TRUE [18:41:23.576] break [18:41:23.576] } [18:41:23.576] } [18:41:23.576] } [18:41:23.576] invisible(muffled) [18:41:23.576] } [18:41:23.576] muffleCondition(cond, pattern = "^muffle") [18:41:23.576] } [18:41:23.576] } [18:41:23.576] else { [18:41:23.576] if (TRUE) { [18:41:23.576] muffleCondition <- function (cond, pattern = "^muffle") [18:41:23.576] { [18:41:23.576] inherits <- base::inherits [18:41:23.576] invokeRestart <- base::invokeRestart [18:41:23.576] is.null <- base::is.null [18:41:23.576] muffled <- FALSE [18:41:23.576] if (inherits(cond, "message")) { [18:41:23.576] muffled <- grepl(pattern, "muffleMessage") [18:41:23.576] if (muffled) [18:41:23.576] invokeRestart("muffleMessage") [18:41:23.576] } [18:41:23.576] else if (inherits(cond, "warning")) { [18:41:23.576] muffled <- grepl(pattern, "muffleWarning") [18:41:23.576] if (muffled) [18:41:23.576] invokeRestart("muffleWarning") [18:41:23.576] } [18:41:23.576] else if (inherits(cond, "condition")) { [18:41:23.576] if (!is.null(pattern)) { [18:41:23.576] computeRestarts <- base::computeRestarts [18:41:23.576] grepl <- base::grepl [18:41:23.576] restarts <- computeRestarts(cond) [18:41:23.576] for (restart in restarts) { [18:41:23.576] name <- restart$name [18:41:23.576] if (is.null(name)) [18:41:23.576] next [18:41:23.576] if (!grepl(pattern, name)) [18:41:23.576] next [18:41:23.576] invokeRestart(restart) [18:41:23.576] muffled <- TRUE [18:41:23.576] break [18:41:23.576] } [18:41:23.576] } [18:41:23.576] } [18:41:23.576] invisible(muffled) [18:41:23.576] } [18:41:23.576] muffleCondition(cond, pattern = "^muffle") [18:41:23.576] } [18:41:23.576] } [18:41:23.576] } [18:41:23.576] })) [18:41:23.576] }, error = function(ex) { [18:41:23.576] base::structure(base::list(value = NULL, visible = NULL, [18:41:23.576] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:23.576] ...future.rng), started = ...future.startTime, [18:41:23.576] finished = Sys.time(), session_uuid = NA_character_, [18:41:23.576] version = "1.8"), class = "FutureResult") [18:41:23.576] }, finally = { [18:41:23.576] if (!identical(...future.workdir, getwd())) [18:41:23.576] setwd(...future.workdir) [18:41:23.576] { [18:41:23.576] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:23.576] ...future.oldOptions$nwarnings <- NULL [18:41:23.576] } [18:41:23.576] base::options(...future.oldOptions) [18:41:23.576] if (.Platform$OS.type == "windows") { [18:41:23.576] old_names <- names(...future.oldEnvVars) [18:41:23.576] envs <- base::Sys.getenv() [18:41:23.576] names <- names(envs) [18:41:23.576] common <- intersect(names, old_names) [18:41:23.576] added <- setdiff(names, old_names) [18:41:23.576] removed <- setdiff(old_names, names) [18:41:23.576] changed <- common[...future.oldEnvVars[common] != [18:41:23.576] envs[common]] [18:41:23.576] NAMES <- toupper(changed) [18:41:23.576] args <- list() [18:41:23.576] for (kk in seq_along(NAMES)) { [18:41:23.576] name <- changed[[kk]] [18:41:23.576] NAME <- NAMES[[kk]] [18:41:23.576] if (name != NAME && is.element(NAME, old_names)) [18:41:23.576] next [18:41:23.576] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:23.576] } [18:41:23.576] NAMES <- toupper(added) [18:41:23.576] for (kk in seq_along(NAMES)) { [18:41:23.576] name <- added[[kk]] [18:41:23.576] NAME <- NAMES[[kk]] [18:41:23.576] if (name != NAME && is.element(NAME, old_names)) [18:41:23.576] next [18:41:23.576] args[[name]] <- "" [18:41:23.576] } [18:41:23.576] NAMES <- toupper(removed) [18:41:23.576] for (kk in seq_along(NAMES)) { [18:41:23.576] name <- removed[[kk]] [18:41:23.576] NAME <- NAMES[[kk]] [18:41:23.576] if (name != NAME && is.element(NAME, old_names)) [18:41:23.576] next [18:41:23.576] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:23.576] } [18:41:23.576] if (length(args) > 0) [18:41:23.576] base::do.call(base::Sys.setenv, args = args) [18:41:23.576] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:23.576] } [18:41:23.576] else { [18:41:23.576] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:23.576] } [18:41:23.576] { [18:41:23.576] if (base::length(...future.futureOptionsAdded) > [18:41:23.576] 0L) { [18:41:23.576] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:23.576] base::names(opts) <- ...future.futureOptionsAdded [18:41:23.576] base::options(opts) [18:41:23.576] } [18:41:23.576] { [18:41:23.576] { [18:41:23.576] base::options(mc.cores = ...future.mc.cores.old) [18:41:23.576] NULL [18:41:23.576] } [18:41:23.576] options(future.plan = NULL) [18:41:23.576] if (is.na(NA_character_)) [18:41:23.576] Sys.unsetenv("R_FUTURE_PLAN") [18:41:23.576] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:23.576] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:23.576] .init = FALSE) [18:41:23.576] } [18:41:23.576] } [18:41:23.576] } [18:41:23.576] }) [18:41:23.576] if (TRUE) { [18:41:23.576] base::sink(type = "output", split = FALSE) [18:41:23.576] if (TRUE) { [18:41:23.576] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:23.576] } [18:41:23.576] else { [18:41:23.576] ...future.result["stdout"] <- base::list(NULL) [18:41:23.576] } [18:41:23.576] base::close(...future.stdout) [18:41:23.576] ...future.stdout <- NULL [18:41:23.576] } [18:41:23.576] ...future.result$conditions <- ...future.conditions [18:41:23.576] ...future.result$finished <- base::Sys.time() [18:41:23.576] ...future.result [18:41:23.576] } [18:41:23.581] Exporting 5 global objects (1.17 KiB) to cluster node #1 ... [18:41:23.581] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... [18:41:23.582] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... DONE [18:41:23.582] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... [18:41:23.582] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... DONE [18:41:23.582] Exporting '...future.elements_ii' (96 bytes) to cluster node #1 ... [18:41:23.583] Exporting '...future.elements_ii' (96 bytes) to cluster node #1 ... DONE [18:41:23.583] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:23.583] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:23.584] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:23.584] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:23.584] Exporting 5 global objects (1.17 KiB) to cluster node #1 ... DONE [18:41:23.585] MultisessionFuture started [18:41:23.585] - Launch lazy future ... done [18:41:23.585] run() for 'MultisessionFuture' ... done [18:41:23.585] Created future: [18:41:23.599] receiveMessageFromWorker() for ClusterFuture ... [18:41:23.600] - Validating connection of MultisessionFuture [18:41:23.600] - received message: FutureResult [18:41:23.600] - Received FutureResult [18:41:23.600] - Erased future from FutureRegistry [18:41:23.600] result() for ClusterFuture ... [18:41:23.601] - result already collected: FutureResult [18:41:23.601] result() for ClusterFuture ... done [18:41:23.601] receiveMessageFromWorker() for ClusterFuture ... done [18:41:23.585] MultisessionFuture: [18:41:23.585] Label: 'future_lapply-2' [18:41:23.585] Expression: [18:41:23.585] { [18:41:23.585] do.call(function(...) { [18:41:23.585] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:23.585] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:23.585] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:23.585] on.exit(options(oopts), add = TRUE) [18:41:23.585] } [18:41:23.585] { [18:41:23.585] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:23.585] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:23.585] ...future.FUN(...future.X_jj, ...) [18:41:23.585] }) [18:41:23.585] } [18:41:23.585] }, args = future.call.arguments) [18:41:23.585] } [18:41:23.585] Lazy evaluation: FALSE [18:41:23.585] Asynchronous evaluation: TRUE [18:41:23.585] Local evaluation: TRUE [18:41:23.585] Environment: R_GlobalEnv [18:41:23.585] Capture standard output: TRUE [18:41:23.585] Capture condition classes: 'condition' (excluding 'nothing') [18:41:23.585] Globals: 5 objects totaling 758 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 96 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:23.585] Packages: [18:41:23.585] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:23.585] Resolved: TRUE [18:41:23.585] Value: [18:41:23.585] Conditions captured: [18:41:23.585] Early signaling: FALSE [18:41:23.585] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:23.585] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:23.601] Chunk #2 of 4 ... DONE [18:41:23.601] Chunk #3 of 4 ... [18:41:23.602] - Finding globals in 'X' for chunk #3 ... [18:41:23.602] getGlobalsAndPackages() ... [18:41:23.602] Searching for globals... [18:41:23.602] [18:41:23.602] Searching for globals ... DONE [18:41:23.603] - globals: [0] [18:41:23.603] getGlobalsAndPackages() ... DONE [18:41:23.603] + additional globals found: [n=0] [18:41:23.603] + additional namespaces needed: [n=0] [18:41:23.603] - Finding globals in 'X' for chunk #3 ... DONE [18:41:23.603] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:23.604] - seeds: [18:41:23.604] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:23.604] getGlobalsAndPackages() ... [18:41:23.604] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:23.604] Resolving globals: FALSE [18:41:23.604] Tweak future expression to call with '...' arguments ... [18:41:23.605] { [18:41:23.605] do.call(function(...) { [18:41:23.605] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:23.605] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:23.605] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:23.605] on.exit(options(oopts), add = TRUE) [18:41:23.605] } [18:41:23.605] { [18:41:23.605] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:23.605] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:23.605] ...future.FUN(...future.X_jj, ...) [18:41:23.605] }) [18:41:23.605] } [18:41:23.605] }, args = future.call.arguments) [18:41:23.605] } [18:41:23.605] Tweak future expression to call with '...' arguments ... DONE [18:41:23.605] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:23.606] [18:41:23.606] getGlobalsAndPackages() ... DONE [18:41:23.606] run() for 'Future' ... [18:41:23.606] - state: 'created' [18:41:23.607] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:23.621] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:23.622] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:23.622] - Field: 'node' [18:41:23.622] - Field: 'label' [18:41:23.622] - Field: 'local' [18:41:23.622] - Field: 'owner' [18:41:23.623] - Field: 'envir' [18:41:23.623] - Field: 'workers' [18:41:23.623] - Field: 'packages' [18:41:23.623] - Field: 'gc' [18:41:23.623] - Field: 'conditions' [18:41:23.623] - Field: 'persistent' [18:41:23.624] - Field: 'expr' [18:41:23.624] - Field: 'uuid' [18:41:23.624] - Field: 'seed' [18:41:23.624] - Field: 'version' [18:41:23.624] - Field: 'result' [18:41:23.624] - Field: 'asynchronous' [18:41:23.625] - Field: 'calls' [18:41:23.625] - Field: 'globals' [18:41:23.625] - Field: 'stdout' [18:41:23.625] - Field: 'earlySignal' [18:41:23.625] - Field: 'lazy' [18:41:23.625] - Field: 'state' [18:41:23.626] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:23.626] - Launch lazy future ... [18:41:23.626] Packages needed by the future expression (n = 0): [18:41:23.626] Packages needed by future strategies (n = 0): [18:41:23.627] { [18:41:23.627] { [18:41:23.627] { [18:41:23.627] ...future.startTime <- base::Sys.time() [18:41:23.627] { [18:41:23.627] { [18:41:23.627] { [18:41:23.627] { [18:41:23.627] base::local({ [18:41:23.627] has_future <- base::requireNamespace("future", [18:41:23.627] quietly = TRUE) [18:41:23.627] if (has_future) { [18:41:23.627] ns <- base::getNamespace("future") [18:41:23.627] version <- ns[[".package"]][["version"]] [18:41:23.627] if (is.null(version)) [18:41:23.627] version <- utils::packageVersion("future") [18:41:23.627] } [18:41:23.627] else { [18:41:23.627] version <- NULL [18:41:23.627] } [18:41:23.627] if (!has_future || version < "1.8.0") { [18:41:23.627] info <- base::c(r_version = base::gsub("R version ", [18:41:23.627] "", base::R.version$version.string), [18:41:23.627] platform = base::sprintf("%s (%s-bit)", [18:41:23.627] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:23.627] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:23.627] "release", "version")], collapse = " "), [18:41:23.627] hostname = base::Sys.info()[["nodename"]]) [18:41:23.627] info <- base::sprintf("%s: %s", base::names(info), [18:41:23.627] info) [18:41:23.627] info <- base::paste(info, collapse = "; ") [18:41:23.627] if (!has_future) { [18:41:23.627] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:23.627] info) [18:41:23.627] } [18:41:23.627] else { [18:41:23.627] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:23.627] info, version) [18:41:23.627] } [18:41:23.627] base::stop(msg) [18:41:23.627] } [18:41:23.627] }) [18:41:23.627] } [18:41:23.627] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:23.627] base::options(mc.cores = 1L) [18:41:23.627] } [18:41:23.627] ...future.strategy.old <- future::plan("list") [18:41:23.627] options(future.plan = NULL) [18:41:23.627] Sys.unsetenv("R_FUTURE_PLAN") [18:41:23.627] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:23.627] } [18:41:23.627] ...future.workdir <- getwd() [18:41:23.627] } [18:41:23.627] ...future.oldOptions <- base::as.list(base::.Options) [18:41:23.627] ...future.oldEnvVars <- base::Sys.getenv() [18:41:23.627] } [18:41:23.627] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:23.627] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:23.627] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:23.627] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:23.627] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:23.627] future.stdout.windows.reencode = NULL, width = 80L) [18:41:23.627] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:23.627] base::names(...future.oldOptions)) [18:41:23.627] } [18:41:23.627] if (FALSE) { [18:41:23.627] } [18:41:23.627] else { [18:41:23.627] if (TRUE) { [18:41:23.627] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:23.627] open = "w") [18:41:23.627] } [18:41:23.627] else { [18:41:23.627] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:23.627] windows = "NUL", "/dev/null"), open = "w") [18:41:23.627] } [18:41:23.627] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:23.627] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:23.627] base::sink(type = "output", split = FALSE) [18:41:23.627] base::close(...future.stdout) [18:41:23.627] }, add = TRUE) [18:41:23.627] } [18:41:23.627] ...future.frame <- base::sys.nframe() [18:41:23.627] ...future.conditions <- base::list() [18:41:23.627] ...future.rng <- base::globalenv()$.Random.seed [18:41:23.627] if (FALSE) { [18:41:23.627] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:23.627] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:23.627] } [18:41:23.627] ...future.result <- base::tryCatch({ [18:41:23.627] base::withCallingHandlers({ [18:41:23.627] ...future.value <- base::withVisible(base::local({ [18:41:23.627] ...future.makeSendCondition <- base::local({ [18:41:23.627] sendCondition <- NULL [18:41:23.627] function(frame = 1L) { [18:41:23.627] if (is.function(sendCondition)) [18:41:23.627] return(sendCondition) [18:41:23.627] ns <- getNamespace("parallel") [18:41:23.627] if (exists("sendData", mode = "function", [18:41:23.627] envir = ns)) { [18:41:23.627] parallel_sendData <- get("sendData", mode = "function", [18:41:23.627] envir = ns) [18:41:23.627] envir <- sys.frame(frame) [18:41:23.627] master <- NULL [18:41:23.627] while (!identical(envir, .GlobalEnv) && [18:41:23.627] !identical(envir, emptyenv())) { [18:41:23.627] if (exists("master", mode = "list", envir = envir, [18:41:23.627] inherits = FALSE)) { [18:41:23.627] master <- get("master", mode = "list", [18:41:23.627] envir = envir, inherits = FALSE) [18:41:23.627] if (inherits(master, c("SOCKnode", [18:41:23.627] "SOCK0node"))) { [18:41:23.627] sendCondition <<- function(cond) { [18:41:23.627] data <- list(type = "VALUE", value = cond, [18:41:23.627] success = TRUE) [18:41:23.627] parallel_sendData(master, data) [18:41:23.627] } [18:41:23.627] return(sendCondition) [18:41:23.627] } [18:41:23.627] } [18:41:23.627] frame <- frame + 1L [18:41:23.627] envir <- sys.frame(frame) [18:41:23.627] } [18:41:23.627] } [18:41:23.627] sendCondition <<- function(cond) NULL [18:41:23.627] } [18:41:23.627] }) [18:41:23.627] withCallingHandlers({ [18:41:23.627] { [18:41:23.627] do.call(function(...) { [18:41:23.627] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:23.627] if (!identical(...future.globals.maxSize.org, [18:41:23.627] ...future.globals.maxSize)) { [18:41:23.627] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:23.627] on.exit(options(oopts), add = TRUE) [18:41:23.627] } [18:41:23.627] { [18:41:23.627] lapply(seq_along(...future.elements_ii), [18:41:23.627] FUN = function(jj) { [18:41:23.627] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:23.627] ...future.FUN(...future.X_jj, ...) [18:41:23.627] }) [18:41:23.627] } [18:41:23.627] }, args = future.call.arguments) [18:41:23.627] } [18:41:23.627] }, immediateCondition = function(cond) { [18:41:23.627] sendCondition <- ...future.makeSendCondition() [18:41:23.627] sendCondition(cond) [18:41:23.627] muffleCondition <- function (cond, pattern = "^muffle") [18:41:23.627] { [18:41:23.627] inherits <- base::inherits [18:41:23.627] invokeRestart <- base::invokeRestart [18:41:23.627] is.null <- base::is.null [18:41:23.627] muffled <- FALSE [18:41:23.627] if (inherits(cond, "message")) { [18:41:23.627] muffled <- grepl(pattern, "muffleMessage") [18:41:23.627] if (muffled) [18:41:23.627] invokeRestart("muffleMessage") [18:41:23.627] } [18:41:23.627] else if (inherits(cond, "warning")) { [18:41:23.627] muffled <- grepl(pattern, "muffleWarning") [18:41:23.627] if (muffled) [18:41:23.627] invokeRestart("muffleWarning") [18:41:23.627] } [18:41:23.627] else if (inherits(cond, "condition")) { [18:41:23.627] if (!is.null(pattern)) { [18:41:23.627] computeRestarts <- base::computeRestarts [18:41:23.627] grepl <- base::grepl [18:41:23.627] restarts <- computeRestarts(cond) [18:41:23.627] for (restart in restarts) { [18:41:23.627] name <- restart$name [18:41:23.627] if (is.null(name)) [18:41:23.627] next [18:41:23.627] if (!grepl(pattern, name)) [18:41:23.627] next [18:41:23.627] invokeRestart(restart) [18:41:23.627] muffled <- TRUE [18:41:23.627] break [18:41:23.627] } [18:41:23.627] } [18:41:23.627] } [18:41:23.627] invisible(muffled) [18:41:23.627] } [18:41:23.627] muffleCondition(cond) [18:41:23.627] }) [18:41:23.627] })) [18:41:23.627] future::FutureResult(value = ...future.value$value, [18:41:23.627] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:23.627] ...future.rng), globalenv = if (FALSE) [18:41:23.627] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:23.627] ...future.globalenv.names)) [18:41:23.627] else NULL, started = ...future.startTime, version = "1.8") [18:41:23.627] }, condition = base::local({ [18:41:23.627] c <- base::c [18:41:23.627] inherits <- base::inherits [18:41:23.627] invokeRestart <- base::invokeRestart [18:41:23.627] length <- base::length [18:41:23.627] list <- base::list [18:41:23.627] seq.int <- base::seq.int [18:41:23.627] signalCondition <- base::signalCondition [18:41:23.627] sys.calls <- base::sys.calls [18:41:23.627] `[[` <- base::`[[` [18:41:23.627] `+` <- base::`+` [18:41:23.627] `<<-` <- base::`<<-` [18:41:23.627] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:23.627] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:23.627] 3L)] [18:41:23.627] } [18:41:23.627] function(cond) { [18:41:23.627] is_error <- inherits(cond, "error") [18:41:23.627] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:23.627] NULL) [18:41:23.627] if (is_error) { [18:41:23.627] sessionInformation <- function() { [18:41:23.627] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:23.627] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:23.627] search = base::search(), system = base::Sys.info()) [18:41:23.627] } [18:41:23.627] ...future.conditions[[length(...future.conditions) + [18:41:23.627] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:23.627] cond$call), session = sessionInformation(), [18:41:23.627] timestamp = base::Sys.time(), signaled = 0L) [18:41:23.627] signalCondition(cond) [18:41:23.627] } [18:41:23.627] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:23.627] "immediateCondition"))) { [18:41:23.627] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:23.627] ...future.conditions[[length(...future.conditions) + [18:41:23.627] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:23.627] if (TRUE && !signal) { [18:41:23.627] muffleCondition <- function (cond, pattern = "^muffle") [18:41:23.627] { [18:41:23.627] inherits <- base::inherits [18:41:23.627] invokeRestart <- base::invokeRestart [18:41:23.627] is.null <- base::is.null [18:41:23.627] muffled <- FALSE [18:41:23.627] if (inherits(cond, "message")) { [18:41:23.627] muffled <- grepl(pattern, "muffleMessage") [18:41:23.627] if (muffled) [18:41:23.627] invokeRestart("muffleMessage") [18:41:23.627] } [18:41:23.627] else if (inherits(cond, "warning")) { [18:41:23.627] muffled <- grepl(pattern, "muffleWarning") [18:41:23.627] if (muffled) [18:41:23.627] invokeRestart("muffleWarning") [18:41:23.627] } [18:41:23.627] else if (inherits(cond, "condition")) { [18:41:23.627] if (!is.null(pattern)) { [18:41:23.627] computeRestarts <- base::computeRestarts [18:41:23.627] grepl <- base::grepl [18:41:23.627] restarts <- computeRestarts(cond) [18:41:23.627] for (restart in restarts) { [18:41:23.627] name <- restart$name [18:41:23.627] if (is.null(name)) [18:41:23.627] next [18:41:23.627] if (!grepl(pattern, name)) [18:41:23.627] next [18:41:23.627] invokeRestart(restart) [18:41:23.627] muffled <- TRUE [18:41:23.627] break [18:41:23.627] } [18:41:23.627] } [18:41:23.627] } [18:41:23.627] invisible(muffled) [18:41:23.627] } [18:41:23.627] muffleCondition(cond, pattern = "^muffle") [18:41:23.627] } [18:41:23.627] } [18:41:23.627] else { [18:41:23.627] if (TRUE) { [18:41:23.627] muffleCondition <- function (cond, pattern = "^muffle") [18:41:23.627] { [18:41:23.627] inherits <- base::inherits [18:41:23.627] invokeRestart <- base::invokeRestart [18:41:23.627] is.null <- base::is.null [18:41:23.627] muffled <- FALSE [18:41:23.627] if (inherits(cond, "message")) { [18:41:23.627] muffled <- grepl(pattern, "muffleMessage") [18:41:23.627] if (muffled) [18:41:23.627] invokeRestart("muffleMessage") [18:41:23.627] } [18:41:23.627] else if (inherits(cond, "warning")) { [18:41:23.627] muffled <- grepl(pattern, "muffleWarning") [18:41:23.627] if (muffled) [18:41:23.627] invokeRestart("muffleWarning") [18:41:23.627] } [18:41:23.627] else if (inherits(cond, "condition")) { [18:41:23.627] if (!is.null(pattern)) { [18:41:23.627] computeRestarts <- base::computeRestarts [18:41:23.627] grepl <- base::grepl [18:41:23.627] restarts <- computeRestarts(cond) [18:41:23.627] for (restart in restarts) { [18:41:23.627] name <- restart$name [18:41:23.627] if (is.null(name)) [18:41:23.627] next [18:41:23.627] if (!grepl(pattern, name)) [18:41:23.627] next [18:41:23.627] invokeRestart(restart) [18:41:23.627] muffled <- TRUE [18:41:23.627] break [18:41:23.627] } [18:41:23.627] } [18:41:23.627] } [18:41:23.627] invisible(muffled) [18:41:23.627] } [18:41:23.627] muffleCondition(cond, pattern = "^muffle") [18:41:23.627] } [18:41:23.627] } [18:41:23.627] } [18:41:23.627] })) [18:41:23.627] }, error = function(ex) { [18:41:23.627] base::structure(base::list(value = NULL, visible = NULL, [18:41:23.627] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:23.627] ...future.rng), started = ...future.startTime, [18:41:23.627] finished = Sys.time(), session_uuid = NA_character_, [18:41:23.627] version = "1.8"), class = "FutureResult") [18:41:23.627] }, finally = { [18:41:23.627] if (!identical(...future.workdir, getwd())) [18:41:23.627] setwd(...future.workdir) [18:41:23.627] { [18:41:23.627] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:23.627] ...future.oldOptions$nwarnings <- NULL [18:41:23.627] } [18:41:23.627] base::options(...future.oldOptions) [18:41:23.627] if (.Platform$OS.type == "windows") { [18:41:23.627] old_names <- names(...future.oldEnvVars) [18:41:23.627] envs <- base::Sys.getenv() [18:41:23.627] names <- names(envs) [18:41:23.627] common <- intersect(names, old_names) [18:41:23.627] added <- setdiff(names, old_names) [18:41:23.627] removed <- setdiff(old_names, names) [18:41:23.627] changed <- common[...future.oldEnvVars[common] != [18:41:23.627] envs[common]] [18:41:23.627] NAMES <- toupper(changed) [18:41:23.627] args <- list() [18:41:23.627] for (kk in seq_along(NAMES)) { [18:41:23.627] name <- changed[[kk]] [18:41:23.627] NAME <- NAMES[[kk]] [18:41:23.627] if (name != NAME && is.element(NAME, old_names)) [18:41:23.627] next [18:41:23.627] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:23.627] } [18:41:23.627] NAMES <- toupper(added) [18:41:23.627] for (kk in seq_along(NAMES)) { [18:41:23.627] name <- added[[kk]] [18:41:23.627] NAME <- NAMES[[kk]] [18:41:23.627] if (name != NAME && is.element(NAME, old_names)) [18:41:23.627] next [18:41:23.627] args[[name]] <- "" [18:41:23.627] } [18:41:23.627] NAMES <- toupper(removed) [18:41:23.627] for (kk in seq_along(NAMES)) { [18:41:23.627] name <- removed[[kk]] [18:41:23.627] NAME <- NAMES[[kk]] [18:41:23.627] if (name != NAME && is.element(NAME, old_names)) [18:41:23.627] next [18:41:23.627] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:23.627] } [18:41:23.627] if (length(args) > 0) [18:41:23.627] base::do.call(base::Sys.setenv, args = args) [18:41:23.627] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:23.627] } [18:41:23.627] else { [18:41:23.627] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:23.627] } [18:41:23.627] { [18:41:23.627] if (base::length(...future.futureOptionsAdded) > [18:41:23.627] 0L) { [18:41:23.627] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:23.627] base::names(opts) <- ...future.futureOptionsAdded [18:41:23.627] base::options(opts) [18:41:23.627] } [18:41:23.627] { [18:41:23.627] { [18:41:23.627] base::options(mc.cores = ...future.mc.cores.old) [18:41:23.627] NULL [18:41:23.627] } [18:41:23.627] options(future.plan = NULL) [18:41:23.627] if (is.na(NA_character_)) [18:41:23.627] Sys.unsetenv("R_FUTURE_PLAN") [18:41:23.627] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:23.627] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:23.627] .init = FALSE) [18:41:23.627] } [18:41:23.627] } [18:41:23.627] } [18:41:23.627] }) [18:41:23.627] if (TRUE) { [18:41:23.627] base::sink(type = "output", split = FALSE) [18:41:23.627] if (TRUE) { [18:41:23.627] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:23.627] } [18:41:23.627] else { [18:41:23.627] ...future.result["stdout"] <- base::list(NULL) [18:41:23.627] } [18:41:23.627] base::close(...future.stdout) [18:41:23.627] ...future.stdout <- NULL [18:41:23.627] } [18:41:23.627] ...future.result$conditions <- ...future.conditions [18:41:23.627] ...future.result$finished <- base::Sys.time() [18:41:23.627] ...future.result [18:41:23.627] } [18:41:23.632] Exporting 5 global objects (1.17 KiB) to cluster node #1 ... [18:41:23.632] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... [18:41:23.633] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... DONE [18:41:23.633] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... [18:41:23.633] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... DONE [18:41:23.633] Exporting '...future.elements_ii' (98 bytes) to cluster node #1 ... [18:41:23.634] Exporting '...future.elements_ii' (98 bytes) to cluster node #1 ... DONE [18:41:23.634] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:23.634] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:23.634] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:23.635] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:23.635] Exporting 5 global objects (1.17 KiB) to cluster node #1 ... DONE [18:41:23.635] MultisessionFuture started [18:41:23.636] - Launch lazy future ... done [18:41:23.636] run() for 'MultisessionFuture' ... done [18:41:23.636] Created future: [18:41:23.650] receiveMessageFromWorker() for ClusterFuture ... [18:41:23.650] - Validating connection of MultisessionFuture [18:41:23.650] - received message: FutureResult [18:41:23.651] - Received FutureResult [18:41:23.651] - Erased future from FutureRegistry [18:41:23.651] result() for ClusterFuture ... [18:41:23.651] - result already collected: FutureResult [18:41:23.651] result() for ClusterFuture ... done [18:41:23.652] receiveMessageFromWorker() for ClusterFuture ... done [18:41:23.636] MultisessionFuture: [18:41:23.636] Label: 'future_lapply-3' [18:41:23.636] Expression: [18:41:23.636] { [18:41:23.636] do.call(function(...) { [18:41:23.636] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:23.636] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:23.636] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:23.636] on.exit(options(oopts), add = TRUE) [18:41:23.636] } [18:41:23.636] { [18:41:23.636] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:23.636] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:23.636] ...future.FUN(...future.X_jj, ...) [18:41:23.636] }) [18:41:23.636] } [18:41:23.636] }, args = future.call.arguments) [18:41:23.636] } [18:41:23.636] Lazy evaluation: FALSE [18:41:23.636] Asynchronous evaluation: TRUE [18:41:23.636] Local evaluation: TRUE [18:41:23.636] Environment: R_GlobalEnv [18:41:23.636] Capture standard output: TRUE [18:41:23.636] Capture condition classes: 'condition' (excluding 'nothing') [18:41:23.636] Globals: 5 objects totaling 760 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 98 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:23.636] Packages: [18:41:23.636] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:23.636] Resolved: TRUE [18:41:23.636] Value: [18:41:23.636] Conditions captured: [18:41:23.636] Early signaling: FALSE [18:41:23.636] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:23.636] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:23.652] Chunk #3 of 4 ... DONE [18:41:23.652] Chunk #4 of 4 ... [18:41:23.652] - Finding globals in 'X' for chunk #4 ... [18:41:23.652] getGlobalsAndPackages() ... [18:41:23.653] Searching for globals... [18:41:23.653] [18:41:23.653] Searching for globals ... DONE [18:41:23.653] - globals: [0] [18:41:23.653] getGlobalsAndPackages() ... DONE [18:41:23.654] + additional globals found: [n=0] [18:41:23.654] + additional namespaces needed: [n=0] [18:41:23.654] - Finding globals in 'X' for chunk #4 ... DONE [18:41:23.654] - Adjusted option 'future.globals.maxSize': 524288000 -> 4 * 524288000 = 2097152000 (bytes) [18:41:23.654] - seeds: [18:41:23.654] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:23.654] getGlobalsAndPackages() ... [18:41:23.655] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:23.655] Resolving globals: FALSE [18:41:23.655] Tweak future expression to call with '...' arguments ... [18:41:23.655] { [18:41:23.655] do.call(function(...) { [18:41:23.655] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:23.655] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:23.655] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:23.655] on.exit(options(oopts), add = TRUE) [18:41:23.655] } [18:41:23.655] { [18:41:23.655] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:23.655] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:23.655] ...future.FUN(...future.X_jj, ...) [18:41:23.655] }) [18:41:23.655] } [18:41:23.655] }, args = future.call.arguments) [18:41:23.655] } [18:41:23.656] Tweak future expression to call with '...' arguments ... DONE [18:41:23.656] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:23.656] [18:41:23.656] getGlobalsAndPackages() ... DONE [18:41:23.657] run() for 'Future' ... [18:41:23.657] - state: 'created' [18:41:23.657] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:23.674] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:23.674] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:23.675] - Field: 'node' [18:41:23.675] - Field: 'label' [18:41:23.675] - Field: 'local' [18:41:23.675] - Field: 'owner' [18:41:23.675] - Field: 'envir' [18:41:23.676] - Field: 'workers' [18:41:23.676] - Field: 'packages' [18:41:23.676] - Field: 'gc' [18:41:23.676] - Field: 'conditions' [18:41:23.676] - Field: 'persistent' [18:41:23.677] - Field: 'expr' [18:41:23.677] - Field: 'uuid' [18:41:23.677] - Field: 'seed' [18:41:23.677] - Field: 'version' [18:41:23.677] - Field: 'result' [18:41:23.678] - Field: 'asynchronous' [18:41:23.678] - Field: 'calls' [18:41:23.678] - Field: 'globals' [18:41:23.678] - Field: 'stdout' [18:41:23.678] - Field: 'earlySignal' [18:41:23.678] - Field: 'lazy' [18:41:23.679] - Field: 'state' [18:41:23.679] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:23.679] - Launch lazy future ... [18:41:23.679] Packages needed by the future expression (n = 0): [18:41:23.680] Packages needed by future strategies (n = 0): [18:41:23.680] { [18:41:23.680] { [18:41:23.680] { [18:41:23.680] ...future.startTime <- base::Sys.time() [18:41:23.680] { [18:41:23.680] { [18:41:23.680] { [18:41:23.680] { [18:41:23.680] base::local({ [18:41:23.680] has_future <- base::requireNamespace("future", [18:41:23.680] quietly = TRUE) [18:41:23.680] if (has_future) { [18:41:23.680] ns <- base::getNamespace("future") [18:41:23.680] version <- ns[[".package"]][["version"]] [18:41:23.680] if (is.null(version)) [18:41:23.680] version <- utils::packageVersion("future") [18:41:23.680] } [18:41:23.680] else { [18:41:23.680] version <- NULL [18:41:23.680] } [18:41:23.680] if (!has_future || version < "1.8.0") { [18:41:23.680] info <- base::c(r_version = base::gsub("R version ", [18:41:23.680] "", base::R.version$version.string), [18:41:23.680] platform = base::sprintf("%s (%s-bit)", [18:41:23.680] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:23.680] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:23.680] "release", "version")], collapse = " "), [18:41:23.680] hostname = base::Sys.info()[["nodename"]]) [18:41:23.680] info <- base::sprintf("%s: %s", base::names(info), [18:41:23.680] info) [18:41:23.680] info <- base::paste(info, collapse = "; ") [18:41:23.680] if (!has_future) { [18:41:23.680] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:23.680] info) [18:41:23.680] } [18:41:23.680] else { [18:41:23.680] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:23.680] info, version) [18:41:23.680] } [18:41:23.680] base::stop(msg) [18:41:23.680] } [18:41:23.680] }) [18:41:23.680] } [18:41:23.680] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:23.680] base::options(mc.cores = 1L) [18:41:23.680] } [18:41:23.680] ...future.strategy.old <- future::plan("list") [18:41:23.680] options(future.plan = NULL) [18:41:23.680] Sys.unsetenv("R_FUTURE_PLAN") [18:41:23.680] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:23.680] } [18:41:23.680] ...future.workdir <- getwd() [18:41:23.680] } [18:41:23.680] ...future.oldOptions <- base::as.list(base::.Options) [18:41:23.680] ...future.oldEnvVars <- base::Sys.getenv() [18:41:23.680] } [18:41:23.680] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:23.680] future.globals.maxSize = 2097152000, future.globals.method = NULL, [18:41:23.680] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:23.680] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:23.680] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:23.680] future.stdout.windows.reencode = NULL, width = 80L) [18:41:23.680] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:23.680] base::names(...future.oldOptions)) [18:41:23.680] } [18:41:23.680] if (FALSE) { [18:41:23.680] } [18:41:23.680] else { [18:41:23.680] if (TRUE) { [18:41:23.680] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:23.680] open = "w") [18:41:23.680] } [18:41:23.680] else { [18:41:23.680] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:23.680] windows = "NUL", "/dev/null"), open = "w") [18:41:23.680] } [18:41:23.680] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:23.680] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:23.680] base::sink(type = "output", split = FALSE) [18:41:23.680] base::close(...future.stdout) [18:41:23.680] }, add = TRUE) [18:41:23.680] } [18:41:23.680] ...future.frame <- base::sys.nframe() [18:41:23.680] ...future.conditions <- base::list() [18:41:23.680] ...future.rng <- base::globalenv()$.Random.seed [18:41:23.680] if (FALSE) { [18:41:23.680] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:23.680] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:23.680] } [18:41:23.680] ...future.result <- base::tryCatch({ [18:41:23.680] base::withCallingHandlers({ [18:41:23.680] ...future.value <- base::withVisible(base::local({ [18:41:23.680] ...future.makeSendCondition <- base::local({ [18:41:23.680] sendCondition <- NULL [18:41:23.680] function(frame = 1L) { [18:41:23.680] if (is.function(sendCondition)) [18:41:23.680] return(sendCondition) [18:41:23.680] ns <- getNamespace("parallel") [18:41:23.680] if (exists("sendData", mode = "function", [18:41:23.680] envir = ns)) { [18:41:23.680] parallel_sendData <- get("sendData", mode = "function", [18:41:23.680] envir = ns) [18:41:23.680] envir <- sys.frame(frame) [18:41:23.680] master <- NULL [18:41:23.680] while (!identical(envir, .GlobalEnv) && [18:41:23.680] !identical(envir, emptyenv())) { [18:41:23.680] if (exists("master", mode = "list", envir = envir, [18:41:23.680] inherits = FALSE)) { [18:41:23.680] master <- get("master", mode = "list", [18:41:23.680] envir = envir, inherits = FALSE) [18:41:23.680] if (inherits(master, c("SOCKnode", [18:41:23.680] "SOCK0node"))) { [18:41:23.680] sendCondition <<- function(cond) { [18:41:23.680] data <- list(type = "VALUE", value = cond, [18:41:23.680] success = TRUE) [18:41:23.680] parallel_sendData(master, data) [18:41:23.680] } [18:41:23.680] return(sendCondition) [18:41:23.680] } [18:41:23.680] } [18:41:23.680] frame <- frame + 1L [18:41:23.680] envir <- sys.frame(frame) [18:41:23.680] } [18:41:23.680] } [18:41:23.680] sendCondition <<- function(cond) NULL [18:41:23.680] } [18:41:23.680] }) [18:41:23.680] withCallingHandlers({ [18:41:23.680] { [18:41:23.680] do.call(function(...) { [18:41:23.680] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:23.680] if (!identical(...future.globals.maxSize.org, [18:41:23.680] ...future.globals.maxSize)) { [18:41:23.680] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:23.680] on.exit(options(oopts), add = TRUE) [18:41:23.680] } [18:41:23.680] { [18:41:23.680] lapply(seq_along(...future.elements_ii), [18:41:23.680] FUN = function(jj) { [18:41:23.680] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:23.680] ...future.FUN(...future.X_jj, ...) [18:41:23.680] }) [18:41:23.680] } [18:41:23.680] }, args = future.call.arguments) [18:41:23.680] } [18:41:23.680] }, immediateCondition = function(cond) { [18:41:23.680] sendCondition <- ...future.makeSendCondition() [18:41:23.680] sendCondition(cond) [18:41:23.680] muffleCondition <- function (cond, pattern = "^muffle") [18:41:23.680] { [18:41:23.680] inherits <- base::inherits [18:41:23.680] invokeRestart <- base::invokeRestart [18:41:23.680] is.null <- base::is.null [18:41:23.680] muffled <- FALSE [18:41:23.680] if (inherits(cond, "message")) { [18:41:23.680] muffled <- grepl(pattern, "muffleMessage") [18:41:23.680] if (muffled) [18:41:23.680] invokeRestart("muffleMessage") [18:41:23.680] } [18:41:23.680] else if (inherits(cond, "warning")) { [18:41:23.680] muffled <- grepl(pattern, "muffleWarning") [18:41:23.680] if (muffled) [18:41:23.680] invokeRestart("muffleWarning") [18:41:23.680] } [18:41:23.680] else if (inherits(cond, "condition")) { [18:41:23.680] if (!is.null(pattern)) { [18:41:23.680] computeRestarts <- base::computeRestarts [18:41:23.680] grepl <- base::grepl [18:41:23.680] restarts <- computeRestarts(cond) [18:41:23.680] for (restart in restarts) { [18:41:23.680] name <- restart$name [18:41:23.680] if (is.null(name)) [18:41:23.680] next [18:41:23.680] if (!grepl(pattern, name)) [18:41:23.680] next [18:41:23.680] invokeRestart(restart) [18:41:23.680] muffled <- TRUE [18:41:23.680] break [18:41:23.680] } [18:41:23.680] } [18:41:23.680] } [18:41:23.680] invisible(muffled) [18:41:23.680] } [18:41:23.680] muffleCondition(cond) [18:41:23.680] }) [18:41:23.680] })) [18:41:23.680] future::FutureResult(value = ...future.value$value, [18:41:23.680] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:23.680] ...future.rng), globalenv = if (FALSE) [18:41:23.680] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:23.680] ...future.globalenv.names)) [18:41:23.680] else NULL, started = ...future.startTime, version = "1.8") [18:41:23.680] }, condition = base::local({ [18:41:23.680] c <- base::c [18:41:23.680] inherits <- base::inherits [18:41:23.680] invokeRestart <- base::invokeRestart [18:41:23.680] length <- base::length [18:41:23.680] list <- base::list [18:41:23.680] seq.int <- base::seq.int [18:41:23.680] signalCondition <- base::signalCondition [18:41:23.680] sys.calls <- base::sys.calls [18:41:23.680] `[[` <- base::`[[` [18:41:23.680] `+` <- base::`+` [18:41:23.680] `<<-` <- base::`<<-` [18:41:23.680] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:23.680] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:23.680] 3L)] [18:41:23.680] } [18:41:23.680] function(cond) { [18:41:23.680] is_error <- inherits(cond, "error") [18:41:23.680] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:23.680] NULL) [18:41:23.680] if (is_error) { [18:41:23.680] sessionInformation <- function() { [18:41:23.680] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:23.680] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:23.680] search = base::search(), system = base::Sys.info()) [18:41:23.680] } [18:41:23.680] ...future.conditions[[length(...future.conditions) + [18:41:23.680] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:23.680] cond$call), session = sessionInformation(), [18:41:23.680] timestamp = base::Sys.time(), signaled = 0L) [18:41:23.680] signalCondition(cond) [18:41:23.680] } [18:41:23.680] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:23.680] "immediateCondition"))) { [18:41:23.680] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:23.680] ...future.conditions[[length(...future.conditions) + [18:41:23.680] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:23.680] if (TRUE && !signal) { [18:41:23.680] muffleCondition <- function (cond, pattern = "^muffle") [18:41:23.680] { [18:41:23.680] inherits <- base::inherits [18:41:23.680] invokeRestart <- base::invokeRestart [18:41:23.680] is.null <- base::is.null [18:41:23.680] muffled <- FALSE [18:41:23.680] if (inherits(cond, "message")) { [18:41:23.680] muffled <- grepl(pattern, "muffleMessage") [18:41:23.680] if (muffled) [18:41:23.680] invokeRestart("muffleMessage") [18:41:23.680] } [18:41:23.680] else if (inherits(cond, "warning")) { [18:41:23.680] muffled <- grepl(pattern, "muffleWarning") [18:41:23.680] if (muffled) [18:41:23.680] invokeRestart("muffleWarning") [18:41:23.680] } [18:41:23.680] else if (inherits(cond, "condition")) { [18:41:23.680] if (!is.null(pattern)) { [18:41:23.680] computeRestarts <- base::computeRestarts [18:41:23.680] grepl <- base::grepl [18:41:23.680] restarts <- computeRestarts(cond) [18:41:23.680] for (restart in restarts) { [18:41:23.680] name <- restart$name [18:41:23.680] if (is.null(name)) [18:41:23.680] next [18:41:23.680] if (!grepl(pattern, name)) [18:41:23.680] next [18:41:23.680] invokeRestart(restart) [18:41:23.680] muffled <- TRUE [18:41:23.680] break [18:41:23.680] } [18:41:23.680] } [18:41:23.680] } [18:41:23.680] invisible(muffled) [18:41:23.680] } [18:41:23.680] muffleCondition(cond, pattern = "^muffle") [18:41:23.680] } [18:41:23.680] } [18:41:23.680] else { [18:41:23.680] if (TRUE) { [18:41:23.680] muffleCondition <- function (cond, pattern = "^muffle") [18:41:23.680] { [18:41:23.680] inherits <- base::inherits [18:41:23.680] invokeRestart <- base::invokeRestart [18:41:23.680] is.null <- base::is.null [18:41:23.680] muffled <- FALSE [18:41:23.680] if (inherits(cond, "message")) { [18:41:23.680] muffled <- grepl(pattern, "muffleMessage") [18:41:23.680] if (muffled) [18:41:23.680] invokeRestart("muffleMessage") [18:41:23.680] } [18:41:23.680] else if (inherits(cond, "warning")) { [18:41:23.680] muffled <- grepl(pattern, "muffleWarning") [18:41:23.680] if (muffled) [18:41:23.680] invokeRestart("muffleWarning") [18:41:23.680] } [18:41:23.680] else if (inherits(cond, "condition")) { [18:41:23.680] if (!is.null(pattern)) { [18:41:23.680] computeRestarts <- base::computeRestarts [18:41:23.680] grepl <- base::grepl [18:41:23.680] restarts <- computeRestarts(cond) [18:41:23.680] for (restart in restarts) { [18:41:23.680] name <- restart$name [18:41:23.680] if (is.null(name)) [18:41:23.680] next [18:41:23.680] if (!grepl(pattern, name)) [18:41:23.680] next [18:41:23.680] invokeRestart(restart) [18:41:23.680] muffled <- TRUE [18:41:23.680] break [18:41:23.680] } [18:41:23.680] } [18:41:23.680] } [18:41:23.680] invisible(muffled) [18:41:23.680] } [18:41:23.680] muffleCondition(cond, pattern = "^muffle") [18:41:23.680] } [18:41:23.680] } [18:41:23.680] } [18:41:23.680] })) [18:41:23.680] }, error = function(ex) { [18:41:23.680] base::structure(base::list(value = NULL, visible = NULL, [18:41:23.680] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:23.680] ...future.rng), started = ...future.startTime, [18:41:23.680] finished = Sys.time(), session_uuid = NA_character_, [18:41:23.680] version = "1.8"), class = "FutureResult") [18:41:23.680] }, finally = { [18:41:23.680] if (!identical(...future.workdir, getwd())) [18:41:23.680] setwd(...future.workdir) [18:41:23.680] { [18:41:23.680] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:23.680] ...future.oldOptions$nwarnings <- NULL [18:41:23.680] } [18:41:23.680] base::options(...future.oldOptions) [18:41:23.680] if (.Platform$OS.type == "windows") { [18:41:23.680] old_names <- names(...future.oldEnvVars) [18:41:23.680] envs <- base::Sys.getenv() [18:41:23.680] names <- names(envs) [18:41:23.680] common <- intersect(names, old_names) [18:41:23.680] added <- setdiff(names, old_names) [18:41:23.680] removed <- setdiff(old_names, names) [18:41:23.680] changed <- common[...future.oldEnvVars[common] != [18:41:23.680] envs[common]] [18:41:23.680] NAMES <- toupper(changed) [18:41:23.680] args <- list() [18:41:23.680] for (kk in seq_along(NAMES)) { [18:41:23.680] name <- changed[[kk]] [18:41:23.680] NAME <- NAMES[[kk]] [18:41:23.680] if (name != NAME && is.element(NAME, old_names)) [18:41:23.680] next [18:41:23.680] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:23.680] } [18:41:23.680] NAMES <- toupper(added) [18:41:23.680] for (kk in seq_along(NAMES)) { [18:41:23.680] name <- added[[kk]] [18:41:23.680] NAME <- NAMES[[kk]] [18:41:23.680] if (name != NAME && is.element(NAME, old_names)) [18:41:23.680] next [18:41:23.680] args[[name]] <- "" [18:41:23.680] } [18:41:23.680] NAMES <- toupper(removed) [18:41:23.680] for (kk in seq_along(NAMES)) { [18:41:23.680] name <- removed[[kk]] [18:41:23.680] NAME <- NAMES[[kk]] [18:41:23.680] if (name != NAME && is.element(NAME, old_names)) [18:41:23.680] next [18:41:23.680] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:23.680] } [18:41:23.680] if (length(args) > 0) [18:41:23.680] base::do.call(base::Sys.setenv, args = args) [18:41:23.680] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:23.680] } [18:41:23.680] else { [18:41:23.680] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:23.680] } [18:41:23.680] { [18:41:23.680] if (base::length(...future.futureOptionsAdded) > [18:41:23.680] 0L) { [18:41:23.680] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:23.680] base::names(opts) <- ...future.futureOptionsAdded [18:41:23.680] base::options(opts) [18:41:23.680] } [18:41:23.680] { [18:41:23.680] { [18:41:23.680] base::options(mc.cores = ...future.mc.cores.old) [18:41:23.680] NULL [18:41:23.680] } [18:41:23.680] options(future.plan = NULL) [18:41:23.680] if (is.na(NA_character_)) [18:41:23.680] Sys.unsetenv("R_FUTURE_PLAN") [18:41:23.680] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:23.680] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:23.680] .init = FALSE) [18:41:23.680] } [18:41:23.680] } [18:41:23.680] } [18:41:23.680] }) [18:41:23.680] if (TRUE) { [18:41:23.680] base::sink(type = "output", split = FALSE) [18:41:23.680] if (TRUE) { [18:41:23.680] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:23.680] } [18:41:23.680] else { [18:41:23.680] ...future.result["stdout"] <- base::list(NULL) [18:41:23.680] } [18:41:23.680] base::close(...future.stdout) [18:41:23.680] ...future.stdout <- NULL [18:41:23.680] } [18:41:23.680] ...future.result$conditions <- ...future.conditions [18:41:23.680] ...future.result$finished <- base::Sys.time() [18:41:23.680] ...future.result [18:41:23.680] } [18:41:23.686] Exporting 5 global objects (1.16 KiB) to cluster node #1 ... [18:41:23.686] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... [18:41:23.686] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... DONE [18:41:23.686] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... [18:41:23.687] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... DONE [18:41:23.687] Exporting '...future.elements_ii' (93 bytes) to cluster node #1 ... [18:41:23.688] Exporting '...future.elements_ii' (93 bytes) to cluster node #1 ... DONE [18:41:23.688] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:23.688] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:23.688] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:23.689] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:23.689] Exporting 5 global objects (1.16 KiB) to cluster node #1 ... DONE [18:41:23.690] MultisessionFuture started [18:41:23.690] - Launch lazy future ... done [18:41:23.690] run() for 'MultisessionFuture' ... done [18:41:23.691] Created future: [18:41:23.704] receiveMessageFromWorker() for ClusterFuture ... [18:41:23.705] - Validating connection of MultisessionFuture [18:41:23.705] - received message: FutureResult [18:41:23.705] - Received FutureResult [18:41:23.706] - Erased future from FutureRegistry [18:41:23.706] result() for ClusterFuture ... [18:41:23.706] - result already collected: FutureResult [18:41:23.706] result() for ClusterFuture ... done [18:41:23.706] receiveMessageFromWorker() for ClusterFuture ... done [18:41:23.691] MultisessionFuture: [18:41:23.691] Label: 'future_lapply-4' [18:41:23.691] Expression: [18:41:23.691] { [18:41:23.691] do.call(function(...) { [18:41:23.691] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:23.691] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:23.691] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:23.691] on.exit(options(oopts), add = TRUE) [18:41:23.691] } [18:41:23.691] { [18:41:23.691] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:23.691] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:23.691] ...future.FUN(...future.X_jj, ...) [18:41:23.691] }) [18:41:23.691] } [18:41:23.691] }, args = future.call.arguments) [18:41:23.691] } [18:41:23.691] Lazy evaluation: FALSE [18:41:23.691] Asynchronous evaluation: TRUE [18:41:23.691] Local evaluation: TRUE [18:41:23.691] Environment: R_GlobalEnv [18:41:23.691] Capture standard output: TRUE [18:41:23.691] Capture condition classes: 'condition' (excluding 'nothing') [18:41:23.691] Globals: 5 objects totaling 755 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 93 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:23.691] Packages: [18:41:23.691] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:23.691] Resolved: TRUE [18:41:23.691] Value: [18:41:23.691] Conditions captured: [18:41:23.691] Early signaling: FALSE [18:41:23.691] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:23.691] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:23.707] Chunk #4 of 4 ... DONE [18:41:23.707] Launching 4 futures (chunks) ... DONE [18:41:23.707] Resolving 4 futures (chunks) ... [18:41:23.707] resolve() on list ... [18:41:23.707] recursive: 0 [18:41:23.708] length: 4 [18:41:23.708] [18:41:23.708] Future #1 [18:41:23.708] result() for ClusterFuture ... [18:41:23.708] - result already collected: FutureResult [18:41:23.708] result() for ClusterFuture ... done [18:41:23.709] result() for ClusterFuture ... [18:41:23.709] - result already collected: FutureResult [18:41:23.709] result() for ClusterFuture ... done [18:41:23.709] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:23.709] - nx: 4 [18:41:23.709] - relay: TRUE [18:41:23.709] - stdout: TRUE [18:41:23.710] - signal: TRUE [18:41:23.710] - resignal: FALSE [18:41:23.710] - force: TRUE [18:41:23.710] - relayed: [n=4] FALSE, FALSE, FALSE, FALSE [18:41:23.710] - queued futures: [n=4] FALSE, FALSE, FALSE, FALSE [18:41:23.710] - until=1 [18:41:23.711] - relaying element #1 [18:41:23.711] result() for ClusterFuture ... [18:41:23.711] - result already collected: FutureResult [18:41:23.711] result() for ClusterFuture ... done [18:41:23.711] result() for ClusterFuture ... [18:41:23.711] - result already collected: FutureResult [18:41:23.711] result() for ClusterFuture ... done [18:41:23.712] result() for ClusterFuture ... [18:41:23.712] - result already collected: FutureResult [18:41:23.712] result() for ClusterFuture ... done [18:41:23.712] result() for ClusterFuture ... [18:41:23.712] - result already collected: FutureResult [18:41:23.712] result() for ClusterFuture ... done [18:41:23.713] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:23.713] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:23.713] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:23.713] length: 3 (resolved future 1) [18:41:23.713] Future #2 [18:41:23.714] result() for ClusterFuture ... [18:41:23.714] - result already collected: FutureResult [18:41:23.714] result() for ClusterFuture ... done [18:41:23.714] result() for ClusterFuture ... [18:41:23.714] - result already collected: FutureResult [18:41:23.714] result() for ClusterFuture ... done [18:41:23.714] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:23.715] - nx: 4 [18:41:23.715] - relay: TRUE [18:41:23.715] - stdout: TRUE [18:41:23.715] - signal: TRUE [18:41:23.715] - resignal: FALSE [18:41:23.715] - force: TRUE [18:41:23.715] - relayed: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:23.716] - queued futures: [n=4] TRUE, FALSE, FALSE, FALSE [18:41:23.716] - until=2 [18:41:23.716] - relaying element #2 [18:41:23.716] result() for ClusterFuture ... [18:41:23.716] - result already collected: FutureResult [18:41:23.716] result() for ClusterFuture ... done [18:41:23.717] result() for ClusterFuture ... [18:41:23.717] - result already collected: FutureResult [18:41:23.717] result() for ClusterFuture ... done [18:41:23.717] result() for ClusterFuture ... [18:41:23.717] - result already collected: FutureResult [18:41:23.717] result() for ClusterFuture ... done [18:41:23.718] result() for ClusterFuture ... [18:41:23.718] - result already collected: FutureResult [18:41:23.720] result() for ClusterFuture ... done [18:41:23.720] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:23.720] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:23.720] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:23.721] length: 2 (resolved future 2) [18:41:23.721] Future #3 [18:41:23.721] result() for ClusterFuture ... [18:41:23.721] - result already collected: FutureResult [18:41:23.721] result() for ClusterFuture ... done [18:41:23.722] result() for ClusterFuture ... [18:41:23.722] - result already collected: FutureResult [18:41:23.722] result() for ClusterFuture ... done [18:41:23.722] signalConditionsASAP(MultisessionFuture, pos=3) ... [18:41:23.722] - nx: 4 [18:41:23.722] - relay: TRUE [18:41:23.722] - stdout: TRUE [18:41:23.723] - signal: TRUE [18:41:23.723] - resignal: FALSE [18:41:23.723] - force: TRUE [18:41:23.723] - relayed: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:23.723] - queued futures: [n=4] TRUE, TRUE, FALSE, FALSE [18:41:23.723] - until=3 [18:41:23.723] - relaying element #3 [18:41:23.724] result() for ClusterFuture ... [18:41:23.724] - result already collected: FutureResult [18:41:23.724] result() for ClusterFuture ... done [18:41:23.724] result() for ClusterFuture ... [18:41:23.724] - result already collected: FutureResult [18:41:23.724] result() for ClusterFuture ... done [18:41:23.725] result() for ClusterFuture ... [18:41:23.725] - result already collected: FutureResult [18:41:23.725] result() for ClusterFuture ... done [18:41:23.725] result() for ClusterFuture ... [18:41:23.725] - result already collected: FutureResult [18:41:23.725] result() for ClusterFuture ... done [18:41:23.726] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:23.726] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:23.726] signalConditionsASAP(MultisessionFuture, pos=3) ... done [18:41:23.726] length: 1 (resolved future 3) [18:41:23.726] Future #4 [18:41:23.726] result() for ClusterFuture ... [18:41:23.727] - result already collected: FutureResult [18:41:23.727] result() for ClusterFuture ... done [18:41:23.727] result() for ClusterFuture ... [18:41:23.727] - result already collected: FutureResult [18:41:23.727] result() for ClusterFuture ... done [18:41:23.727] signalConditionsASAP(MultisessionFuture, pos=4) ... [18:41:23.728] - nx: 4 [18:41:23.728] - relay: TRUE [18:41:23.728] - stdout: TRUE [18:41:23.728] - signal: TRUE [18:41:23.728] - resignal: FALSE [18:41:23.728] - force: TRUE [18:41:23.728] - relayed: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:23.729] - queued futures: [n=4] TRUE, TRUE, TRUE, FALSE [18:41:23.729] - until=4 [18:41:23.729] - relaying element #4 [18:41:23.729] result() for ClusterFuture ... [18:41:23.729] - result already collected: FutureResult [18:41:23.729] result() for ClusterFuture ... done [18:41:23.730] result() for ClusterFuture ... [18:41:23.730] - result already collected: FutureResult [18:41:23.730] result() for ClusterFuture ... done [18:41:23.730] result() for ClusterFuture ... [18:41:23.730] - result already collected: FutureResult [18:41:23.730] result() for ClusterFuture ... done [18:41:23.731] result() for ClusterFuture ... [18:41:23.731] - result already collected: FutureResult [18:41:23.731] result() for ClusterFuture ... done [18:41:23.731] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:23.731] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:23.731] signalConditionsASAP(MultisessionFuture, pos=4) ... done [18:41:23.731] length: 0 (resolved future 4) [18:41:23.732] Relaying remaining futures [18:41:23.732] signalConditionsASAP(NULL, pos=0) ... [18:41:23.732] - nx: 4 [18:41:23.732] - relay: TRUE [18:41:23.732] - stdout: TRUE [18:41:23.732] - signal: TRUE [18:41:23.733] - resignal: FALSE [18:41:23.733] - force: TRUE [18:41:23.733] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:23.733] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE - flush all [18:41:23.733] - relayed: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:23.733] - queued futures: [n=4] TRUE, TRUE, TRUE, TRUE [18:41:23.734] signalConditionsASAP(NULL, pos=0) ... done [18:41:23.734] resolve() on list ... DONE [18:41:23.734] result() for ClusterFuture ... [18:41:23.734] - result already collected: FutureResult [18:41:23.734] result() for ClusterFuture ... done [18:41:23.734] result() for ClusterFuture ... [18:41:23.734] - result already collected: FutureResult [18:41:23.735] result() for ClusterFuture ... done [18:41:23.735] result() for ClusterFuture ... [18:41:23.735] - result already collected: FutureResult [18:41:23.735] result() for ClusterFuture ... done [18:41:23.735] result() for ClusterFuture ... [18:41:23.735] - result already collected: FutureResult [18:41:23.736] result() for ClusterFuture ... done [18:41:23.736] result() for ClusterFuture ... [18:41:23.736] - result already collected: FutureResult [18:41:23.737] result() for ClusterFuture ... done [18:41:23.737] result() for ClusterFuture ... [18:41:23.737] - result already collected: FutureResult [18:41:23.737] result() for ClusterFuture ... done [18:41:23.737] result() for ClusterFuture ... [18:41:23.737] - result already collected: FutureResult [18:41:23.738] result() for ClusterFuture ... done [18:41:23.738] result() for ClusterFuture ... [18:41:23.738] - result already collected: FutureResult [18:41:23.738] result() for ClusterFuture ... done [18:41:23.738] - Number of value chunks collected: 4 [18:41:23.738] Resolving 4 futures (chunks) ... DONE [18:41:23.739] Reducing values from 4 chunks ... [18:41:23.739] - Number of values collected after concatenation: 4 [18:41:23.739] - Number of values expected: 4 [18:41:23.739] Reducing values from 4 chunks ... DONE [18:41:23.739] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL - future_lapply(x, FUN = future:::hpaste, ...) ... [18:41:23.742] future_lapply() ... [18:41:23.753] Number of chunks: 1 [18:41:23.753] getGlobalsAndPackagesXApply() ... [18:41:23.753] - future.globals: TRUE [18:41:23.753] getGlobalsAndPackages() ... [18:41:23.754] Searching for globals... [18:41:23.763] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [18:41:23.763] Searching for globals ... DONE [18:41:23.763] Resolving globals: FALSE [18:41:23.765] The total size of the 1 globals is 7.17 KiB (7342 bytes) [18:41:23.765] The total size of the 1 globals exported for future expression ('FUN(collapse = "; ", maxHead = 3L)') is 7.17 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (7.17 KiB of class 'function') [18:41:23.765] - globals: [1] 'FUN' [18:41:23.765] - packages: [1] 'future' [18:41:23.766] getGlobalsAndPackages() ... DONE [18:41:23.766] - globals found/used: [n=1] 'FUN' [18:41:23.766] - needed namespaces: [n=1] 'future' [18:41:23.766] Finding globals ... DONE [18:41:23.766] - use_args: TRUE [18:41:23.766] - Getting '...' globals ... [18:41:23.767] resolve() on list ... [18:41:23.767] recursive: 0 [18:41:23.767] length: 1 [18:41:23.767] elements: '...' [18:41:23.768] length: 0 (resolved future 1) [18:41:23.768] resolve() on list ... DONE [18:41:23.768] - '...' content: [n=2] 'collapse', 'maxHead' [18:41:23.768] List of 1 [18:41:23.768] $ ...:List of 2 [18:41:23.768] ..$ collapse: chr "; " [18:41:23.768] ..$ maxHead : int 3 [18:41:23.768] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:23.768] - attr(*, "where")=List of 1 [18:41:23.768] ..$ ...: [18:41:23.768] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:23.768] - attr(*, "resolved")= logi TRUE [18:41:23.768] - attr(*, "total_size")= num NA [18:41:23.772] - Getting '...' globals ... DONE [18:41:23.772] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:23.772] List of 2 [18:41:23.772] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [18:41:23.772] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [18:41:23.772] $ ... :List of 2 [18:41:23.772] ..$ collapse: chr "; " [18:41:23.772] ..$ maxHead : int 3 [18:41:23.772] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:23.772] - attr(*, "where")=List of 2 [18:41:23.772] ..$ ...future.FUN: [18:41:23.772] ..$ ... : [18:41:23.772] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:23.772] - attr(*, "resolved")= logi FALSE [18:41:23.772] - attr(*, "total_size")= int 20301 [18:41:23.776] Packages to be attached in all futures: [n=1] 'future' [18:41:23.777] getGlobalsAndPackagesXApply() ... DONE [18:41:23.777] Number of futures (= number of chunks): 1 [18:41:23.777] Launching 1 futures (chunks) ... [18:41:23.777] Chunk #1 of 1 ... [18:41:23.777] - Finding globals in 'X' for chunk #1 ... [18:41:23.777] getGlobalsAndPackages() ... [18:41:23.778] Searching for globals... [18:41:23.778] [18:41:23.778] Searching for globals ... DONE [18:41:23.778] - globals: [0] [18:41:23.778] getGlobalsAndPackages() ... DONE [18:41:23.779] + additional globals found: [n=0] [18:41:23.779] + additional namespaces needed: [n=0] [18:41:23.779] - Finding globals in 'X' for chunk #1 ... DONE [18:41:23.779] - seeds: [18:41:23.779] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:23.779] getGlobalsAndPackages() ... [18:41:23.780] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:23.780] Resolving globals: FALSE [18:41:23.780] Tweak future expression to call with '...' arguments ... [18:41:23.780] { [18:41:23.780] do.call(function(...) { [18:41:23.780] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:23.780] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:23.780] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:23.780] on.exit(options(oopts), add = TRUE) [18:41:23.780] } [18:41:23.780] { [18:41:23.780] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:23.780] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:23.780] ...future.FUN(...future.X_jj, ...) [18:41:23.780] }) [18:41:23.780] } [18:41:23.780] }, args = future.call.arguments) [18:41:23.780] } [18:41:23.781] Tweak future expression to call with '...' arguments ... DONE [18:41:23.781] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:23.781] - packages: [1] 'future' [18:41:23.781] getGlobalsAndPackages() ... DONE [18:41:23.782] run() for 'Future' ... [18:41:23.782] - state: 'created' [18:41:23.782] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:23.797] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:23.798] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:23.798] - Field: 'node' [18:41:23.798] - Field: 'label' [18:41:23.798] - Field: 'local' [18:41:23.798] - Field: 'owner' [18:41:23.798] - Field: 'envir' [18:41:23.799] - Field: 'workers' [18:41:23.799] - Field: 'packages' [18:41:23.799] - Field: 'gc' [18:41:23.799] - Field: 'conditions' [18:41:23.799] - Field: 'persistent' [18:41:23.800] - Field: 'expr' [18:41:23.800] - Field: 'uuid' [18:41:23.800] - Field: 'seed' [18:41:23.800] - Field: 'version' [18:41:23.800] - Field: 'result' [18:41:23.801] - Field: 'asynchronous' [18:41:23.801] - Field: 'calls' [18:41:23.801] - Field: 'globals' [18:41:23.801] - Field: 'stdout' [18:41:23.801] - Field: 'earlySignal' [18:41:23.801] - Field: 'lazy' [18:41:23.802] - Field: 'state' [18:41:23.802] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:23.802] - Launch lazy future ... [18:41:23.802] Packages needed by the future expression (n = 1): 'future' [18:41:23.802] Packages needed by future strategies (n = 0): [18:41:23.803] { [18:41:23.803] { [18:41:23.803] { [18:41:23.803] ...future.startTime <- base::Sys.time() [18:41:23.803] { [18:41:23.803] { [18:41:23.803] { [18:41:23.803] { [18:41:23.803] { [18:41:23.803] base::local({ [18:41:23.803] has_future <- base::requireNamespace("future", [18:41:23.803] quietly = TRUE) [18:41:23.803] if (has_future) { [18:41:23.803] ns <- base::getNamespace("future") [18:41:23.803] version <- ns[[".package"]][["version"]] [18:41:23.803] if (is.null(version)) [18:41:23.803] version <- utils::packageVersion("future") [18:41:23.803] } [18:41:23.803] else { [18:41:23.803] version <- NULL [18:41:23.803] } [18:41:23.803] if (!has_future || version < "1.8.0") { [18:41:23.803] info <- base::c(r_version = base::gsub("R version ", [18:41:23.803] "", base::R.version$version.string), [18:41:23.803] platform = base::sprintf("%s (%s-bit)", [18:41:23.803] base::R.version$platform, 8 * [18:41:23.803] base::.Machine$sizeof.pointer), [18:41:23.803] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:23.803] "release", "version")], collapse = " "), [18:41:23.803] hostname = base::Sys.info()[["nodename"]]) [18:41:23.803] info <- base::sprintf("%s: %s", base::names(info), [18:41:23.803] info) [18:41:23.803] info <- base::paste(info, collapse = "; ") [18:41:23.803] if (!has_future) { [18:41:23.803] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:23.803] info) [18:41:23.803] } [18:41:23.803] else { [18:41:23.803] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:23.803] info, version) [18:41:23.803] } [18:41:23.803] base::stop(msg) [18:41:23.803] } [18:41:23.803] }) [18:41:23.803] } [18:41:23.803] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:23.803] base::options(mc.cores = 1L) [18:41:23.803] } [18:41:23.803] base::local({ [18:41:23.803] for (pkg in "future") { [18:41:23.803] base::loadNamespace(pkg) [18:41:23.803] base::library(pkg, character.only = TRUE) [18:41:23.803] } [18:41:23.803] }) [18:41:23.803] } [18:41:23.803] ...future.strategy.old <- future::plan("list") [18:41:23.803] options(future.plan = NULL) [18:41:23.803] Sys.unsetenv("R_FUTURE_PLAN") [18:41:23.803] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:23.803] } [18:41:23.803] ...future.workdir <- getwd() [18:41:23.803] } [18:41:23.803] ...future.oldOptions <- base::as.list(base::.Options) [18:41:23.803] ...future.oldEnvVars <- base::Sys.getenv() [18:41:23.803] } [18:41:23.803] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:23.803] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:23.803] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:23.803] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:23.803] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:23.803] future.stdout.windows.reencode = NULL, width = 80L) [18:41:23.803] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:23.803] base::names(...future.oldOptions)) [18:41:23.803] } [18:41:23.803] if (FALSE) { [18:41:23.803] } [18:41:23.803] else { [18:41:23.803] if (TRUE) { [18:41:23.803] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:23.803] open = "w") [18:41:23.803] } [18:41:23.803] else { [18:41:23.803] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:23.803] windows = "NUL", "/dev/null"), open = "w") [18:41:23.803] } [18:41:23.803] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:23.803] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:23.803] base::sink(type = "output", split = FALSE) [18:41:23.803] base::close(...future.stdout) [18:41:23.803] }, add = TRUE) [18:41:23.803] } [18:41:23.803] ...future.frame <- base::sys.nframe() [18:41:23.803] ...future.conditions <- base::list() [18:41:23.803] ...future.rng <- base::globalenv()$.Random.seed [18:41:23.803] if (FALSE) { [18:41:23.803] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:23.803] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:23.803] } [18:41:23.803] ...future.result <- base::tryCatch({ [18:41:23.803] base::withCallingHandlers({ [18:41:23.803] ...future.value <- base::withVisible(base::local({ [18:41:23.803] ...future.makeSendCondition <- base::local({ [18:41:23.803] sendCondition <- NULL [18:41:23.803] function(frame = 1L) { [18:41:23.803] if (is.function(sendCondition)) [18:41:23.803] return(sendCondition) [18:41:23.803] ns <- getNamespace("parallel") [18:41:23.803] if (exists("sendData", mode = "function", [18:41:23.803] envir = ns)) { [18:41:23.803] parallel_sendData <- get("sendData", mode = "function", [18:41:23.803] envir = ns) [18:41:23.803] envir <- sys.frame(frame) [18:41:23.803] master <- NULL [18:41:23.803] while (!identical(envir, .GlobalEnv) && [18:41:23.803] !identical(envir, emptyenv())) { [18:41:23.803] if (exists("master", mode = "list", envir = envir, [18:41:23.803] inherits = FALSE)) { [18:41:23.803] master <- get("master", mode = "list", [18:41:23.803] envir = envir, inherits = FALSE) [18:41:23.803] if (inherits(master, c("SOCKnode", [18:41:23.803] "SOCK0node"))) { [18:41:23.803] sendCondition <<- function(cond) { [18:41:23.803] data <- list(type = "VALUE", value = cond, [18:41:23.803] success = TRUE) [18:41:23.803] parallel_sendData(master, data) [18:41:23.803] } [18:41:23.803] return(sendCondition) [18:41:23.803] } [18:41:23.803] } [18:41:23.803] frame <- frame + 1L [18:41:23.803] envir <- sys.frame(frame) [18:41:23.803] } [18:41:23.803] } [18:41:23.803] sendCondition <<- function(cond) NULL [18:41:23.803] } [18:41:23.803] }) [18:41:23.803] withCallingHandlers({ [18:41:23.803] { [18:41:23.803] do.call(function(...) { [18:41:23.803] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:23.803] if (!identical(...future.globals.maxSize.org, [18:41:23.803] ...future.globals.maxSize)) { [18:41:23.803] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:23.803] on.exit(options(oopts), add = TRUE) [18:41:23.803] } [18:41:23.803] { [18:41:23.803] lapply(seq_along(...future.elements_ii), [18:41:23.803] FUN = function(jj) { [18:41:23.803] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:23.803] ...future.FUN(...future.X_jj, ...) [18:41:23.803] }) [18:41:23.803] } [18:41:23.803] }, args = future.call.arguments) [18:41:23.803] } [18:41:23.803] }, immediateCondition = function(cond) { [18:41:23.803] sendCondition <- ...future.makeSendCondition() [18:41:23.803] sendCondition(cond) [18:41:23.803] muffleCondition <- function (cond, pattern = "^muffle") [18:41:23.803] { [18:41:23.803] inherits <- base::inherits [18:41:23.803] invokeRestart <- base::invokeRestart [18:41:23.803] is.null <- base::is.null [18:41:23.803] muffled <- FALSE [18:41:23.803] if (inherits(cond, "message")) { [18:41:23.803] muffled <- grepl(pattern, "muffleMessage") [18:41:23.803] if (muffled) [18:41:23.803] invokeRestart("muffleMessage") [18:41:23.803] } [18:41:23.803] else if (inherits(cond, "warning")) { [18:41:23.803] muffled <- grepl(pattern, "muffleWarning") [18:41:23.803] if (muffled) [18:41:23.803] invokeRestart("muffleWarning") [18:41:23.803] } [18:41:23.803] else if (inherits(cond, "condition")) { [18:41:23.803] if (!is.null(pattern)) { [18:41:23.803] computeRestarts <- base::computeRestarts [18:41:23.803] grepl <- base::grepl [18:41:23.803] restarts <- computeRestarts(cond) [18:41:23.803] for (restart in restarts) { [18:41:23.803] name <- restart$name [18:41:23.803] if (is.null(name)) [18:41:23.803] next [18:41:23.803] if (!grepl(pattern, name)) [18:41:23.803] next [18:41:23.803] invokeRestart(restart) [18:41:23.803] muffled <- TRUE [18:41:23.803] break [18:41:23.803] } [18:41:23.803] } [18:41:23.803] } [18:41:23.803] invisible(muffled) [18:41:23.803] } [18:41:23.803] muffleCondition(cond) [18:41:23.803] }) [18:41:23.803] })) [18:41:23.803] future::FutureResult(value = ...future.value$value, [18:41:23.803] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:23.803] ...future.rng), globalenv = if (FALSE) [18:41:23.803] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:23.803] ...future.globalenv.names)) [18:41:23.803] else NULL, started = ...future.startTime, version = "1.8") [18:41:23.803] }, condition = base::local({ [18:41:23.803] c <- base::c [18:41:23.803] inherits <- base::inherits [18:41:23.803] invokeRestart <- base::invokeRestart [18:41:23.803] length <- base::length [18:41:23.803] list <- base::list [18:41:23.803] seq.int <- base::seq.int [18:41:23.803] signalCondition <- base::signalCondition [18:41:23.803] sys.calls <- base::sys.calls [18:41:23.803] `[[` <- base::`[[` [18:41:23.803] `+` <- base::`+` [18:41:23.803] `<<-` <- base::`<<-` [18:41:23.803] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:23.803] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:23.803] 3L)] [18:41:23.803] } [18:41:23.803] function(cond) { [18:41:23.803] is_error <- inherits(cond, "error") [18:41:23.803] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:23.803] NULL) [18:41:23.803] if (is_error) { [18:41:23.803] sessionInformation <- function() { [18:41:23.803] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:23.803] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:23.803] search = base::search(), system = base::Sys.info()) [18:41:23.803] } [18:41:23.803] ...future.conditions[[length(...future.conditions) + [18:41:23.803] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:23.803] cond$call), session = sessionInformation(), [18:41:23.803] timestamp = base::Sys.time(), signaled = 0L) [18:41:23.803] signalCondition(cond) [18:41:23.803] } [18:41:23.803] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:23.803] "immediateCondition"))) { [18:41:23.803] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:23.803] ...future.conditions[[length(...future.conditions) + [18:41:23.803] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:23.803] if (TRUE && !signal) { [18:41:23.803] muffleCondition <- function (cond, pattern = "^muffle") [18:41:23.803] { [18:41:23.803] inherits <- base::inherits [18:41:23.803] invokeRestart <- base::invokeRestart [18:41:23.803] is.null <- base::is.null [18:41:23.803] muffled <- FALSE [18:41:23.803] if (inherits(cond, "message")) { [18:41:23.803] muffled <- grepl(pattern, "muffleMessage") [18:41:23.803] if (muffled) [18:41:23.803] invokeRestart("muffleMessage") [18:41:23.803] } [18:41:23.803] else if (inherits(cond, "warning")) { [18:41:23.803] muffled <- grepl(pattern, "muffleWarning") [18:41:23.803] if (muffled) [18:41:23.803] invokeRestart("muffleWarning") [18:41:23.803] } [18:41:23.803] else if (inherits(cond, "condition")) { [18:41:23.803] if (!is.null(pattern)) { [18:41:23.803] computeRestarts <- base::computeRestarts [18:41:23.803] grepl <- base::grepl [18:41:23.803] restarts <- computeRestarts(cond) [18:41:23.803] for (restart in restarts) { [18:41:23.803] name <- restart$name [18:41:23.803] if (is.null(name)) [18:41:23.803] next [18:41:23.803] if (!grepl(pattern, name)) [18:41:23.803] next [18:41:23.803] invokeRestart(restart) [18:41:23.803] muffled <- TRUE [18:41:23.803] break [18:41:23.803] } [18:41:23.803] } [18:41:23.803] } [18:41:23.803] invisible(muffled) [18:41:23.803] } [18:41:23.803] muffleCondition(cond, pattern = "^muffle") [18:41:23.803] } [18:41:23.803] } [18:41:23.803] else { [18:41:23.803] if (TRUE) { [18:41:23.803] muffleCondition <- function (cond, pattern = "^muffle") [18:41:23.803] { [18:41:23.803] inherits <- base::inherits [18:41:23.803] invokeRestart <- base::invokeRestart [18:41:23.803] is.null <- base::is.null [18:41:23.803] muffled <- FALSE [18:41:23.803] if (inherits(cond, "message")) { [18:41:23.803] muffled <- grepl(pattern, "muffleMessage") [18:41:23.803] if (muffled) [18:41:23.803] invokeRestart("muffleMessage") [18:41:23.803] } [18:41:23.803] else if (inherits(cond, "warning")) { [18:41:23.803] muffled <- grepl(pattern, "muffleWarning") [18:41:23.803] if (muffled) [18:41:23.803] invokeRestart("muffleWarning") [18:41:23.803] } [18:41:23.803] else if (inherits(cond, "condition")) { [18:41:23.803] if (!is.null(pattern)) { [18:41:23.803] computeRestarts <- base::computeRestarts [18:41:23.803] grepl <- base::grepl [18:41:23.803] restarts <- computeRestarts(cond) [18:41:23.803] for (restart in restarts) { [18:41:23.803] name <- restart$name [18:41:23.803] if (is.null(name)) [18:41:23.803] next [18:41:23.803] if (!grepl(pattern, name)) [18:41:23.803] next [18:41:23.803] invokeRestart(restart) [18:41:23.803] muffled <- TRUE [18:41:23.803] break [18:41:23.803] } [18:41:23.803] } [18:41:23.803] } [18:41:23.803] invisible(muffled) [18:41:23.803] } [18:41:23.803] muffleCondition(cond, pattern = "^muffle") [18:41:23.803] } [18:41:23.803] } [18:41:23.803] } [18:41:23.803] })) [18:41:23.803] }, error = function(ex) { [18:41:23.803] base::structure(base::list(value = NULL, visible = NULL, [18:41:23.803] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:23.803] ...future.rng), started = ...future.startTime, [18:41:23.803] finished = Sys.time(), session_uuid = NA_character_, [18:41:23.803] version = "1.8"), class = "FutureResult") [18:41:23.803] }, finally = { [18:41:23.803] if (!identical(...future.workdir, getwd())) [18:41:23.803] setwd(...future.workdir) [18:41:23.803] { [18:41:23.803] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:23.803] ...future.oldOptions$nwarnings <- NULL [18:41:23.803] } [18:41:23.803] base::options(...future.oldOptions) [18:41:23.803] if (.Platform$OS.type == "windows") { [18:41:23.803] old_names <- names(...future.oldEnvVars) [18:41:23.803] envs <- base::Sys.getenv() [18:41:23.803] names <- names(envs) [18:41:23.803] common <- intersect(names, old_names) [18:41:23.803] added <- setdiff(names, old_names) [18:41:23.803] removed <- setdiff(old_names, names) [18:41:23.803] changed <- common[...future.oldEnvVars[common] != [18:41:23.803] envs[common]] [18:41:23.803] NAMES <- toupper(changed) [18:41:23.803] args <- list() [18:41:23.803] for (kk in seq_along(NAMES)) { [18:41:23.803] name <- changed[[kk]] [18:41:23.803] NAME <- NAMES[[kk]] [18:41:23.803] if (name != NAME && is.element(NAME, old_names)) [18:41:23.803] next [18:41:23.803] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:23.803] } [18:41:23.803] NAMES <- toupper(added) [18:41:23.803] for (kk in seq_along(NAMES)) { [18:41:23.803] name <- added[[kk]] [18:41:23.803] NAME <- NAMES[[kk]] [18:41:23.803] if (name != NAME && is.element(NAME, old_names)) [18:41:23.803] next [18:41:23.803] args[[name]] <- "" [18:41:23.803] } [18:41:23.803] NAMES <- toupper(removed) [18:41:23.803] for (kk in seq_along(NAMES)) { [18:41:23.803] name <- removed[[kk]] [18:41:23.803] NAME <- NAMES[[kk]] [18:41:23.803] if (name != NAME && is.element(NAME, old_names)) [18:41:23.803] next [18:41:23.803] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:23.803] } [18:41:23.803] if (length(args) > 0) [18:41:23.803] base::do.call(base::Sys.setenv, args = args) [18:41:23.803] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:23.803] } [18:41:23.803] else { [18:41:23.803] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:23.803] } [18:41:23.803] { [18:41:23.803] if (base::length(...future.futureOptionsAdded) > [18:41:23.803] 0L) { [18:41:23.803] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:23.803] base::names(opts) <- ...future.futureOptionsAdded [18:41:23.803] base::options(opts) [18:41:23.803] } [18:41:23.803] { [18:41:23.803] { [18:41:23.803] base::options(mc.cores = ...future.mc.cores.old) [18:41:23.803] NULL [18:41:23.803] } [18:41:23.803] options(future.plan = NULL) [18:41:23.803] if (is.na(NA_character_)) [18:41:23.803] Sys.unsetenv("R_FUTURE_PLAN") [18:41:23.803] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:23.803] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:23.803] .init = FALSE) [18:41:23.803] } [18:41:23.803] } [18:41:23.803] } [18:41:23.803] }) [18:41:23.803] if (TRUE) { [18:41:23.803] base::sink(type = "output", split = FALSE) [18:41:23.803] if (TRUE) { [18:41:23.803] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:23.803] } [18:41:23.803] else { [18:41:23.803] ...future.result["stdout"] <- base::list(NULL) [18:41:23.803] } [18:41:23.803] base::close(...future.stdout) [18:41:23.803] ...future.stdout <- NULL [18:41:23.803] } [18:41:23.803] ...future.result$conditions <- ...future.conditions [18:41:23.803] ...future.result$finished <- base::Sys.time() [18:41:23.803] ...future.result [18:41:23.803] } [18:41:23.808] Exporting 5 global objects (9.99 KiB) to cluster node #1 ... [18:41:23.809] Exporting '...future.FUN' (7.17 KiB) to cluster node #1 ... [18:41:23.809] Exporting '...future.FUN' (7.17 KiB) to cluster node #1 ... DONE [18:41:23.809] Exporting 'future.call.arguments' (187 bytes) to cluster node #1 ... [18:41:23.810] Exporting 'future.call.arguments' (187 bytes) to cluster node #1 ... DONE [18:41:23.810] Exporting '...future.elements_ii' (2.15 KiB) to cluster node #1 ... [18:41:23.810] Exporting '...future.elements_ii' (2.15 KiB) to cluster node #1 ... DONE [18:41:23.811] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:23.811] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:23.811] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:23.811] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:23.812] Exporting 5 global objects (9.99 KiB) to cluster node #1 ... DONE [18:41:23.812] MultisessionFuture started [18:41:23.812] - Launch lazy future ... done [18:41:23.813] run() for 'MultisessionFuture' ... done [18:41:23.813] Created future: [18:41:23.834] receiveMessageFromWorker() for ClusterFuture ... [18:41:23.835] - Validating connection of MultisessionFuture [18:41:23.835] - received message: FutureResult [18:41:23.835] - Received FutureResult [18:41:23.835] - Erased future from FutureRegistry [18:41:23.836] result() for ClusterFuture ... [18:41:23.836] - result already collected: FutureResult [18:41:23.836] result() for ClusterFuture ... done [18:41:23.836] receiveMessageFromWorker() for ClusterFuture ... done [18:41:23.813] MultisessionFuture: [18:41:23.813] Label: 'future_lapply-1' [18:41:23.813] Expression: [18:41:23.813] { [18:41:23.813] do.call(function(...) { [18:41:23.813] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:23.813] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:23.813] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:23.813] on.exit(options(oopts), add = TRUE) [18:41:23.813] } [18:41:23.813] { [18:41:23.813] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:23.813] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:23.813] ...future.FUN(...future.X_jj, ...) [18:41:23.813] }) [18:41:23.813] } [18:41:23.813] }, args = future.call.arguments) [18:41:23.813] } [18:41:23.813] Lazy evaluation: FALSE [18:41:23.813] Asynchronous evaluation: TRUE [18:41:23.813] Local evaluation: TRUE [18:41:23.813] Environment: R_GlobalEnv [18:41:23.813] Capture standard output: TRUE [18:41:23.813] Capture condition classes: 'condition' (excluding 'nothing') [18:41:23.813] Globals: 5 objects totaling 9.56 KiB (function '...future.FUN' of 7.17 KiB, DotDotDotList 'future.call.arguments' of 187 bytes, list '...future.elements_ii' of 2.15 KiB, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:23.813] Packages: 1 packages ('future') [18:41:23.813] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:23.813] Resolved: TRUE [18:41:23.813] Value: [18:41:23.813] Conditions captured: [18:41:23.813] Early signaling: FALSE [18:41:23.813] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:23.813] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:23.836] Chunk #1 of 1 ... DONE [18:41:23.837] Launching 1 futures (chunks) ... DONE [18:41:23.837] Resolving 1 futures (chunks) ... [18:41:23.837] resolve() on list ... [18:41:23.837] recursive: 0 [18:41:23.837] length: 1 [18:41:23.837] [18:41:23.838] Future #1 [18:41:23.838] result() for ClusterFuture ... [18:41:23.838] - result already collected: FutureResult [18:41:23.838] result() for ClusterFuture ... done [18:41:23.838] result() for ClusterFuture ... [18:41:23.838] - result already collected: FutureResult [18:41:23.839] result() for ClusterFuture ... done [18:41:23.839] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:23.839] - nx: 1 [18:41:23.839] - relay: TRUE [18:41:23.839] - stdout: TRUE [18:41:23.839] - signal: TRUE [18:41:23.839] - resignal: FALSE [18:41:23.840] - force: TRUE [18:41:23.840] - relayed: [n=1] FALSE [18:41:23.840] - queued futures: [n=1] FALSE [18:41:23.840] - until=1 [18:41:23.840] - relaying element #1 [18:41:23.840] result() for ClusterFuture ... [18:41:23.841] - result already collected: FutureResult [18:41:23.841] result() for ClusterFuture ... done [18:41:23.841] result() for ClusterFuture ... [18:41:23.841] - result already collected: FutureResult [18:41:23.841] result() for ClusterFuture ... done [18:41:23.841] result() for ClusterFuture ... [18:41:23.842] - result already collected: FutureResult [18:41:23.842] result() for ClusterFuture ... done [18:41:23.842] result() for ClusterFuture ... [18:41:23.842] - result already collected: FutureResult [18:41:23.842] result() for ClusterFuture ... done [18:41:23.842] - relayed: [n=1] TRUE [18:41:23.842] - queued futures: [n=1] TRUE [18:41:23.843] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:23.843] length: 0 (resolved future 1) [18:41:23.843] Relaying remaining futures [18:41:23.843] signalConditionsASAP(NULL, pos=0) ... [18:41:23.843] - nx: 1 [18:41:23.843] - relay: TRUE [18:41:23.844] - stdout: TRUE [18:41:23.844] - signal: TRUE [18:41:23.844] - resignal: FALSE [18:41:23.844] - force: TRUE [18:41:23.844] - relayed: [n=1] TRUE [18:41:23.844] - queued futures: [n=1] TRUE - flush all [18:41:23.845] - relayed: [n=1] TRUE [18:41:23.845] - queued futures: [n=1] TRUE [18:41:23.845] signalConditionsASAP(NULL, pos=0) ... done [18:41:23.846] resolve() on list ... DONE [18:41:23.846] result() for ClusterFuture ... [18:41:23.846] - result already collected: FutureResult [18:41:23.846] result() for ClusterFuture ... done [18:41:23.846] result() for ClusterFuture ... [18:41:23.846] - result already collected: FutureResult [18:41:23.846] result() for ClusterFuture ... done [18:41:23.847] - Number of value chunks collected: 1 [18:41:23.847] Resolving 1 futures (chunks) ... DONE [18:41:23.847] Reducing values from 1 chunks ... [18:41:23.847] - Number of values collected after concatenation: 1 [18:41:23.847] - Number of values expected: 1 [18:41:23.847] Reducing values from 1 chunks ... DONE [18:41:23.848] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [18:41:23.849] future_lapply() ... [18:41:23.852] Number of chunks: 2 [18:41:23.852] getGlobalsAndPackagesXApply() ... [18:41:23.852] - future.globals: TRUE [18:41:23.852] getGlobalsAndPackages() ... [18:41:23.853] Searching for globals... [18:41:23.854] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [18:41:23.854] Searching for globals ... DONE [18:41:23.854] Resolving globals: FALSE [18:41:23.855] The total size of the 1 globals is 911 bytes (911 bytes) [18:41:23.855] The total size of the 1 globals exported for future expression ('FUN()') is 911 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (911 bytes of class 'function') [18:41:23.856] - globals: [1] 'FUN' [18:41:23.856] - packages: [1] 'listenv' [18:41:23.856] getGlobalsAndPackages() ... DONE [18:41:23.856] - globals found/used: [n=1] 'FUN' [18:41:23.856] - needed namespaces: [n=1] 'listenv' [18:41:23.857] Finding globals ... DONE [18:41:23.857] - use_args: TRUE [18:41:23.857] - Getting '...' globals ... [18:41:23.857] resolve() on list ... [18:41:23.858] recursive: 0 [18:41:23.858] length: 1 [18:41:23.858] elements: '...' [18:41:23.858] length: 0 (resolved future 1) [18:41:23.858] resolve() on list ... DONE [18:41:23.858] - '...' content: [n=0] [18:41:23.859] List of 1 [18:41:23.859] $ ...: list() [18:41:23.859] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:23.859] - attr(*, "where")=List of 1 [18:41:23.859] ..$ ...: [18:41:23.859] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:23.859] - attr(*, "resolved")= logi TRUE [18:41:23.859] - attr(*, "total_size")= num NA [18:41:23.864] - Getting '...' globals ... DONE [18:41:23.864] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:23.864] List of 2 [18:41:23.864] $ ...future.FUN:function (x, ...) [18:41:23.864] $ ... : list() [18:41:23.864] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:23.864] - attr(*, "where")=List of 2 [18:41:23.864] ..$ ...future.FUN: [18:41:23.864] ..$ ... : [18:41:23.864] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:23.864] - attr(*, "resolved")= logi FALSE [18:41:23.864] - attr(*, "total_size")= int 8145 [18:41:23.868] Packages to be attached in all futures: [n=1] 'listenv' [18:41:23.868] getGlobalsAndPackagesXApply() ... DONE [18:41:23.868] Number of futures (= number of chunks): 2 [18:41:23.868] Launching 2 futures (chunks) ... [18:41:23.868] Chunk #1 of 2 ... [18:41:23.869] - Finding globals in 'X' for chunk #1 ... [18:41:23.869] getGlobalsAndPackages() ... [18:41:23.869] Searching for globals... [18:41:23.869] [18:41:23.870] Searching for globals ... DONE [18:41:23.870] - globals: [0] [18:41:23.870] getGlobalsAndPackages() ... DONE [18:41:23.870] + additional globals found: [n=0] [18:41:23.870] + additional namespaces needed: [n=0] [18:41:23.870] - Finding globals in 'X' for chunk #1 ... DONE [18:41:23.871] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:23.871] - seeds: [18:41:23.871] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:23.871] getGlobalsAndPackages() ... [18:41:23.871] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:23.871] Resolving globals: FALSE [18:41:23.872] Tweak future expression to call with '...' arguments ... [18:41:23.872] { [18:41:23.872] do.call(function(...) { [18:41:23.872] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:23.872] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:23.872] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:23.872] on.exit(options(oopts), add = TRUE) [18:41:23.872] } [18:41:23.872] { [18:41:23.872] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:23.872] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:23.872] ...future.FUN(...future.X_jj, ...) [18:41:23.872] }) [18:41:23.872] } [18:41:23.872] }, args = future.call.arguments) [18:41:23.872] } [18:41:23.872] Tweak future expression to call with '...' arguments ... DONE [18:41:23.873] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:23.873] - packages: [1] 'listenv' [18:41:23.873] getGlobalsAndPackages() ... DONE [18:41:23.873] run() for 'Future' ... [18:41:23.874] - state: 'created' [18:41:23.874] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:23.890] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:23.890] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:23.890] - Field: 'node' [18:41:23.890] - Field: 'label' [18:41:23.890] - Field: 'local' [18:41:23.891] - Field: 'owner' [18:41:23.891] - Field: 'envir' [18:41:23.891] - Field: 'workers' [18:41:23.891] - Field: 'packages' [18:41:23.891] - Field: 'gc' [18:41:23.891] - Field: 'conditions' [18:41:23.892] - Field: 'persistent' [18:41:23.892] - Field: 'expr' [18:41:23.892] - Field: 'uuid' [18:41:23.892] - Field: 'seed' [18:41:23.892] - Field: 'version' [18:41:23.892] - Field: 'result' [18:41:23.893] - Field: 'asynchronous' [18:41:23.893] - Field: 'calls' [18:41:23.893] - Field: 'globals' [18:41:23.893] - Field: 'stdout' [18:41:23.893] - Field: 'earlySignal' [18:41:23.893] - Field: 'lazy' [18:41:23.894] - Field: 'state' [18:41:23.894] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:23.894] - Launch lazy future ... [18:41:23.894] Packages needed by the future expression (n = 1): 'listenv' [18:41:23.895] Packages needed by future strategies (n = 0): [18:41:23.895] { [18:41:23.895] { [18:41:23.895] { [18:41:23.895] ...future.startTime <- base::Sys.time() [18:41:23.895] { [18:41:23.895] { [18:41:23.895] { [18:41:23.895] { [18:41:23.895] { [18:41:23.895] base::local({ [18:41:23.895] has_future <- base::requireNamespace("future", [18:41:23.895] quietly = TRUE) [18:41:23.895] if (has_future) { [18:41:23.895] ns <- base::getNamespace("future") [18:41:23.895] version <- ns[[".package"]][["version"]] [18:41:23.895] if (is.null(version)) [18:41:23.895] version <- utils::packageVersion("future") [18:41:23.895] } [18:41:23.895] else { [18:41:23.895] version <- NULL [18:41:23.895] } [18:41:23.895] if (!has_future || version < "1.8.0") { [18:41:23.895] info <- base::c(r_version = base::gsub("R version ", [18:41:23.895] "", base::R.version$version.string), [18:41:23.895] platform = base::sprintf("%s (%s-bit)", [18:41:23.895] base::R.version$platform, 8 * [18:41:23.895] base::.Machine$sizeof.pointer), [18:41:23.895] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:23.895] "release", "version")], collapse = " "), [18:41:23.895] hostname = base::Sys.info()[["nodename"]]) [18:41:23.895] info <- base::sprintf("%s: %s", base::names(info), [18:41:23.895] info) [18:41:23.895] info <- base::paste(info, collapse = "; ") [18:41:23.895] if (!has_future) { [18:41:23.895] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:23.895] info) [18:41:23.895] } [18:41:23.895] else { [18:41:23.895] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:23.895] info, version) [18:41:23.895] } [18:41:23.895] base::stop(msg) [18:41:23.895] } [18:41:23.895] }) [18:41:23.895] } [18:41:23.895] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:23.895] base::options(mc.cores = 1L) [18:41:23.895] } [18:41:23.895] base::local({ [18:41:23.895] for (pkg in "listenv") { [18:41:23.895] base::loadNamespace(pkg) [18:41:23.895] base::library(pkg, character.only = TRUE) [18:41:23.895] } [18:41:23.895] }) [18:41:23.895] } [18:41:23.895] ...future.strategy.old <- future::plan("list") [18:41:23.895] options(future.plan = NULL) [18:41:23.895] Sys.unsetenv("R_FUTURE_PLAN") [18:41:23.895] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:23.895] } [18:41:23.895] ...future.workdir <- getwd() [18:41:23.895] } [18:41:23.895] ...future.oldOptions <- base::as.list(base::.Options) [18:41:23.895] ...future.oldEnvVars <- base::Sys.getenv() [18:41:23.895] } [18:41:23.895] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:23.895] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:23.895] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:23.895] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:23.895] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:23.895] future.stdout.windows.reencode = NULL, width = 80L) [18:41:23.895] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:23.895] base::names(...future.oldOptions)) [18:41:23.895] } [18:41:23.895] if (FALSE) { [18:41:23.895] } [18:41:23.895] else { [18:41:23.895] if (TRUE) { [18:41:23.895] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:23.895] open = "w") [18:41:23.895] } [18:41:23.895] else { [18:41:23.895] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:23.895] windows = "NUL", "/dev/null"), open = "w") [18:41:23.895] } [18:41:23.895] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:23.895] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:23.895] base::sink(type = "output", split = FALSE) [18:41:23.895] base::close(...future.stdout) [18:41:23.895] }, add = TRUE) [18:41:23.895] } [18:41:23.895] ...future.frame <- base::sys.nframe() [18:41:23.895] ...future.conditions <- base::list() [18:41:23.895] ...future.rng <- base::globalenv()$.Random.seed [18:41:23.895] if (FALSE) { [18:41:23.895] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:23.895] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:23.895] } [18:41:23.895] ...future.result <- base::tryCatch({ [18:41:23.895] base::withCallingHandlers({ [18:41:23.895] ...future.value <- base::withVisible(base::local({ [18:41:23.895] ...future.makeSendCondition <- base::local({ [18:41:23.895] sendCondition <- NULL [18:41:23.895] function(frame = 1L) { [18:41:23.895] if (is.function(sendCondition)) [18:41:23.895] return(sendCondition) [18:41:23.895] ns <- getNamespace("parallel") [18:41:23.895] if (exists("sendData", mode = "function", [18:41:23.895] envir = ns)) { [18:41:23.895] parallel_sendData <- get("sendData", mode = "function", [18:41:23.895] envir = ns) [18:41:23.895] envir <- sys.frame(frame) [18:41:23.895] master <- NULL [18:41:23.895] while (!identical(envir, .GlobalEnv) && [18:41:23.895] !identical(envir, emptyenv())) { [18:41:23.895] if (exists("master", mode = "list", envir = envir, [18:41:23.895] inherits = FALSE)) { [18:41:23.895] master <- get("master", mode = "list", [18:41:23.895] envir = envir, inherits = FALSE) [18:41:23.895] if (inherits(master, c("SOCKnode", [18:41:23.895] "SOCK0node"))) { [18:41:23.895] sendCondition <<- function(cond) { [18:41:23.895] data <- list(type = "VALUE", value = cond, [18:41:23.895] success = TRUE) [18:41:23.895] parallel_sendData(master, data) [18:41:23.895] } [18:41:23.895] return(sendCondition) [18:41:23.895] } [18:41:23.895] } [18:41:23.895] frame <- frame + 1L [18:41:23.895] envir <- sys.frame(frame) [18:41:23.895] } [18:41:23.895] } [18:41:23.895] sendCondition <<- function(cond) NULL [18:41:23.895] } [18:41:23.895] }) [18:41:23.895] withCallingHandlers({ [18:41:23.895] { [18:41:23.895] do.call(function(...) { [18:41:23.895] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:23.895] if (!identical(...future.globals.maxSize.org, [18:41:23.895] ...future.globals.maxSize)) { [18:41:23.895] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:23.895] on.exit(options(oopts), add = TRUE) [18:41:23.895] } [18:41:23.895] { [18:41:23.895] lapply(seq_along(...future.elements_ii), [18:41:23.895] FUN = function(jj) { [18:41:23.895] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:23.895] ...future.FUN(...future.X_jj, ...) [18:41:23.895] }) [18:41:23.895] } [18:41:23.895] }, args = future.call.arguments) [18:41:23.895] } [18:41:23.895] }, immediateCondition = function(cond) { [18:41:23.895] sendCondition <- ...future.makeSendCondition() [18:41:23.895] sendCondition(cond) [18:41:23.895] muffleCondition <- function (cond, pattern = "^muffle") [18:41:23.895] { [18:41:23.895] inherits <- base::inherits [18:41:23.895] invokeRestart <- base::invokeRestart [18:41:23.895] is.null <- base::is.null [18:41:23.895] muffled <- FALSE [18:41:23.895] if (inherits(cond, "message")) { [18:41:23.895] muffled <- grepl(pattern, "muffleMessage") [18:41:23.895] if (muffled) [18:41:23.895] invokeRestart("muffleMessage") [18:41:23.895] } [18:41:23.895] else if (inherits(cond, "warning")) { [18:41:23.895] muffled <- grepl(pattern, "muffleWarning") [18:41:23.895] if (muffled) [18:41:23.895] invokeRestart("muffleWarning") [18:41:23.895] } [18:41:23.895] else if (inherits(cond, "condition")) { [18:41:23.895] if (!is.null(pattern)) { [18:41:23.895] computeRestarts <- base::computeRestarts [18:41:23.895] grepl <- base::grepl [18:41:23.895] restarts <- computeRestarts(cond) [18:41:23.895] for (restart in restarts) { [18:41:23.895] name <- restart$name [18:41:23.895] if (is.null(name)) [18:41:23.895] next [18:41:23.895] if (!grepl(pattern, name)) [18:41:23.895] next [18:41:23.895] invokeRestart(restart) [18:41:23.895] muffled <- TRUE [18:41:23.895] break [18:41:23.895] } [18:41:23.895] } [18:41:23.895] } [18:41:23.895] invisible(muffled) [18:41:23.895] } [18:41:23.895] muffleCondition(cond) [18:41:23.895] }) [18:41:23.895] })) [18:41:23.895] future::FutureResult(value = ...future.value$value, [18:41:23.895] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:23.895] ...future.rng), globalenv = if (FALSE) [18:41:23.895] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:23.895] ...future.globalenv.names)) [18:41:23.895] else NULL, started = ...future.startTime, version = "1.8") [18:41:23.895] }, condition = base::local({ [18:41:23.895] c <- base::c [18:41:23.895] inherits <- base::inherits [18:41:23.895] invokeRestart <- base::invokeRestart [18:41:23.895] length <- base::length [18:41:23.895] list <- base::list [18:41:23.895] seq.int <- base::seq.int [18:41:23.895] signalCondition <- base::signalCondition [18:41:23.895] sys.calls <- base::sys.calls [18:41:23.895] `[[` <- base::`[[` [18:41:23.895] `+` <- base::`+` [18:41:23.895] `<<-` <- base::`<<-` [18:41:23.895] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:23.895] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:23.895] 3L)] [18:41:23.895] } [18:41:23.895] function(cond) { [18:41:23.895] is_error <- inherits(cond, "error") [18:41:23.895] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:23.895] NULL) [18:41:23.895] if (is_error) { [18:41:23.895] sessionInformation <- function() { [18:41:23.895] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:23.895] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:23.895] search = base::search(), system = base::Sys.info()) [18:41:23.895] } [18:41:23.895] ...future.conditions[[length(...future.conditions) + [18:41:23.895] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:23.895] cond$call), session = sessionInformation(), [18:41:23.895] timestamp = base::Sys.time(), signaled = 0L) [18:41:23.895] signalCondition(cond) [18:41:23.895] } [18:41:23.895] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:23.895] "immediateCondition"))) { [18:41:23.895] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:23.895] ...future.conditions[[length(...future.conditions) + [18:41:23.895] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:23.895] if (TRUE && !signal) { [18:41:23.895] muffleCondition <- function (cond, pattern = "^muffle") [18:41:23.895] { [18:41:23.895] inherits <- base::inherits [18:41:23.895] invokeRestart <- base::invokeRestart [18:41:23.895] is.null <- base::is.null [18:41:23.895] muffled <- FALSE [18:41:23.895] if (inherits(cond, "message")) { [18:41:23.895] muffled <- grepl(pattern, "muffleMessage") [18:41:23.895] if (muffled) [18:41:23.895] invokeRestart("muffleMessage") [18:41:23.895] } [18:41:23.895] else if (inherits(cond, "warning")) { [18:41:23.895] muffled <- grepl(pattern, "muffleWarning") [18:41:23.895] if (muffled) [18:41:23.895] invokeRestart("muffleWarning") [18:41:23.895] } [18:41:23.895] else if (inherits(cond, "condition")) { [18:41:23.895] if (!is.null(pattern)) { [18:41:23.895] computeRestarts <- base::computeRestarts [18:41:23.895] grepl <- base::grepl [18:41:23.895] restarts <- computeRestarts(cond) [18:41:23.895] for (restart in restarts) { [18:41:23.895] name <- restart$name [18:41:23.895] if (is.null(name)) [18:41:23.895] next [18:41:23.895] if (!grepl(pattern, name)) [18:41:23.895] next [18:41:23.895] invokeRestart(restart) [18:41:23.895] muffled <- TRUE [18:41:23.895] break [18:41:23.895] } [18:41:23.895] } [18:41:23.895] } [18:41:23.895] invisible(muffled) [18:41:23.895] } [18:41:23.895] muffleCondition(cond, pattern = "^muffle") [18:41:23.895] } [18:41:23.895] } [18:41:23.895] else { [18:41:23.895] if (TRUE) { [18:41:23.895] muffleCondition <- function (cond, pattern = "^muffle") [18:41:23.895] { [18:41:23.895] inherits <- base::inherits [18:41:23.895] invokeRestart <- base::invokeRestart [18:41:23.895] is.null <- base::is.null [18:41:23.895] muffled <- FALSE [18:41:23.895] if (inherits(cond, "message")) { [18:41:23.895] muffled <- grepl(pattern, "muffleMessage") [18:41:23.895] if (muffled) [18:41:23.895] invokeRestart("muffleMessage") [18:41:23.895] } [18:41:23.895] else if (inherits(cond, "warning")) { [18:41:23.895] muffled <- grepl(pattern, "muffleWarning") [18:41:23.895] if (muffled) [18:41:23.895] invokeRestart("muffleWarning") [18:41:23.895] } [18:41:23.895] else if (inherits(cond, "condition")) { [18:41:23.895] if (!is.null(pattern)) { [18:41:23.895] computeRestarts <- base::computeRestarts [18:41:23.895] grepl <- base::grepl [18:41:23.895] restarts <- computeRestarts(cond) [18:41:23.895] for (restart in restarts) { [18:41:23.895] name <- restart$name [18:41:23.895] if (is.null(name)) [18:41:23.895] next [18:41:23.895] if (!grepl(pattern, name)) [18:41:23.895] next [18:41:23.895] invokeRestart(restart) [18:41:23.895] muffled <- TRUE [18:41:23.895] break [18:41:23.895] } [18:41:23.895] } [18:41:23.895] } [18:41:23.895] invisible(muffled) [18:41:23.895] } [18:41:23.895] muffleCondition(cond, pattern = "^muffle") [18:41:23.895] } [18:41:23.895] } [18:41:23.895] } [18:41:23.895] })) [18:41:23.895] }, error = function(ex) { [18:41:23.895] base::structure(base::list(value = NULL, visible = NULL, [18:41:23.895] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:23.895] ...future.rng), started = ...future.startTime, [18:41:23.895] finished = Sys.time(), session_uuid = NA_character_, [18:41:23.895] version = "1.8"), class = "FutureResult") [18:41:23.895] }, finally = { [18:41:23.895] if (!identical(...future.workdir, getwd())) [18:41:23.895] setwd(...future.workdir) [18:41:23.895] { [18:41:23.895] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:23.895] ...future.oldOptions$nwarnings <- NULL [18:41:23.895] } [18:41:23.895] base::options(...future.oldOptions) [18:41:23.895] if (.Platform$OS.type == "windows") { [18:41:23.895] old_names <- names(...future.oldEnvVars) [18:41:23.895] envs <- base::Sys.getenv() [18:41:23.895] names <- names(envs) [18:41:23.895] common <- intersect(names, old_names) [18:41:23.895] added <- setdiff(names, old_names) [18:41:23.895] removed <- setdiff(old_names, names) [18:41:23.895] changed <- common[...future.oldEnvVars[common] != [18:41:23.895] envs[common]] [18:41:23.895] NAMES <- toupper(changed) [18:41:23.895] args <- list() [18:41:23.895] for (kk in seq_along(NAMES)) { [18:41:23.895] name <- changed[[kk]] [18:41:23.895] NAME <- NAMES[[kk]] [18:41:23.895] if (name != NAME && is.element(NAME, old_names)) [18:41:23.895] next [18:41:23.895] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:23.895] } [18:41:23.895] NAMES <- toupper(added) [18:41:23.895] for (kk in seq_along(NAMES)) { [18:41:23.895] name <- added[[kk]] [18:41:23.895] NAME <- NAMES[[kk]] [18:41:23.895] if (name != NAME && is.element(NAME, old_names)) [18:41:23.895] next [18:41:23.895] args[[name]] <- "" [18:41:23.895] } [18:41:23.895] NAMES <- toupper(removed) [18:41:23.895] for (kk in seq_along(NAMES)) { [18:41:23.895] name <- removed[[kk]] [18:41:23.895] NAME <- NAMES[[kk]] [18:41:23.895] if (name != NAME && is.element(NAME, old_names)) [18:41:23.895] next [18:41:23.895] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:23.895] } [18:41:23.895] if (length(args) > 0) [18:41:23.895] base::do.call(base::Sys.setenv, args = args) [18:41:23.895] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:23.895] } [18:41:23.895] else { [18:41:23.895] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:23.895] } [18:41:23.895] { [18:41:23.895] if (base::length(...future.futureOptionsAdded) > [18:41:23.895] 0L) { [18:41:23.895] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:23.895] base::names(opts) <- ...future.futureOptionsAdded [18:41:23.895] base::options(opts) [18:41:23.895] } [18:41:23.895] { [18:41:23.895] { [18:41:23.895] base::options(mc.cores = ...future.mc.cores.old) [18:41:23.895] NULL [18:41:23.895] } [18:41:23.895] options(future.plan = NULL) [18:41:23.895] if (is.na(NA_character_)) [18:41:23.895] Sys.unsetenv("R_FUTURE_PLAN") [18:41:23.895] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:23.895] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:23.895] .init = FALSE) [18:41:23.895] } [18:41:23.895] } [18:41:23.895] } [18:41:23.895] }) [18:41:23.895] if (TRUE) { [18:41:23.895] base::sink(type = "output", split = FALSE) [18:41:23.895] if (TRUE) { [18:41:23.895] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:23.895] } [18:41:23.895] else { [18:41:23.895] ...future.result["stdout"] <- base::list(NULL) [18:41:23.895] } [18:41:23.895] base::close(...future.stdout) [18:41:23.895] ...future.stdout <- NULL [18:41:23.895] } [18:41:23.895] ...future.result$conditions <- ...future.conditions [18:41:23.895] ...future.result$finished <- base::Sys.time() [18:41:23.895] ...future.result [18:41:23.895] } [18:41:23.900] Exporting 5 global objects (2.02 KiB) to cluster node #1 ... [18:41:23.901] Exporting '...future.FUN' (911 bytes) to cluster node #1 ... [18:41:23.901] Exporting '...future.FUN' (911 bytes) to cluster node #1 ... DONE [18:41:23.901] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:23.902] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:23.902] Exporting '...future.elements_ii' (569 bytes) to cluster node #1 ... [18:41:23.902] Exporting '...future.elements_ii' (569 bytes) to cluster node #1 ... DONE [18:41:23.902] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:23.903] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:23.903] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:23.903] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:23.903] Exporting 5 global objects (2.02 KiB) to cluster node #1 ... DONE [18:41:23.904] MultisessionFuture started [18:41:23.904] - Launch lazy future ... done [18:41:23.904] run() for 'MultisessionFuture' ... done [18:41:23.905] Created future: [18:41:23.925] receiveMessageFromWorker() for ClusterFuture ... [18:41:23.925] - Validating connection of MultisessionFuture [18:41:23.925] - received message: FutureResult [18:41:23.926] - Received FutureResult [18:41:23.926] - Erased future from FutureRegistry [18:41:23.926] result() for ClusterFuture ... [18:41:23.926] - result already collected: FutureResult [18:41:23.926] result() for ClusterFuture ... done [18:41:23.926] receiveMessageFromWorker() for ClusterFuture ... done [18:41:23.905] MultisessionFuture: [18:41:23.905] Label: 'future_lapply-1' [18:41:23.905] Expression: [18:41:23.905] { [18:41:23.905] do.call(function(...) { [18:41:23.905] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:23.905] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:23.905] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:23.905] on.exit(options(oopts), add = TRUE) [18:41:23.905] } [18:41:23.905] { [18:41:23.905] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:23.905] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:23.905] ...future.FUN(...future.X_jj, ...) [18:41:23.905] }) [18:41:23.905] } [18:41:23.905] }, args = future.call.arguments) [18:41:23.905] } [18:41:23.905] Lazy evaluation: FALSE [18:41:23.905] Asynchronous evaluation: TRUE [18:41:23.905] Local evaluation: TRUE [18:41:23.905] Environment: R_GlobalEnv [18:41:23.905] Capture standard output: TRUE [18:41:23.905] Capture condition classes: 'condition' (excluding 'nothing') [18:41:23.905] Globals: 5 objects totaling 1.59 KiB (function '...future.FUN' of 911 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 569 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:23.905] Packages: 1 packages ('listenv') [18:41:23.905] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:23.905] Resolved: TRUE [18:41:23.905] Value: [18:41:23.905] Conditions captured: [18:41:23.905] Early signaling: FALSE [18:41:23.905] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:23.905] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:23.927] Chunk #1 of 2 ... DONE [18:41:23.927] Chunk #2 of 2 ... [18:41:23.927] - Finding globals in 'X' for chunk #2 ... [18:41:23.927] getGlobalsAndPackages() ... [18:41:23.927] Searching for globals... [18:41:23.928] [18:41:23.928] Searching for globals ... DONE [18:41:23.928] - globals: [0] [18:41:23.928] getGlobalsAndPackages() ... DONE [18:41:23.929] + additional globals found: [n=0] [18:41:23.929] + additional namespaces needed: [n=0] [18:41:23.929] - Finding globals in 'X' for chunk #2 ... DONE [18:41:23.929] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:23.929] - seeds: [18:41:23.929] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:23.930] getGlobalsAndPackages() ... [18:41:23.930] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:23.930] Resolving globals: FALSE [18:41:23.930] Tweak future expression to call with '...' arguments ... [18:41:23.930] { [18:41:23.930] do.call(function(...) { [18:41:23.930] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:23.930] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:23.930] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:23.930] on.exit(options(oopts), add = TRUE) [18:41:23.930] } [18:41:23.930] { [18:41:23.930] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:23.930] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:23.930] ...future.FUN(...future.X_jj, ...) [18:41:23.930] }) [18:41:23.930] } [18:41:23.930] }, args = future.call.arguments) [18:41:23.930] } [18:41:23.931] Tweak future expression to call with '...' arguments ... DONE [18:41:23.931] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:23.931] - packages: [1] 'listenv' [18:41:23.932] getGlobalsAndPackages() ... DONE [18:41:23.932] run() for 'Future' ... [18:41:23.932] - state: 'created' [18:41:23.932] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:23.948] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:23.949] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:23.949] - Field: 'node' [18:41:23.949] - Field: 'label' [18:41:23.949] - Field: 'local' [18:41:23.949] - Field: 'owner' [18:41:23.950] - Field: 'envir' [18:41:23.950] - Field: 'workers' [18:41:23.950] - Field: 'packages' [18:41:23.950] - Field: 'gc' [18:41:23.950] - Field: 'conditions' [18:41:23.951] - Field: 'persistent' [18:41:23.951] - Field: 'expr' [18:41:23.951] - Field: 'uuid' [18:41:23.951] - Field: 'seed' [18:41:23.951] - Field: 'version' [18:41:23.951] - Field: 'result' [18:41:23.952] - Field: 'asynchronous' [18:41:23.952] - Field: 'calls' [18:41:23.952] - Field: 'globals' [18:41:23.952] - Field: 'stdout' [18:41:23.952] - Field: 'earlySignal' [18:41:23.952] - Field: 'lazy' [18:41:23.953] - Field: 'state' [18:41:23.953] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:23.953] - Launch lazy future ... [18:41:23.953] Packages needed by the future expression (n = 1): 'listenv' [18:41:23.953] Packages needed by future strategies (n = 0): [18:41:23.954] { [18:41:23.954] { [18:41:23.954] { [18:41:23.954] ...future.startTime <- base::Sys.time() [18:41:23.954] { [18:41:23.954] { [18:41:23.954] { [18:41:23.954] { [18:41:23.954] { [18:41:23.954] base::local({ [18:41:23.954] has_future <- base::requireNamespace("future", [18:41:23.954] quietly = TRUE) [18:41:23.954] if (has_future) { [18:41:23.954] ns <- base::getNamespace("future") [18:41:23.954] version <- ns[[".package"]][["version"]] [18:41:23.954] if (is.null(version)) [18:41:23.954] version <- utils::packageVersion("future") [18:41:23.954] } [18:41:23.954] else { [18:41:23.954] version <- NULL [18:41:23.954] } [18:41:23.954] if (!has_future || version < "1.8.0") { [18:41:23.954] info <- base::c(r_version = base::gsub("R version ", [18:41:23.954] "", base::R.version$version.string), [18:41:23.954] platform = base::sprintf("%s (%s-bit)", [18:41:23.954] base::R.version$platform, 8 * [18:41:23.954] base::.Machine$sizeof.pointer), [18:41:23.954] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:23.954] "release", "version")], collapse = " "), [18:41:23.954] hostname = base::Sys.info()[["nodename"]]) [18:41:23.954] info <- base::sprintf("%s: %s", base::names(info), [18:41:23.954] info) [18:41:23.954] info <- base::paste(info, collapse = "; ") [18:41:23.954] if (!has_future) { [18:41:23.954] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:23.954] info) [18:41:23.954] } [18:41:23.954] else { [18:41:23.954] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:23.954] info, version) [18:41:23.954] } [18:41:23.954] base::stop(msg) [18:41:23.954] } [18:41:23.954] }) [18:41:23.954] } [18:41:23.954] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:23.954] base::options(mc.cores = 1L) [18:41:23.954] } [18:41:23.954] base::local({ [18:41:23.954] for (pkg in "listenv") { [18:41:23.954] base::loadNamespace(pkg) [18:41:23.954] base::library(pkg, character.only = TRUE) [18:41:23.954] } [18:41:23.954] }) [18:41:23.954] } [18:41:23.954] ...future.strategy.old <- future::plan("list") [18:41:23.954] options(future.plan = NULL) [18:41:23.954] Sys.unsetenv("R_FUTURE_PLAN") [18:41:23.954] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:23.954] } [18:41:23.954] ...future.workdir <- getwd() [18:41:23.954] } [18:41:23.954] ...future.oldOptions <- base::as.list(base::.Options) [18:41:23.954] ...future.oldEnvVars <- base::Sys.getenv() [18:41:23.954] } [18:41:23.954] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:23.954] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:23.954] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:23.954] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:23.954] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:23.954] future.stdout.windows.reencode = NULL, width = 80L) [18:41:23.954] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:23.954] base::names(...future.oldOptions)) [18:41:23.954] } [18:41:23.954] if (FALSE) { [18:41:23.954] } [18:41:23.954] else { [18:41:23.954] if (TRUE) { [18:41:23.954] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:23.954] open = "w") [18:41:23.954] } [18:41:23.954] else { [18:41:23.954] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:23.954] windows = "NUL", "/dev/null"), open = "w") [18:41:23.954] } [18:41:23.954] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:23.954] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:23.954] base::sink(type = "output", split = FALSE) [18:41:23.954] base::close(...future.stdout) [18:41:23.954] }, add = TRUE) [18:41:23.954] } [18:41:23.954] ...future.frame <- base::sys.nframe() [18:41:23.954] ...future.conditions <- base::list() [18:41:23.954] ...future.rng <- base::globalenv()$.Random.seed [18:41:23.954] if (FALSE) { [18:41:23.954] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:23.954] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:23.954] } [18:41:23.954] ...future.result <- base::tryCatch({ [18:41:23.954] base::withCallingHandlers({ [18:41:23.954] ...future.value <- base::withVisible(base::local({ [18:41:23.954] ...future.makeSendCondition <- base::local({ [18:41:23.954] sendCondition <- NULL [18:41:23.954] function(frame = 1L) { [18:41:23.954] if (is.function(sendCondition)) [18:41:23.954] return(sendCondition) [18:41:23.954] ns <- getNamespace("parallel") [18:41:23.954] if (exists("sendData", mode = "function", [18:41:23.954] envir = ns)) { [18:41:23.954] parallel_sendData <- get("sendData", mode = "function", [18:41:23.954] envir = ns) [18:41:23.954] envir <- sys.frame(frame) [18:41:23.954] master <- NULL [18:41:23.954] while (!identical(envir, .GlobalEnv) && [18:41:23.954] !identical(envir, emptyenv())) { [18:41:23.954] if (exists("master", mode = "list", envir = envir, [18:41:23.954] inherits = FALSE)) { [18:41:23.954] master <- get("master", mode = "list", [18:41:23.954] envir = envir, inherits = FALSE) [18:41:23.954] if (inherits(master, c("SOCKnode", [18:41:23.954] "SOCK0node"))) { [18:41:23.954] sendCondition <<- function(cond) { [18:41:23.954] data <- list(type = "VALUE", value = cond, [18:41:23.954] success = TRUE) [18:41:23.954] parallel_sendData(master, data) [18:41:23.954] } [18:41:23.954] return(sendCondition) [18:41:23.954] } [18:41:23.954] } [18:41:23.954] frame <- frame + 1L [18:41:23.954] envir <- sys.frame(frame) [18:41:23.954] } [18:41:23.954] } [18:41:23.954] sendCondition <<- function(cond) NULL [18:41:23.954] } [18:41:23.954] }) [18:41:23.954] withCallingHandlers({ [18:41:23.954] { [18:41:23.954] do.call(function(...) { [18:41:23.954] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:23.954] if (!identical(...future.globals.maxSize.org, [18:41:23.954] ...future.globals.maxSize)) { [18:41:23.954] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:23.954] on.exit(options(oopts), add = TRUE) [18:41:23.954] } [18:41:23.954] { [18:41:23.954] lapply(seq_along(...future.elements_ii), [18:41:23.954] FUN = function(jj) { [18:41:23.954] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:23.954] ...future.FUN(...future.X_jj, ...) [18:41:23.954] }) [18:41:23.954] } [18:41:23.954] }, args = future.call.arguments) [18:41:23.954] } [18:41:23.954] }, immediateCondition = function(cond) { [18:41:23.954] sendCondition <- ...future.makeSendCondition() [18:41:23.954] sendCondition(cond) [18:41:23.954] muffleCondition <- function (cond, pattern = "^muffle") [18:41:23.954] { [18:41:23.954] inherits <- base::inherits [18:41:23.954] invokeRestart <- base::invokeRestart [18:41:23.954] is.null <- base::is.null [18:41:23.954] muffled <- FALSE [18:41:23.954] if (inherits(cond, "message")) { [18:41:23.954] muffled <- grepl(pattern, "muffleMessage") [18:41:23.954] if (muffled) [18:41:23.954] invokeRestart("muffleMessage") [18:41:23.954] } [18:41:23.954] else if (inherits(cond, "warning")) { [18:41:23.954] muffled <- grepl(pattern, "muffleWarning") [18:41:23.954] if (muffled) [18:41:23.954] invokeRestart("muffleWarning") [18:41:23.954] } [18:41:23.954] else if (inherits(cond, "condition")) { [18:41:23.954] if (!is.null(pattern)) { [18:41:23.954] computeRestarts <- base::computeRestarts [18:41:23.954] grepl <- base::grepl [18:41:23.954] restarts <- computeRestarts(cond) [18:41:23.954] for (restart in restarts) { [18:41:23.954] name <- restart$name [18:41:23.954] if (is.null(name)) [18:41:23.954] next [18:41:23.954] if (!grepl(pattern, name)) [18:41:23.954] next [18:41:23.954] invokeRestart(restart) [18:41:23.954] muffled <- TRUE [18:41:23.954] break [18:41:23.954] } [18:41:23.954] } [18:41:23.954] } [18:41:23.954] invisible(muffled) [18:41:23.954] } [18:41:23.954] muffleCondition(cond) [18:41:23.954] }) [18:41:23.954] })) [18:41:23.954] future::FutureResult(value = ...future.value$value, [18:41:23.954] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:23.954] ...future.rng), globalenv = if (FALSE) [18:41:23.954] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:23.954] ...future.globalenv.names)) [18:41:23.954] else NULL, started = ...future.startTime, version = "1.8") [18:41:23.954] }, condition = base::local({ [18:41:23.954] c <- base::c [18:41:23.954] inherits <- base::inherits [18:41:23.954] invokeRestart <- base::invokeRestart [18:41:23.954] length <- base::length [18:41:23.954] list <- base::list [18:41:23.954] seq.int <- base::seq.int [18:41:23.954] signalCondition <- base::signalCondition [18:41:23.954] sys.calls <- base::sys.calls [18:41:23.954] `[[` <- base::`[[` [18:41:23.954] `+` <- base::`+` [18:41:23.954] `<<-` <- base::`<<-` [18:41:23.954] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:23.954] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:23.954] 3L)] [18:41:23.954] } [18:41:23.954] function(cond) { [18:41:23.954] is_error <- inherits(cond, "error") [18:41:23.954] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:23.954] NULL) [18:41:23.954] if (is_error) { [18:41:23.954] sessionInformation <- function() { [18:41:23.954] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:23.954] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:23.954] search = base::search(), system = base::Sys.info()) [18:41:23.954] } [18:41:23.954] ...future.conditions[[length(...future.conditions) + [18:41:23.954] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:23.954] cond$call), session = sessionInformation(), [18:41:23.954] timestamp = base::Sys.time(), signaled = 0L) [18:41:23.954] signalCondition(cond) [18:41:23.954] } [18:41:23.954] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:23.954] "immediateCondition"))) { [18:41:23.954] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:23.954] ...future.conditions[[length(...future.conditions) + [18:41:23.954] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:23.954] if (TRUE && !signal) { [18:41:23.954] muffleCondition <- function (cond, pattern = "^muffle") [18:41:23.954] { [18:41:23.954] inherits <- base::inherits [18:41:23.954] invokeRestart <- base::invokeRestart [18:41:23.954] is.null <- base::is.null [18:41:23.954] muffled <- FALSE [18:41:23.954] if (inherits(cond, "message")) { [18:41:23.954] muffled <- grepl(pattern, "muffleMessage") [18:41:23.954] if (muffled) [18:41:23.954] invokeRestart("muffleMessage") [18:41:23.954] } [18:41:23.954] else if (inherits(cond, "warning")) { [18:41:23.954] muffled <- grepl(pattern, "muffleWarning") [18:41:23.954] if (muffled) [18:41:23.954] invokeRestart("muffleWarning") [18:41:23.954] } [18:41:23.954] else if (inherits(cond, "condition")) { [18:41:23.954] if (!is.null(pattern)) { [18:41:23.954] computeRestarts <- base::computeRestarts [18:41:23.954] grepl <- base::grepl [18:41:23.954] restarts <- computeRestarts(cond) [18:41:23.954] for (restart in restarts) { [18:41:23.954] name <- restart$name [18:41:23.954] if (is.null(name)) [18:41:23.954] next [18:41:23.954] if (!grepl(pattern, name)) [18:41:23.954] next [18:41:23.954] invokeRestart(restart) [18:41:23.954] muffled <- TRUE [18:41:23.954] break [18:41:23.954] } [18:41:23.954] } [18:41:23.954] } [18:41:23.954] invisible(muffled) [18:41:23.954] } [18:41:23.954] muffleCondition(cond, pattern = "^muffle") [18:41:23.954] } [18:41:23.954] } [18:41:23.954] else { [18:41:23.954] if (TRUE) { [18:41:23.954] muffleCondition <- function (cond, pattern = "^muffle") [18:41:23.954] { [18:41:23.954] inherits <- base::inherits [18:41:23.954] invokeRestart <- base::invokeRestart [18:41:23.954] is.null <- base::is.null [18:41:23.954] muffled <- FALSE [18:41:23.954] if (inherits(cond, "message")) { [18:41:23.954] muffled <- grepl(pattern, "muffleMessage") [18:41:23.954] if (muffled) [18:41:23.954] invokeRestart("muffleMessage") [18:41:23.954] } [18:41:23.954] else if (inherits(cond, "warning")) { [18:41:23.954] muffled <- grepl(pattern, "muffleWarning") [18:41:23.954] if (muffled) [18:41:23.954] invokeRestart("muffleWarning") [18:41:23.954] } [18:41:23.954] else if (inherits(cond, "condition")) { [18:41:23.954] if (!is.null(pattern)) { [18:41:23.954] computeRestarts <- base::computeRestarts [18:41:23.954] grepl <- base::grepl [18:41:23.954] restarts <- computeRestarts(cond) [18:41:23.954] for (restart in restarts) { [18:41:23.954] name <- restart$name [18:41:23.954] if (is.null(name)) [18:41:23.954] next [18:41:23.954] if (!grepl(pattern, name)) [18:41:23.954] next [18:41:23.954] invokeRestart(restart) [18:41:23.954] muffled <- TRUE [18:41:23.954] break [18:41:23.954] } [18:41:23.954] } [18:41:23.954] } [18:41:23.954] invisible(muffled) [18:41:23.954] } [18:41:23.954] muffleCondition(cond, pattern = "^muffle") [18:41:23.954] } [18:41:23.954] } [18:41:23.954] } [18:41:23.954] })) [18:41:23.954] }, error = function(ex) { [18:41:23.954] base::structure(base::list(value = NULL, visible = NULL, [18:41:23.954] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:23.954] ...future.rng), started = ...future.startTime, [18:41:23.954] finished = Sys.time(), session_uuid = NA_character_, [18:41:23.954] version = "1.8"), class = "FutureResult") [18:41:23.954] }, finally = { [18:41:23.954] if (!identical(...future.workdir, getwd())) [18:41:23.954] setwd(...future.workdir) [18:41:23.954] { [18:41:23.954] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:23.954] ...future.oldOptions$nwarnings <- NULL [18:41:23.954] } [18:41:23.954] base::options(...future.oldOptions) [18:41:23.954] if (.Platform$OS.type == "windows") { [18:41:23.954] old_names <- names(...future.oldEnvVars) [18:41:23.954] envs <- base::Sys.getenv() [18:41:23.954] names <- names(envs) [18:41:23.954] common <- intersect(names, old_names) [18:41:23.954] added <- setdiff(names, old_names) [18:41:23.954] removed <- setdiff(old_names, names) [18:41:23.954] changed <- common[...future.oldEnvVars[common] != [18:41:23.954] envs[common]] [18:41:23.954] NAMES <- toupper(changed) [18:41:23.954] args <- list() [18:41:23.954] for (kk in seq_along(NAMES)) { [18:41:23.954] name <- changed[[kk]] [18:41:23.954] NAME <- NAMES[[kk]] [18:41:23.954] if (name != NAME && is.element(NAME, old_names)) [18:41:23.954] next [18:41:23.954] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:23.954] } [18:41:23.954] NAMES <- toupper(added) [18:41:23.954] for (kk in seq_along(NAMES)) { [18:41:23.954] name <- added[[kk]] [18:41:23.954] NAME <- NAMES[[kk]] [18:41:23.954] if (name != NAME && is.element(NAME, old_names)) [18:41:23.954] next [18:41:23.954] args[[name]] <- "" [18:41:23.954] } [18:41:23.954] NAMES <- toupper(removed) [18:41:23.954] for (kk in seq_along(NAMES)) { [18:41:23.954] name <- removed[[kk]] [18:41:23.954] NAME <- NAMES[[kk]] [18:41:23.954] if (name != NAME && is.element(NAME, old_names)) [18:41:23.954] next [18:41:23.954] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:23.954] } [18:41:23.954] if (length(args) > 0) [18:41:23.954] base::do.call(base::Sys.setenv, args = args) [18:41:23.954] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:23.954] } [18:41:23.954] else { [18:41:23.954] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:23.954] } [18:41:23.954] { [18:41:23.954] if (base::length(...future.futureOptionsAdded) > [18:41:23.954] 0L) { [18:41:23.954] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:23.954] base::names(opts) <- ...future.futureOptionsAdded [18:41:23.954] base::options(opts) [18:41:23.954] } [18:41:23.954] { [18:41:23.954] { [18:41:23.954] base::options(mc.cores = ...future.mc.cores.old) [18:41:23.954] NULL [18:41:23.954] } [18:41:23.954] options(future.plan = NULL) [18:41:23.954] if (is.na(NA_character_)) [18:41:23.954] Sys.unsetenv("R_FUTURE_PLAN") [18:41:23.954] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:23.954] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:23.954] .init = FALSE) [18:41:23.954] } [18:41:23.954] } [18:41:23.954] } [18:41:23.954] }) [18:41:23.954] if (TRUE) { [18:41:23.954] base::sink(type = "output", split = FALSE) [18:41:23.954] if (TRUE) { [18:41:23.954] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:23.954] } [18:41:23.954] else { [18:41:23.954] ...future.result["stdout"] <- base::list(NULL) [18:41:23.954] } [18:41:23.954] base::close(...future.stdout) [18:41:23.954] ...future.stdout <- NULL [18:41:23.954] } [18:41:23.954] ...future.result$conditions <- ...future.conditions [18:41:23.954] ...future.result$finished <- base::Sys.time() [18:41:23.954] ...future.result [18:41:23.954] } [18:41:23.959] Exporting 5 global objects (4.14 KiB) to cluster node #1 ... [18:41:23.960] Exporting '...future.FUN' (911 bytes) to cluster node #1 ... [18:41:23.960] Exporting '...future.FUN' (911 bytes) to cluster node #1 ... DONE [18:41:23.960] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:23.961] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:23.961] Exporting '...future.elements_ii' (2.67 KiB) to cluster node #1 ... [18:41:23.961] Exporting '...future.elements_ii' (2.67 KiB) to cluster node #1 ... DONE [18:41:23.961] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:23.962] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:23.962] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:23.962] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:23.963] Exporting 5 global objects (4.14 KiB) to cluster node #1 ... DONE [18:41:23.963] MultisessionFuture started [18:41:23.963] - Launch lazy future ... done [18:41:23.963] run() for 'MultisessionFuture' ... done [18:41:23.964] Created future: [18:41:23.979] receiveMessageFromWorker() for ClusterFuture ... [18:41:23.980] - Validating connection of MultisessionFuture [18:41:23.980] - received message: FutureResult [18:41:23.980] - Received FutureResult [18:41:23.980] - Erased future from FutureRegistry [18:41:23.981] result() for ClusterFuture ... [18:41:23.981] - result already collected: FutureResult [18:41:23.981] result() for ClusterFuture ... done [18:41:23.981] receiveMessageFromWorker() for ClusterFuture ... done [18:41:23.964] MultisessionFuture: [18:41:23.964] Label: 'future_lapply-2' [18:41:23.964] Expression: [18:41:23.964] { [18:41:23.964] do.call(function(...) { [18:41:23.964] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:23.964] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:23.964] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:23.964] on.exit(options(oopts), add = TRUE) [18:41:23.964] } [18:41:23.964] { [18:41:23.964] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:23.964] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:23.964] ...future.FUN(...future.X_jj, ...) [18:41:23.964] }) [18:41:23.964] } [18:41:23.964] }, args = future.call.arguments) [18:41:23.964] } [18:41:23.964] Lazy evaluation: FALSE [18:41:23.964] Asynchronous evaluation: TRUE [18:41:23.964] Local evaluation: TRUE [18:41:23.964] Environment: R_GlobalEnv [18:41:23.964] Capture standard output: TRUE [18:41:23.964] Capture condition classes: 'condition' (excluding 'nothing') [18:41:23.964] Globals: 5 objects totaling 3.71 KiB (function '...future.FUN' of 911 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 2.67 KiB, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:23.964] Packages: 1 packages ('listenv') [18:41:23.964] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:23.964] Resolved: TRUE [18:41:23.964] Value: [18:41:23.964] Conditions captured: [18:41:23.964] Early signaling: FALSE [18:41:23.964] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:23.964] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:23.982] Chunk #2 of 2 ... DONE [18:41:23.982] Launching 2 futures (chunks) ... DONE [18:41:23.982] Resolving 2 futures (chunks) ... [18:41:23.982] resolve() on list ... [18:41:23.982] recursive: 0 [18:41:23.982] length: 2 [18:41:23.982] [18:41:23.983] Future #1 [18:41:23.983] result() for ClusterFuture ... [18:41:23.983] - result already collected: FutureResult [18:41:23.983] result() for ClusterFuture ... done [18:41:23.983] result() for ClusterFuture ... [18:41:23.983] - result already collected: FutureResult [18:41:23.984] result() for ClusterFuture ... done [18:41:23.984] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:23.984] - nx: 2 [18:41:23.984] - relay: TRUE [18:41:23.984] - stdout: TRUE [18:41:23.984] - signal: TRUE [18:41:23.985] - resignal: FALSE [18:41:23.985] - force: TRUE [18:41:23.985] - relayed: [n=2] FALSE, FALSE [18:41:23.985] - queued futures: [n=2] FALSE, FALSE [18:41:23.985] - until=1 [18:41:23.985] - relaying element #1 [18:41:23.985] result() for ClusterFuture ... [18:41:23.986] - result already collected: FutureResult [18:41:23.986] result() for ClusterFuture ... done [18:41:23.986] result() for ClusterFuture ... [18:41:23.986] - result already collected: FutureResult [18:41:23.986] result() for ClusterFuture ... done [18:41:23.987] result() for ClusterFuture ... [18:41:23.987] - result already collected: FutureResult [18:41:23.987] result() for ClusterFuture ... done [18:41:23.987] result() for ClusterFuture ... [18:41:23.987] - result already collected: FutureResult [18:41:23.987] result() for ClusterFuture ... done [18:41:23.987] - relayed: [n=2] TRUE, FALSE [18:41:23.988] - queued futures: [n=2] TRUE, FALSE [18:41:23.988] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:23.988] length: 1 (resolved future 1) [18:41:23.988] Future #2 [18:41:23.988] result() for ClusterFuture ... [18:41:23.989] - result already collected: FutureResult [18:41:23.989] result() for ClusterFuture ... done [18:41:23.989] result() for ClusterFuture ... [18:41:23.989] - result already collected: FutureResult [18:41:23.989] result() for ClusterFuture ... done [18:41:23.989] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:23.990] - nx: 2 [18:41:23.990] - relay: TRUE [18:41:23.990] - stdout: TRUE [18:41:23.990] - signal: TRUE [18:41:23.990] - resignal: FALSE [18:41:23.990] - force: TRUE [18:41:23.990] - relayed: [n=2] TRUE, FALSE [18:41:23.991] - queued futures: [n=2] TRUE, FALSE [18:41:23.991] - until=2 [18:41:23.991] - relaying element #2 [18:41:23.991] result() for ClusterFuture ... [18:41:23.991] - result already collected: FutureResult [18:41:23.991] result() for ClusterFuture ... done [18:41:23.992] result() for ClusterFuture ... [18:41:23.992] - result already collected: FutureResult [18:41:23.992] result() for ClusterFuture ... done [18:41:23.992] result() for ClusterFuture ... [18:41:23.992] - result already collected: FutureResult [18:41:23.992] result() for ClusterFuture ... done [18:41:23.993] result() for ClusterFuture ... [18:41:23.993] - result already collected: FutureResult [18:41:23.993] result() for ClusterFuture ... done [18:41:23.993] - relayed: [n=2] TRUE, TRUE [18:41:23.993] - queued futures: [n=2] TRUE, TRUE [18:41:23.993] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:23.993] length: 0 (resolved future 2) [18:41:23.994] Relaying remaining futures [18:41:23.994] signalConditionsASAP(NULL, pos=0) ... [18:41:23.994] - nx: 2 [18:41:23.994] - relay: TRUE [18:41:23.994] - stdout: TRUE [18:41:23.994] - signal: TRUE [18:41:23.994] - resignal: FALSE [18:41:23.995] - force: TRUE [18:41:23.995] - relayed: [n=2] TRUE, TRUE [18:41:23.995] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:23.995] - relayed: [n=2] TRUE, TRUE [18:41:23.995] - queued futures: [n=2] TRUE, TRUE [18:41:23.995] signalConditionsASAP(NULL, pos=0) ... done [18:41:23.996] resolve() on list ... DONE [18:41:23.996] result() for ClusterFuture ... [18:41:23.996] - result already collected: FutureResult [18:41:23.996] result() for ClusterFuture ... done [18:41:23.996] result() for ClusterFuture ... [18:41:23.996] - result already collected: FutureResult [18:41:23.997] result() for ClusterFuture ... done [18:41:23.997] result() for ClusterFuture ... [18:41:23.997] - result already collected: FutureResult [18:41:23.997] result() for ClusterFuture ... done [18:41:23.997] result() for ClusterFuture ... [18:41:23.997] - result already collected: FutureResult [18:41:23.997] result() for ClusterFuture ... done [18:41:23.998] - Number of value chunks collected: 2 [18:41:23.998] Resolving 2 futures (chunks) ... DONE [18:41:23.998] Reducing values from 2 chunks ... [18:41:23.998] - Number of values collected after concatenation: 2 [18:41:23.998] - Number of values expected: 2 [18:41:23.998] Reducing values from 2 chunks ... DONE [18:41:23.999] future_lapply() ... DONE List of 1 $ y:List of 2 ..$ a: Named chr "A" .. ..- attr(*, "names")= chr "A" ..$ b: Named chr [1:2] "A" "B" .. ..- attr(*, "names")= chr [1:2] "A" "B" - future_lapply(x, FUN = vector, ...) ... [18:41:24.001] future_lapply() ... [18:41:24.004] Number of chunks: 2 [18:41:24.004] getGlobalsAndPackagesXApply() ... [18:41:24.004] - future.globals: TRUE [18:41:24.004] getGlobalsAndPackages() ... [18:41:24.004] Searching for globals... [18:41:24.006] - globals found: [2] 'FUN', '.Internal' [18:41:24.006] Searching for globals ... DONE [18:41:24.006] Resolving globals: FALSE [18:41:24.007] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:24.007] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:24.007] - globals: [1] 'FUN' [18:41:24.008] [18:41:24.008] getGlobalsAndPackages() ... DONE [18:41:24.008] - globals found/used: [n=1] 'FUN' [18:41:24.008] - needed namespaces: [n=0] [18:41:24.008] Finding globals ... DONE [18:41:24.008] - use_args: TRUE [18:41:24.008] - Getting '...' globals ... [18:41:24.009] resolve() on list ... [18:41:24.009] recursive: 0 [18:41:24.009] length: 1 [18:41:24.009] elements: '...' [18:41:24.010] length: 0 (resolved future 1) [18:41:24.010] resolve() on list ... DONE [18:41:24.010] - '...' content: [n=1] 'length' [18:41:24.010] List of 1 [18:41:24.010] $ ...:List of 1 [18:41:24.010] ..$ length: int 2 [18:41:24.010] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:24.010] - attr(*, "where")=List of 1 [18:41:24.010] ..$ ...: [18:41:24.010] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:24.010] - attr(*, "resolved")= logi TRUE [18:41:24.010] - attr(*, "total_size")= num NA [18:41:24.013] - Getting '...' globals ... DONE [18:41:24.014] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:24.014] List of 2 [18:41:24.014] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:24.014] $ ... :List of 1 [18:41:24.014] ..$ length: int 2 [18:41:24.014] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:24.014] - attr(*, "where")=List of 2 [18:41:24.014] ..$ ...future.FUN: [18:41:24.014] ..$ ... : [18:41:24.014] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:24.014] - attr(*, "resolved")= logi FALSE [18:41:24.014] - attr(*, "total_size")= int 4288 [18:41:24.018] Packages to be attached in all futures: [n=0] [18:41:24.018] getGlobalsAndPackagesXApply() ... DONE [18:41:24.018] Number of futures (= number of chunks): 2 [18:41:24.018] Launching 2 futures (chunks) ... [18:41:24.019] Chunk #1 of 2 ... [18:41:24.019] - Finding globals in 'X' for chunk #1 ... [18:41:24.019] getGlobalsAndPackages() ... [18:41:24.019] Searching for globals... [18:41:24.019] [18:41:24.020] Searching for globals ... DONE [18:41:24.020] - globals: [0] [18:41:24.020] getGlobalsAndPackages() ... DONE [18:41:24.020] + additional globals found: [n=0] [18:41:24.020] + additional namespaces needed: [n=0] [18:41:24.020] - Finding globals in 'X' for chunk #1 ... DONE [18:41:24.021] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:24.021] - seeds: [18:41:24.021] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:24.021] getGlobalsAndPackages() ... [18:41:24.021] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:24.021] Resolving globals: FALSE [18:41:24.022] Tweak future expression to call with '...' arguments ... [18:41:24.022] { [18:41:24.022] do.call(function(...) { [18:41:24.022] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:24.022] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:24.022] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:24.022] on.exit(options(oopts), add = TRUE) [18:41:24.022] } [18:41:24.022] { [18:41:24.022] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:24.022] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:24.022] ...future.FUN(...future.X_jj, ...) [18:41:24.022] }) [18:41:24.022] } [18:41:24.022] }, args = future.call.arguments) [18:41:24.022] } [18:41:24.022] Tweak future expression to call with '...' arguments ... DONE [18:41:24.023] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:24.023] [18:41:24.023] getGlobalsAndPackages() ... DONE [18:41:24.023] run() for 'Future' ... [18:41:24.024] - state: 'created' [18:41:24.024] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:24.039] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:24.039] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:24.039] - Field: 'node' [18:41:24.039] - Field: 'label' [18:41:24.040] - Field: 'local' [18:41:24.040] - Field: 'owner' [18:41:24.040] - Field: 'envir' [18:41:24.040] - Field: 'workers' [18:41:24.040] - Field: 'packages' [18:41:24.041] - Field: 'gc' [18:41:24.041] - Field: 'conditions' [18:41:24.041] - Field: 'persistent' [18:41:24.041] - Field: 'expr' [18:41:24.041] - Field: 'uuid' [18:41:24.041] - Field: 'seed' [18:41:24.042] - Field: 'version' [18:41:24.042] - Field: 'result' [18:41:24.042] - Field: 'asynchronous' [18:41:24.042] - Field: 'calls' [18:41:24.042] - Field: 'globals' [18:41:24.042] - Field: 'stdout' [18:41:24.043] - Field: 'earlySignal' [18:41:24.043] - Field: 'lazy' [18:41:24.043] - Field: 'state' [18:41:24.043] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:24.043] - Launch lazy future ... [18:41:24.044] Packages needed by the future expression (n = 0): [18:41:24.044] Packages needed by future strategies (n = 0): [18:41:24.044] { [18:41:24.044] { [18:41:24.044] { [18:41:24.044] ...future.startTime <- base::Sys.time() [18:41:24.044] { [18:41:24.044] { [18:41:24.044] { [18:41:24.044] { [18:41:24.044] base::local({ [18:41:24.044] has_future <- base::requireNamespace("future", [18:41:24.044] quietly = TRUE) [18:41:24.044] if (has_future) { [18:41:24.044] ns <- base::getNamespace("future") [18:41:24.044] version <- ns[[".package"]][["version"]] [18:41:24.044] if (is.null(version)) [18:41:24.044] version <- utils::packageVersion("future") [18:41:24.044] } [18:41:24.044] else { [18:41:24.044] version <- NULL [18:41:24.044] } [18:41:24.044] if (!has_future || version < "1.8.0") { [18:41:24.044] info <- base::c(r_version = base::gsub("R version ", [18:41:24.044] "", base::R.version$version.string), [18:41:24.044] platform = base::sprintf("%s (%s-bit)", [18:41:24.044] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:24.044] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:24.044] "release", "version")], collapse = " "), [18:41:24.044] hostname = base::Sys.info()[["nodename"]]) [18:41:24.044] info <- base::sprintf("%s: %s", base::names(info), [18:41:24.044] info) [18:41:24.044] info <- base::paste(info, collapse = "; ") [18:41:24.044] if (!has_future) { [18:41:24.044] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:24.044] info) [18:41:24.044] } [18:41:24.044] else { [18:41:24.044] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:24.044] info, version) [18:41:24.044] } [18:41:24.044] base::stop(msg) [18:41:24.044] } [18:41:24.044] }) [18:41:24.044] } [18:41:24.044] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:24.044] base::options(mc.cores = 1L) [18:41:24.044] } [18:41:24.044] ...future.strategy.old <- future::plan("list") [18:41:24.044] options(future.plan = NULL) [18:41:24.044] Sys.unsetenv("R_FUTURE_PLAN") [18:41:24.044] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:24.044] } [18:41:24.044] ...future.workdir <- getwd() [18:41:24.044] } [18:41:24.044] ...future.oldOptions <- base::as.list(base::.Options) [18:41:24.044] ...future.oldEnvVars <- base::Sys.getenv() [18:41:24.044] } [18:41:24.044] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:24.044] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:24.044] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:24.044] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:24.044] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:24.044] future.stdout.windows.reencode = NULL, width = 80L) [18:41:24.044] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:24.044] base::names(...future.oldOptions)) [18:41:24.044] } [18:41:24.044] if (FALSE) { [18:41:24.044] } [18:41:24.044] else { [18:41:24.044] if (TRUE) { [18:41:24.044] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:24.044] open = "w") [18:41:24.044] } [18:41:24.044] else { [18:41:24.044] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:24.044] windows = "NUL", "/dev/null"), open = "w") [18:41:24.044] } [18:41:24.044] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:24.044] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:24.044] base::sink(type = "output", split = FALSE) [18:41:24.044] base::close(...future.stdout) [18:41:24.044] }, add = TRUE) [18:41:24.044] } [18:41:24.044] ...future.frame <- base::sys.nframe() [18:41:24.044] ...future.conditions <- base::list() [18:41:24.044] ...future.rng <- base::globalenv()$.Random.seed [18:41:24.044] if (FALSE) { [18:41:24.044] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:24.044] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:24.044] } [18:41:24.044] ...future.result <- base::tryCatch({ [18:41:24.044] base::withCallingHandlers({ [18:41:24.044] ...future.value <- base::withVisible(base::local({ [18:41:24.044] ...future.makeSendCondition <- base::local({ [18:41:24.044] sendCondition <- NULL [18:41:24.044] function(frame = 1L) { [18:41:24.044] if (is.function(sendCondition)) [18:41:24.044] return(sendCondition) [18:41:24.044] ns <- getNamespace("parallel") [18:41:24.044] if (exists("sendData", mode = "function", [18:41:24.044] envir = ns)) { [18:41:24.044] parallel_sendData <- get("sendData", mode = "function", [18:41:24.044] envir = ns) [18:41:24.044] envir <- sys.frame(frame) [18:41:24.044] master <- NULL [18:41:24.044] while (!identical(envir, .GlobalEnv) && [18:41:24.044] !identical(envir, emptyenv())) { [18:41:24.044] if (exists("master", mode = "list", envir = envir, [18:41:24.044] inherits = FALSE)) { [18:41:24.044] master <- get("master", mode = "list", [18:41:24.044] envir = envir, inherits = FALSE) [18:41:24.044] if (inherits(master, c("SOCKnode", [18:41:24.044] "SOCK0node"))) { [18:41:24.044] sendCondition <<- function(cond) { [18:41:24.044] data <- list(type = "VALUE", value = cond, [18:41:24.044] success = TRUE) [18:41:24.044] parallel_sendData(master, data) [18:41:24.044] } [18:41:24.044] return(sendCondition) [18:41:24.044] } [18:41:24.044] } [18:41:24.044] frame <- frame + 1L [18:41:24.044] envir <- sys.frame(frame) [18:41:24.044] } [18:41:24.044] } [18:41:24.044] sendCondition <<- function(cond) NULL [18:41:24.044] } [18:41:24.044] }) [18:41:24.044] withCallingHandlers({ [18:41:24.044] { [18:41:24.044] do.call(function(...) { [18:41:24.044] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:24.044] if (!identical(...future.globals.maxSize.org, [18:41:24.044] ...future.globals.maxSize)) { [18:41:24.044] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:24.044] on.exit(options(oopts), add = TRUE) [18:41:24.044] } [18:41:24.044] { [18:41:24.044] lapply(seq_along(...future.elements_ii), [18:41:24.044] FUN = function(jj) { [18:41:24.044] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:24.044] ...future.FUN(...future.X_jj, ...) [18:41:24.044] }) [18:41:24.044] } [18:41:24.044] }, args = future.call.arguments) [18:41:24.044] } [18:41:24.044] }, immediateCondition = function(cond) { [18:41:24.044] sendCondition <- ...future.makeSendCondition() [18:41:24.044] sendCondition(cond) [18:41:24.044] muffleCondition <- function (cond, pattern = "^muffle") [18:41:24.044] { [18:41:24.044] inherits <- base::inherits [18:41:24.044] invokeRestart <- base::invokeRestart [18:41:24.044] is.null <- base::is.null [18:41:24.044] muffled <- FALSE [18:41:24.044] if (inherits(cond, "message")) { [18:41:24.044] muffled <- grepl(pattern, "muffleMessage") [18:41:24.044] if (muffled) [18:41:24.044] invokeRestart("muffleMessage") [18:41:24.044] } [18:41:24.044] else if (inherits(cond, "warning")) { [18:41:24.044] muffled <- grepl(pattern, "muffleWarning") [18:41:24.044] if (muffled) [18:41:24.044] invokeRestart("muffleWarning") [18:41:24.044] } [18:41:24.044] else if (inherits(cond, "condition")) { [18:41:24.044] if (!is.null(pattern)) { [18:41:24.044] computeRestarts <- base::computeRestarts [18:41:24.044] grepl <- base::grepl [18:41:24.044] restarts <- computeRestarts(cond) [18:41:24.044] for (restart in restarts) { [18:41:24.044] name <- restart$name [18:41:24.044] if (is.null(name)) [18:41:24.044] next [18:41:24.044] if (!grepl(pattern, name)) [18:41:24.044] next [18:41:24.044] invokeRestart(restart) [18:41:24.044] muffled <- TRUE [18:41:24.044] break [18:41:24.044] } [18:41:24.044] } [18:41:24.044] } [18:41:24.044] invisible(muffled) [18:41:24.044] } [18:41:24.044] muffleCondition(cond) [18:41:24.044] }) [18:41:24.044] })) [18:41:24.044] future::FutureResult(value = ...future.value$value, [18:41:24.044] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:24.044] ...future.rng), globalenv = if (FALSE) [18:41:24.044] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:24.044] ...future.globalenv.names)) [18:41:24.044] else NULL, started = ...future.startTime, version = "1.8") [18:41:24.044] }, condition = base::local({ [18:41:24.044] c <- base::c [18:41:24.044] inherits <- base::inherits [18:41:24.044] invokeRestart <- base::invokeRestart [18:41:24.044] length <- base::length [18:41:24.044] list <- base::list [18:41:24.044] seq.int <- base::seq.int [18:41:24.044] signalCondition <- base::signalCondition [18:41:24.044] sys.calls <- base::sys.calls [18:41:24.044] `[[` <- base::`[[` [18:41:24.044] `+` <- base::`+` [18:41:24.044] `<<-` <- base::`<<-` [18:41:24.044] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:24.044] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:24.044] 3L)] [18:41:24.044] } [18:41:24.044] function(cond) { [18:41:24.044] is_error <- inherits(cond, "error") [18:41:24.044] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:24.044] NULL) [18:41:24.044] if (is_error) { [18:41:24.044] sessionInformation <- function() { [18:41:24.044] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:24.044] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:24.044] search = base::search(), system = base::Sys.info()) [18:41:24.044] } [18:41:24.044] ...future.conditions[[length(...future.conditions) + [18:41:24.044] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:24.044] cond$call), session = sessionInformation(), [18:41:24.044] timestamp = base::Sys.time(), signaled = 0L) [18:41:24.044] signalCondition(cond) [18:41:24.044] } [18:41:24.044] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:24.044] "immediateCondition"))) { [18:41:24.044] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:24.044] ...future.conditions[[length(...future.conditions) + [18:41:24.044] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:24.044] if (TRUE && !signal) { [18:41:24.044] muffleCondition <- function (cond, pattern = "^muffle") [18:41:24.044] { [18:41:24.044] inherits <- base::inherits [18:41:24.044] invokeRestart <- base::invokeRestart [18:41:24.044] is.null <- base::is.null [18:41:24.044] muffled <- FALSE [18:41:24.044] if (inherits(cond, "message")) { [18:41:24.044] muffled <- grepl(pattern, "muffleMessage") [18:41:24.044] if (muffled) [18:41:24.044] invokeRestart("muffleMessage") [18:41:24.044] } [18:41:24.044] else if (inherits(cond, "warning")) { [18:41:24.044] muffled <- grepl(pattern, "muffleWarning") [18:41:24.044] if (muffled) [18:41:24.044] invokeRestart("muffleWarning") [18:41:24.044] } [18:41:24.044] else if (inherits(cond, "condition")) { [18:41:24.044] if (!is.null(pattern)) { [18:41:24.044] computeRestarts <- base::computeRestarts [18:41:24.044] grepl <- base::grepl [18:41:24.044] restarts <- computeRestarts(cond) [18:41:24.044] for (restart in restarts) { [18:41:24.044] name <- restart$name [18:41:24.044] if (is.null(name)) [18:41:24.044] next [18:41:24.044] if (!grepl(pattern, name)) [18:41:24.044] next [18:41:24.044] invokeRestart(restart) [18:41:24.044] muffled <- TRUE [18:41:24.044] break [18:41:24.044] } [18:41:24.044] } [18:41:24.044] } [18:41:24.044] invisible(muffled) [18:41:24.044] } [18:41:24.044] muffleCondition(cond, pattern = "^muffle") [18:41:24.044] } [18:41:24.044] } [18:41:24.044] else { [18:41:24.044] if (TRUE) { [18:41:24.044] muffleCondition <- function (cond, pattern = "^muffle") [18:41:24.044] { [18:41:24.044] inherits <- base::inherits [18:41:24.044] invokeRestart <- base::invokeRestart [18:41:24.044] is.null <- base::is.null [18:41:24.044] muffled <- FALSE [18:41:24.044] if (inherits(cond, "message")) { [18:41:24.044] muffled <- grepl(pattern, "muffleMessage") [18:41:24.044] if (muffled) [18:41:24.044] invokeRestart("muffleMessage") [18:41:24.044] } [18:41:24.044] else if (inherits(cond, "warning")) { [18:41:24.044] muffled <- grepl(pattern, "muffleWarning") [18:41:24.044] if (muffled) [18:41:24.044] invokeRestart("muffleWarning") [18:41:24.044] } [18:41:24.044] else if (inherits(cond, "condition")) { [18:41:24.044] if (!is.null(pattern)) { [18:41:24.044] computeRestarts <- base::computeRestarts [18:41:24.044] grepl <- base::grepl [18:41:24.044] restarts <- computeRestarts(cond) [18:41:24.044] for (restart in restarts) { [18:41:24.044] name <- restart$name [18:41:24.044] if (is.null(name)) [18:41:24.044] next [18:41:24.044] if (!grepl(pattern, name)) [18:41:24.044] next [18:41:24.044] invokeRestart(restart) [18:41:24.044] muffled <- TRUE [18:41:24.044] break [18:41:24.044] } [18:41:24.044] } [18:41:24.044] } [18:41:24.044] invisible(muffled) [18:41:24.044] } [18:41:24.044] muffleCondition(cond, pattern = "^muffle") [18:41:24.044] } [18:41:24.044] } [18:41:24.044] } [18:41:24.044] })) [18:41:24.044] }, error = function(ex) { [18:41:24.044] base::structure(base::list(value = NULL, visible = NULL, [18:41:24.044] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:24.044] ...future.rng), started = ...future.startTime, [18:41:24.044] finished = Sys.time(), session_uuid = NA_character_, [18:41:24.044] version = "1.8"), class = "FutureResult") [18:41:24.044] }, finally = { [18:41:24.044] if (!identical(...future.workdir, getwd())) [18:41:24.044] setwd(...future.workdir) [18:41:24.044] { [18:41:24.044] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:24.044] ...future.oldOptions$nwarnings <- NULL [18:41:24.044] } [18:41:24.044] base::options(...future.oldOptions) [18:41:24.044] if (.Platform$OS.type == "windows") { [18:41:24.044] old_names <- names(...future.oldEnvVars) [18:41:24.044] envs <- base::Sys.getenv() [18:41:24.044] names <- names(envs) [18:41:24.044] common <- intersect(names, old_names) [18:41:24.044] added <- setdiff(names, old_names) [18:41:24.044] removed <- setdiff(old_names, names) [18:41:24.044] changed <- common[...future.oldEnvVars[common] != [18:41:24.044] envs[common]] [18:41:24.044] NAMES <- toupper(changed) [18:41:24.044] args <- list() [18:41:24.044] for (kk in seq_along(NAMES)) { [18:41:24.044] name <- changed[[kk]] [18:41:24.044] NAME <- NAMES[[kk]] [18:41:24.044] if (name != NAME && is.element(NAME, old_names)) [18:41:24.044] next [18:41:24.044] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:24.044] } [18:41:24.044] NAMES <- toupper(added) [18:41:24.044] for (kk in seq_along(NAMES)) { [18:41:24.044] name <- added[[kk]] [18:41:24.044] NAME <- NAMES[[kk]] [18:41:24.044] if (name != NAME && is.element(NAME, old_names)) [18:41:24.044] next [18:41:24.044] args[[name]] <- "" [18:41:24.044] } [18:41:24.044] NAMES <- toupper(removed) [18:41:24.044] for (kk in seq_along(NAMES)) { [18:41:24.044] name <- removed[[kk]] [18:41:24.044] NAME <- NAMES[[kk]] [18:41:24.044] if (name != NAME && is.element(NAME, old_names)) [18:41:24.044] next [18:41:24.044] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:24.044] } [18:41:24.044] if (length(args) > 0) [18:41:24.044] base::do.call(base::Sys.setenv, args = args) [18:41:24.044] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:24.044] } [18:41:24.044] else { [18:41:24.044] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:24.044] } [18:41:24.044] { [18:41:24.044] if (base::length(...future.futureOptionsAdded) > [18:41:24.044] 0L) { [18:41:24.044] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:24.044] base::names(opts) <- ...future.futureOptionsAdded [18:41:24.044] base::options(opts) [18:41:24.044] } [18:41:24.044] { [18:41:24.044] { [18:41:24.044] base::options(mc.cores = ...future.mc.cores.old) [18:41:24.044] NULL [18:41:24.044] } [18:41:24.044] options(future.plan = NULL) [18:41:24.044] if (is.na(NA_character_)) [18:41:24.044] Sys.unsetenv("R_FUTURE_PLAN") [18:41:24.044] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:24.044] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:24.044] .init = FALSE) [18:41:24.044] } [18:41:24.044] } [18:41:24.044] } [18:41:24.044] }) [18:41:24.044] if (TRUE) { [18:41:24.044] base::sink(type = "output", split = FALSE) [18:41:24.044] if (TRUE) { [18:41:24.044] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:24.044] } [18:41:24.044] else { [18:41:24.044] ...future.result["stdout"] <- base::list(NULL) [18:41:24.044] } [18:41:24.044] base::close(...future.stdout) [18:41:24.044] ...future.stdout <- NULL [18:41:24.044] } [18:41:24.044] ...future.result$conditions <- ...future.conditions [18:41:24.044] ...future.result$finished <- base::Sys.time() [18:41:24.044] ...future.result [18:41:24.044] } [18:41:24.050] Exporting 5 global objects (1.20 KiB) to cluster node #1 ... [18:41:24.050] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... [18:41:24.051] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... DONE [18:41:24.051] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... [18:41:24.051] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... DONE [18:41:24.051] Exporting '...future.elements_ii' (128 bytes) to cluster node #1 ... [18:41:24.052] Exporting '...future.elements_ii' (128 bytes) to cluster node #1 ... DONE [18:41:24.052] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:24.052] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:24.053] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:24.053] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:24.053] Exporting 5 global objects (1.20 KiB) to cluster node #1 ... DONE [18:41:24.054] MultisessionFuture started [18:41:24.054] - Launch lazy future ... done [18:41:24.054] run() for 'MultisessionFuture' ... done [18:41:24.054] Created future: [18:41:24.070] receiveMessageFromWorker() for ClusterFuture ... [18:41:24.070] - Validating connection of MultisessionFuture [18:41:24.070] - received message: FutureResult [18:41:24.070] - Received FutureResult [18:41:24.070] - Erased future from FutureRegistry [18:41:24.071] result() for ClusterFuture ... [18:41:24.071] - result already collected: FutureResult [18:41:24.071] result() for ClusterFuture ... done [18:41:24.071] receiveMessageFromWorker() for ClusterFuture ... done [18:41:24.054] MultisessionFuture: [18:41:24.054] Label: 'future_lapply-1' [18:41:24.054] Expression: [18:41:24.054] { [18:41:24.054] do.call(function(...) { [18:41:24.054] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:24.054] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:24.054] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:24.054] on.exit(options(oopts), add = TRUE) [18:41:24.054] } [18:41:24.054] { [18:41:24.054] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:24.054] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:24.054] ...future.FUN(...future.X_jj, ...) [18:41:24.054] }) [18:41:24.054] } [18:41:24.054] }, args = future.call.arguments) [18:41:24.054] } [18:41:24.054] Lazy evaluation: FALSE [18:41:24.054] Asynchronous evaluation: TRUE [18:41:24.054] Local evaluation: TRUE [18:41:24.054] Environment: R_GlobalEnv [18:41:24.054] Capture standard output: TRUE [18:41:24.054] Capture condition classes: 'condition' (excluding 'nothing') [18:41:24.054] Globals: 5 objects totaling 790 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 128 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:24.054] Packages: [18:41:24.054] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:24.054] Resolved: TRUE [18:41:24.054] Value: [18:41:24.054] Conditions captured: [18:41:24.054] Early signaling: FALSE [18:41:24.054] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:24.054] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:24.072] Chunk #1 of 2 ... DONE [18:41:24.072] Chunk #2 of 2 ... [18:41:24.072] - Finding globals in 'X' for chunk #2 ... [18:41:24.072] getGlobalsAndPackages() ... [18:41:24.072] Searching for globals... [18:41:24.073] [18:41:24.073] Searching for globals ... DONE [18:41:24.073] - globals: [0] [18:41:24.073] getGlobalsAndPackages() ... DONE [18:41:24.073] + additional globals found: [n=0] [18:41:24.073] + additional namespaces needed: [n=0] [18:41:24.073] - Finding globals in 'X' for chunk #2 ... DONE [18:41:24.074] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:24.074] - seeds: [18:41:24.074] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:24.074] getGlobalsAndPackages() ... [18:41:24.074] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:24.074] Resolving globals: FALSE [18:41:24.075] Tweak future expression to call with '...' arguments ... [18:41:24.075] { [18:41:24.075] do.call(function(...) { [18:41:24.075] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:24.075] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:24.075] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:24.075] on.exit(options(oopts), add = TRUE) [18:41:24.075] } [18:41:24.075] { [18:41:24.075] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:24.075] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:24.075] ...future.FUN(...future.X_jj, ...) [18:41:24.075] }) [18:41:24.075] } [18:41:24.075] }, args = future.call.arguments) [18:41:24.075] } [18:41:24.075] Tweak future expression to call with '...' arguments ... DONE [18:41:24.076] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:24.076] [18:41:24.076] getGlobalsAndPackages() ... DONE [18:41:24.076] run() for 'Future' ... [18:41:24.077] - state: 'created' [18:41:24.077] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:24.095] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:24.095] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:24.095] - Field: 'node' [18:41:24.096] - Field: 'label' [18:41:24.096] - Field: 'local' [18:41:24.096] - Field: 'owner' [18:41:24.097] - Field: 'envir' [18:41:24.097] - Field: 'workers' [18:41:24.097] - Field: 'packages' [18:41:24.097] - Field: 'gc' [18:41:24.098] - Field: 'conditions' [18:41:24.098] - Field: 'persistent' [18:41:24.098] - Field: 'expr' [18:41:24.099] - Field: 'uuid' [18:41:24.099] - Field: 'seed' [18:41:24.099] - Field: 'version' [18:41:24.099] - Field: 'result' [18:41:24.100] - Field: 'asynchronous' [18:41:24.100] - Field: 'calls' [18:41:24.100] - Field: 'globals' [18:41:24.100] - Field: 'stdout' [18:41:24.101] - Field: 'earlySignal' [18:41:24.101] - Field: 'lazy' [18:41:24.101] - Field: 'state' [18:41:24.102] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:24.102] - Launch lazy future ... [18:41:24.102] Packages needed by the future expression (n = 0): [18:41:24.103] Packages needed by future strategies (n = 0): [18:41:24.103] { [18:41:24.103] { [18:41:24.103] { [18:41:24.103] ...future.startTime <- base::Sys.time() [18:41:24.103] { [18:41:24.103] { [18:41:24.103] { [18:41:24.103] { [18:41:24.103] base::local({ [18:41:24.103] has_future <- base::requireNamespace("future", [18:41:24.103] quietly = TRUE) [18:41:24.103] if (has_future) { [18:41:24.103] ns <- base::getNamespace("future") [18:41:24.103] version <- ns[[".package"]][["version"]] [18:41:24.103] if (is.null(version)) [18:41:24.103] version <- utils::packageVersion("future") [18:41:24.103] } [18:41:24.103] else { [18:41:24.103] version <- NULL [18:41:24.103] } [18:41:24.103] if (!has_future || version < "1.8.0") { [18:41:24.103] info <- base::c(r_version = base::gsub("R version ", [18:41:24.103] "", base::R.version$version.string), [18:41:24.103] platform = base::sprintf("%s (%s-bit)", [18:41:24.103] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:24.103] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:24.103] "release", "version")], collapse = " "), [18:41:24.103] hostname = base::Sys.info()[["nodename"]]) [18:41:24.103] info <- base::sprintf("%s: %s", base::names(info), [18:41:24.103] info) [18:41:24.103] info <- base::paste(info, collapse = "; ") [18:41:24.103] if (!has_future) { [18:41:24.103] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:24.103] info) [18:41:24.103] } [18:41:24.103] else { [18:41:24.103] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:24.103] info, version) [18:41:24.103] } [18:41:24.103] base::stop(msg) [18:41:24.103] } [18:41:24.103] }) [18:41:24.103] } [18:41:24.103] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:24.103] base::options(mc.cores = 1L) [18:41:24.103] } [18:41:24.103] ...future.strategy.old <- future::plan("list") [18:41:24.103] options(future.plan = NULL) [18:41:24.103] Sys.unsetenv("R_FUTURE_PLAN") [18:41:24.103] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:24.103] } [18:41:24.103] ...future.workdir <- getwd() [18:41:24.103] } [18:41:24.103] ...future.oldOptions <- base::as.list(base::.Options) [18:41:24.103] ...future.oldEnvVars <- base::Sys.getenv() [18:41:24.103] } [18:41:24.103] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:24.103] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:24.103] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:24.103] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:24.103] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:24.103] future.stdout.windows.reencode = NULL, width = 80L) [18:41:24.103] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:24.103] base::names(...future.oldOptions)) [18:41:24.103] } [18:41:24.103] if (FALSE) { [18:41:24.103] } [18:41:24.103] else { [18:41:24.103] if (TRUE) { [18:41:24.103] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:24.103] open = "w") [18:41:24.103] } [18:41:24.103] else { [18:41:24.103] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:24.103] windows = "NUL", "/dev/null"), open = "w") [18:41:24.103] } [18:41:24.103] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:24.103] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:24.103] base::sink(type = "output", split = FALSE) [18:41:24.103] base::close(...future.stdout) [18:41:24.103] }, add = TRUE) [18:41:24.103] } [18:41:24.103] ...future.frame <- base::sys.nframe() [18:41:24.103] ...future.conditions <- base::list() [18:41:24.103] ...future.rng <- base::globalenv()$.Random.seed [18:41:24.103] if (FALSE) { [18:41:24.103] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:24.103] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:24.103] } [18:41:24.103] ...future.result <- base::tryCatch({ [18:41:24.103] base::withCallingHandlers({ [18:41:24.103] ...future.value <- base::withVisible(base::local({ [18:41:24.103] ...future.makeSendCondition <- base::local({ [18:41:24.103] sendCondition <- NULL [18:41:24.103] function(frame = 1L) { [18:41:24.103] if (is.function(sendCondition)) [18:41:24.103] return(sendCondition) [18:41:24.103] ns <- getNamespace("parallel") [18:41:24.103] if (exists("sendData", mode = "function", [18:41:24.103] envir = ns)) { [18:41:24.103] parallel_sendData <- get("sendData", mode = "function", [18:41:24.103] envir = ns) [18:41:24.103] envir <- sys.frame(frame) [18:41:24.103] master <- NULL [18:41:24.103] while (!identical(envir, .GlobalEnv) && [18:41:24.103] !identical(envir, emptyenv())) { [18:41:24.103] if (exists("master", mode = "list", envir = envir, [18:41:24.103] inherits = FALSE)) { [18:41:24.103] master <- get("master", mode = "list", [18:41:24.103] envir = envir, inherits = FALSE) [18:41:24.103] if (inherits(master, c("SOCKnode", [18:41:24.103] "SOCK0node"))) { [18:41:24.103] sendCondition <<- function(cond) { [18:41:24.103] data <- list(type = "VALUE", value = cond, [18:41:24.103] success = TRUE) [18:41:24.103] parallel_sendData(master, data) [18:41:24.103] } [18:41:24.103] return(sendCondition) [18:41:24.103] } [18:41:24.103] } [18:41:24.103] frame <- frame + 1L [18:41:24.103] envir <- sys.frame(frame) [18:41:24.103] } [18:41:24.103] } [18:41:24.103] sendCondition <<- function(cond) NULL [18:41:24.103] } [18:41:24.103] }) [18:41:24.103] withCallingHandlers({ [18:41:24.103] { [18:41:24.103] do.call(function(...) { [18:41:24.103] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:24.103] if (!identical(...future.globals.maxSize.org, [18:41:24.103] ...future.globals.maxSize)) { [18:41:24.103] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:24.103] on.exit(options(oopts), add = TRUE) [18:41:24.103] } [18:41:24.103] { [18:41:24.103] lapply(seq_along(...future.elements_ii), [18:41:24.103] FUN = function(jj) { [18:41:24.103] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:24.103] ...future.FUN(...future.X_jj, ...) [18:41:24.103] }) [18:41:24.103] } [18:41:24.103] }, args = future.call.arguments) [18:41:24.103] } [18:41:24.103] }, immediateCondition = function(cond) { [18:41:24.103] sendCondition <- ...future.makeSendCondition() [18:41:24.103] sendCondition(cond) [18:41:24.103] muffleCondition <- function (cond, pattern = "^muffle") [18:41:24.103] { [18:41:24.103] inherits <- base::inherits [18:41:24.103] invokeRestart <- base::invokeRestart [18:41:24.103] is.null <- base::is.null [18:41:24.103] muffled <- FALSE [18:41:24.103] if (inherits(cond, "message")) { [18:41:24.103] muffled <- grepl(pattern, "muffleMessage") [18:41:24.103] if (muffled) [18:41:24.103] invokeRestart("muffleMessage") [18:41:24.103] } [18:41:24.103] else if (inherits(cond, "warning")) { [18:41:24.103] muffled <- grepl(pattern, "muffleWarning") [18:41:24.103] if (muffled) [18:41:24.103] invokeRestart("muffleWarning") [18:41:24.103] } [18:41:24.103] else if (inherits(cond, "condition")) { [18:41:24.103] if (!is.null(pattern)) { [18:41:24.103] computeRestarts <- base::computeRestarts [18:41:24.103] grepl <- base::grepl [18:41:24.103] restarts <- computeRestarts(cond) [18:41:24.103] for (restart in restarts) { [18:41:24.103] name <- restart$name [18:41:24.103] if (is.null(name)) [18:41:24.103] next [18:41:24.103] if (!grepl(pattern, name)) [18:41:24.103] next [18:41:24.103] invokeRestart(restart) [18:41:24.103] muffled <- TRUE [18:41:24.103] break [18:41:24.103] } [18:41:24.103] } [18:41:24.103] } [18:41:24.103] invisible(muffled) [18:41:24.103] } [18:41:24.103] muffleCondition(cond) [18:41:24.103] }) [18:41:24.103] })) [18:41:24.103] future::FutureResult(value = ...future.value$value, [18:41:24.103] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:24.103] ...future.rng), globalenv = if (FALSE) [18:41:24.103] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:24.103] ...future.globalenv.names)) [18:41:24.103] else NULL, started = ...future.startTime, version = "1.8") [18:41:24.103] }, condition = base::local({ [18:41:24.103] c <- base::c [18:41:24.103] inherits <- base::inherits [18:41:24.103] invokeRestart <- base::invokeRestart [18:41:24.103] length <- base::length [18:41:24.103] list <- base::list [18:41:24.103] seq.int <- base::seq.int [18:41:24.103] signalCondition <- base::signalCondition [18:41:24.103] sys.calls <- base::sys.calls [18:41:24.103] `[[` <- base::`[[` [18:41:24.103] `+` <- base::`+` [18:41:24.103] `<<-` <- base::`<<-` [18:41:24.103] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:24.103] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:24.103] 3L)] [18:41:24.103] } [18:41:24.103] function(cond) { [18:41:24.103] is_error <- inherits(cond, "error") [18:41:24.103] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:24.103] NULL) [18:41:24.103] if (is_error) { [18:41:24.103] sessionInformation <- function() { [18:41:24.103] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:24.103] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:24.103] search = base::search(), system = base::Sys.info()) [18:41:24.103] } [18:41:24.103] ...future.conditions[[length(...future.conditions) + [18:41:24.103] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:24.103] cond$call), session = sessionInformation(), [18:41:24.103] timestamp = base::Sys.time(), signaled = 0L) [18:41:24.103] signalCondition(cond) [18:41:24.103] } [18:41:24.103] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:24.103] "immediateCondition"))) { [18:41:24.103] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:24.103] ...future.conditions[[length(...future.conditions) + [18:41:24.103] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:24.103] if (TRUE && !signal) { [18:41:24.103] muffleCondition <- function (cond, pattern = "^muffle") [18:41:24.103] { [18:41:24.103] inherits <- base::inherits [18:41:24.103] invokeRestart <- base::invokeRestart [18:41:24.103] is.null <- base::is.null [18:41:24.103] muffled <- FALSE [18:41:24.103] if (inherits(cond, "message")) { [18:41:24.103] muffled <- grepl(pattern, "muffleMessage") [18:41:24.103] if (muffled) [18:41:24.103] invokeRestart("muffleMessage") [18:41:24.103] } [18:41:24.103] else if (inherits(cond, "warning")) { [18:41:24.103] muffled <- grepl(pattern, "muffleWarning") [18:41:24.103] if (muffled) [18:41:24.103] invokeRestart("muffleWarning") [18:41:24.103] } [18:41:24.103] else if (inherits(cond, "condition")) { [18:41:24.103] if (!is.null(pattern)) { [18:41:24.103] computeRestarts <- base::computeRestarts [18:41:24.103] grepl <- base::grepl [18:41:24.103] restarts <- computeRestarts(cond) [18:41:24.103] for (restart in restarts) { [18:41:24.103] name <- restart$name [18:41:24.103] if (is.null(name)) [18:41:24.103] next [18:41:24.103] if (!grepl(pattern, name)) [18:41:24.103] next [18:41:24.103] invokeRestart(restart) [18:41:24.103] muffled <- TRUE [18:41:24.103] break [18:41:24.103] } [18:41:24.103] } [18:41:24.103] } [18:41:24.103] invisible(muffled) [18:41:24.103] } [18:41:24.103] muffleCondition(cond, pattern = "^muffle") [18:41:24.103] } [18:41:24.103] } [18:41:24.103] else { [18:41:24.103] if (TRUE) { [18:41:24.103] muffleCondition <- function (cond, pattern = "^muffle") [18:41:24.103] { [18:41:24.103] inherits <- base::inherits [18:41:24.103] invokeRestart <- base::invokeRestart [18:41:24.103] is.null <- base::is.null [18:41:24.103] muffled <- FALSE [18:41:24.103] if (inherits(cond, "message")) { [18:41:24.103] muffled <- grepl(pattern, "muffleMessage") [18:41:24.103] if (muffled) [18:41:24.103] invokeRestart("muffleMessage") [18:41:24.103] } [18:41:24.103] else if (inherits(cond, "warning")) { [18:41:24.103] muffled <- grepl(pattern, "muffleWarning") [18:41:24.103] if (muffled) [18:41:24.103] invokeRestart("muffleWarning") [18:41:24.103] } [18:41:24.103] else if (inherits(cond, "condition")) { [18:41:24.103] if (!is.null(pattern)) { [18:41:24.103] computeRestarts <- base::computeRestarts [18:41:24.103] grepl <- base::grepl [18:41:24.103] restarts <- computeRestarts(cond) [18:41:24.103] for (restart in restarts) { [18:41:24.103] name <- restart$name [18:41:24.103] if (is.null(name)) [18:41:24.103] next [18:41:24.103] if (!grepl(pattern, name)) [18:41:24.103] next [18:41:24.103] invokeRestart(restart) [18:41:24.103] muffled <- TRUE [18:41:24.103] break [18:41:24.103] } [18:41:24.103] } [18:41:24.103] } [18:41:24.103] invisible(muffled) [18:41:24.103] } [18:41:24.103] muffleCondition(cond, pattern = "^muffle") [18:41:24.103] } [18:41:24.103] } [18:41:24.103] } [18:41:24.103] })) [18:41:24.103] }, error = function(ex) { [18:41:24.103] base::structure(base::list(value = NULL, visible = NULL, [18:41:24.103] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:24.103] ...future.rng), started = ...future.startTime, [18:41:24.103] finished = Sys.time(), session_uuid = NA_character_, [18:41:24.103] version = "1.8"), class = "FutureResult") [18:41:24.103] }, finally = { [18:41:24.103] if (!identical(...future.workdir, getwd())) [18:41:24.103] setwd(...future.workdir) [18:41:24.103] { [18:41:24.103] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:24.103] ...future.oldOptions$nwarnings <- NULL [18:41:24.103] } [18:41:24.103] base::options(...future.oldOptions) [18:41:24.103] if (.Platform$OS.type == "windows") { [18:41:24.103] old_names <- names(...future.oldEnvVars) [18:41:24.103] envs <- base::Sys.getenv() [18:41:24.103] names <- names(envs) [18:41:24.103] common <- intersect(names, old_names) [18:41:24.103] added <- setdiff(names, old_names) [18:41:24.103] removed <- setdiff(old_names, names) [18:41:24.103] changed <- common[...future.oldEnvVars[common] != [18:41:24.103] envs[common]] [18:41:24.103] NAMES <- toupper(changed) [18:41:24.103] args <- list() [18:41:24.103] for (kk in seq_along(NAMES)) { [18:41:24.103] name <- changed[[kk]] [18:41:24.103] NAME <- NAMES[[kk]] [18:41:24.103] if (name != NAME && is.element(NAME, old_names)) [18:41:24.103] next [18:41:24.103] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:24.103] } [18:41:24.103] NAMES <- toupper(added) [18:41:24.103] for (kk in seq_along(NAMES)) { [18:41:24.103] name <- added[[kk]] [18:41:24.103] NAME <- NAMES[[kk]] [18:41:24.103] if (name != NAME && is.element(NAME, old_names)) [18:41:24.103] next [18:41:24.103] args[[name]] <- "" [18:41:24.103] } [18:41:24.103] NAMES <- toupper(removed) [18:41:24.103] for (kk in seq_along(NAMES)) { [18:41:24.103] name <- removed[[kk]] [18:41:24.103] NAME <- NAMES[[kk]] [18:41:24.103] if (name != NAME && is.element(NAME, old_names)) [18:41:24.103] next [18:41:24.103] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:24.103] } [18:41:24.103] if (length(args) > 0) [18:41:24.103] base::do.call(base::Sys.setenv, args = args) [18:41:24.103] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:24.103] } [18:41:24.103] else { [18:41:24.103] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:24.103] } [18:41:24.103] { [18:41:24.103] if (base::length(...future.futureOptionsAdded) > [18:41:24.103] 0L) { [18:41:24.103] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:24.103] base::names(opts) <- ...future.futureOptionsAdded [18:41:24.103] base::options(opts) [18:41:24.103] } [18:41:24.103] { [18:41:24.103] { [18:41:24.103] base::options(mc.cores = ...future.mc.cores.old) [18:41:24.103] NULL [18:41:24.103] } [18:41:24.103] options(future.plan = NULL) [18:41:24.103] if (is.na(NA_character_)) [18:41:24.103] Sys.unsetenv("R_FUTURE_PLAN") [18:41:24.103] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:24.103] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:24.103] .init = FALSE) [18:41:24.103] } [18:41:24.103] } [18:41:24.103] } [18:41:24.103] }) [18:41:24.103] if (TRUE) { [18:41:24.103] base::sink(type = "output", split = FALSE) [18:41:24.103] if (TRUE) { [18:41:24.103] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:24.103] } [18:41:24.103] else { [18:41:24.103] ...future.result["stdout"] <- base::list(NULL) [18:41:24.103] } [18:41:24.103] base::close(...future.stdout) [18:41:24.103] ...future.stdout <- NULL [18:41:24.103] } [18:41:24.103] ...future.result$conditions <- ...future.conditions [18:41:24.103] ...future.result$finished <- base::Sys.time() [18:41:24.103] ...future.result [18:41:24.103] } [18:41:24.112] Exporting 5 global objects (1.20 KiB) to cluster node #1 ... [18:41:24.113] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... [18:41:24.113] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... DONE [18:41:24.114] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... [18:41:24.114] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... DONE [18:41:24.114] Exporting '...future.elements_ii' (127 bytes) to cluster node #1 ... [18:41:24.115] Exporting '...future.elements_ii' (127 bytes) to cluster node #1 ... DONE [18:41:24.115] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:24.116] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:24.116] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:24.117] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:24.117] Exporting 5 global objects (1.20 KiB) to cluster node #1 ... DONE [18:41:24.118] MultisessionFuture started [18:41:24.118] - Launch lazy future ... done [18:41:24.118] run() for 'MultisessionFuture' ... done [18:41:24.119] Created future: [18:41:24.146] receiveMessageFromWorker() for ClusterFuture ... [18:41:24.146] - Validating connection of MultisessionFuture [18:41:24.146] - received message: FutureResult [18:41:24.147] - Received FutureResult [18:41:24.147] - Erased future from FutureRegistry [18:41:24.147] result() for ClusterFuture ... [18:41:24.148] - result already collected: FutureResult [18:41:24.148] result() for ClusterFuture ... done [18:41:24.148] receiveMessageFromWorker() for ClusterFuture ... done [18:41:24.119] MultisessionFuture: [18:41:24.119] Label: 'future_lapply-2' [18:41:24.119] Expression: [18:41:24.119] { [18:41:24.119] do.call(function(...) { [18:41:24.119] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:24.119] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:24.119] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:24.119] on.exit(options(oopts), add = TRUE) [18:41:24.119] } [18:41:24.119] { [18:41:24.119] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:24.119] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:24.119] ...future.FUN(...future.X_jj, ...) [18:41:24.119] }) [18:41:24.119] } [18:41:24.119] }, args = future.call.arguments) [18:41:24.119] } [18:41:24.119] Lazy evaluation: FALSE [18:41:24.119] Asynchronous evaluation: TRUE [18:41:24.119] Local evaluation: TRUE [18:41:24.119] Environment: R_GlobalEnv [18:41:24.119] Capture standard output: TRUE [18:41:24.119] Capture condition classes: 'condition' (excluding 'nothing') [18:41:24.119] Globals: 5 objects totaling 789 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 127 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:24.119] Packages: [18:41:24.119] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:24.119] Resolved: TRUE [18:41:24.119] Value: [18:41:24.119] Conditions captured: [18:41:24.119] Early signaling: FALSE [18:41:24.119] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:24.119] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:24.149] Chunk #2 of 2 ... DONE [18:41:24.149] Launching 2 futures (chunks) ... DONE [18:41:24.149] Resolving 2 futures (chunks) ... [18:41:24.150] resolve() on list ... [18:41:24.150] recursive: 0 [18:41:24.150] length: 2 [18:41:24.150] [18:41:24.151] Future #1 [18:41:24.151] result() for ClusterFuture ... [18:41:24.151] - result already collected: FutureResult [18:41:24.151] result() for ClusterFuture ... done [18:41:24.152] result() for ClusterFuture ... [18:41:24.152] - result already collected: FutureResult [18:41:24.152] result() for ClusterFuture ... done [18:41:24.152] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:24.153] - nx: 2 [18:41:24.153] - relay: TRUE [18:41:24.153] - stdout: TRUE [18:41:24.153] - signal: TRUE [18:41:24.154] - resignal: FALSE [18:41:24.154] - force: TRUE [18:41:24.154] - relayed: [n=2] FALSE, FALSE [18:41:24.154] - queued futures: [n=2] FALSE, FALSE [18:41:24.155] - until=1 [18:41:24.155] - relaying element #1 [18:41:24.155] result() for ClusterFuture ... [18:41:24.155] - result already collected: FutureResult [18:41:24.156] result() for ClusterFuture ... done [18:41:24.156] result() for ClusterFuture ... [18:41:24.156] - result already collected: FutureResult [18:41:24.156] result() for ClusterFuture ... done [18:41:24.157] result() for ClusterFuture ... [18:41:24.157] - result already collected: FutureResult [18:41:24.157] result() for ClusterFuture ... done [18:41:24.157] result() for ClusterFuture ... [18:41:24.158] - result already collected: FutureResult [18:41:24.158] result() for ClusterFuture ... done [18:41:24.158] - relayed: [n=2] TRUE, FALSE [18:41:24.158] - queued futures: [n=2] TRUE, FALSE [18:41:24.159] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:24.159] length: 1 (resolved future 1) [18:41:24.159] Future #2 [18:41:24.159] result() for ClusterFuture ... [18:41:24.160] - result already collected: FutureResult [18:41:24.160] result() for ClusterFuture ... done [18:41:24.160] result() for ClusterFuture ... [18:41:24.160] - result already collected: FutureResult [18:41:24.161] result() for ClusterFuture ... done [18:41:24.161] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:24.161] - nx: 2 [18:41:24.161] - relay: TRUE [18:41:24.162] - stdout: TRUE [18:41:24.162] - signal: TRUE [18:41:24.162] - resignal: FALSE [18:41:24.162] - force: TRUE [18:41:24.163] - relayed: [n=2] TRUE, FALSE [18:41:24.163] - queued futures: [n=2] TRUE, FALSE [18:41:24.163] - until=2 [18:41:24.163] - relaying element #2 [18:41:24.164] result() for ClusterFuture ... [18:41:24.164] - result already collected: FutureResult [18:41:24.164] result() for ClusterFuture ... done [18:41:24.164] result() for ClusterFuture ... [18:41:24.165] - result already collected: FutureResult [18:41:24.165] result() for ClusterFuture ... done [18:41:24.165] result() for ClusterFuture ... [18:41:24.165] - result already collected: FutureResult [18:41:24.166] result() for ClusterFuture ... done [18:41:24.166] result() for ClusterFuture ... [18:41:24.166] - result already collected: FutureResult [18:41:24.166] result() for ClusterFuture ... done [18:41:24.167] - relayed: [n=2] TRUE, TRUE [18:41:24.167] - queued futures: [n=2] TRUE, TRUE [18:41:24.167] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:24.167] length: 0 (resolved future 2) [18:41:24.168] Relaying remaining futures [18:41:24.168] signalConditionsASAP(NULL, pos=0) ... [18:41:24.168] - nx: 2 [18:41:24.168] - relay: TRUE [18:41:24.169] - stdout: TRUE [18:41:24.169] - signal: TRUE [18:41:24.169] - resignal: FALSE [18:41:24.169] - force: TRUE [18:41:24.169] - relayed: [n=2] TRUE, TRUE [18:41:24.170] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:24.170] - relayed: [n=2] TRUE, TRUE [18:41:24.170] - queued futures: [n=2] TRUE, TRUE [18:41:24.171] signalConditionsASAP(NULL, pos=0) ... done [18:41:24.171] resolve() on list ... DONE [18:41:24.171] result() for ClusterFuture ... [18:41:24.171] - result already collected: FutureResult [18:41:24.172] result() for ClusterFuture ... done [18:41:24.172] result() for ClusterFuture ... [18:41:24.172] - result already collected: FutureResult [18:41:24.172] result() for ClusterFuture ... done [18:41:24.173] result() for ClusterFuture ... [18:41:24.173] - result already collected: FutureResult [18:41:24.173] result() for ClusterFuture ... done [18:41:24.173] result() for ClusterFuture ... [18:41:24.174] - result already collected: FutureResult [18:41:24.174] result() for ClusterFuture ... done [18:41:24.174] - Number of value chunks collected: 2 [18:41:24.174] Resolving 2 futures (chunks) ... DONE [18:41:24.175] Reducing values from 2 chunks ... [18:41:24.175] - Number of values collected after concatenation: 4 [18:41:24.175] - Number of values expected: 4 [18:41:24.175] Reducing values from 2 chunks ... DONE [18:41:24.176] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL [18:41:24.180] future_lapply() ... [18:41:24.185] Number of chunks: 2 [18:41:24.185] getGlobalsAndPackagesXApply() ... [18:41:24.185] - future.globals: TRUE [18:41:24.185] getGlobalsAndPackages() ... [18:41:24.186] Searching for globals... [18:41:24.188] - globals found: [2] 'FUN', '.Internal' [18:41:24.188] Searching for globals ... DONE [18:41:24.188] Resolving globals: FALSE [18:41:24.189] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:24.190] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:24.190] - globals: [1] 'FUN' [18:41:24.190] [18:41:24.191] getGlobalsAndPackages() ... DONE [18:41:24.191] - globals found/used: [n=1] 'FUN' [18:41:24.191] - needed namespaces: [n=0] [18:41:24.191] Finding globals ... DONE [18:41:24.192] - use_args: TRUE [18:41:24.192] - Getting '...' globals ... [18:41:24.193] resolve() on list ... [18:41:24.193] recursive: 0 [18:41:24.193] length: 1 [18:41:24.193] elements: '...' [18:41:24.194] length: 0 (resolved future 1) [18:41:24.194] resolve() on list ... DONE [18:41:24.194] - '...' content: [n=1] 'length' [18:41:24.194] List of 1 [18:41:24.194] $ ...:List of 1 [18:41:24.194] ..$ length: int 2 [18:41:24.194] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:24.194] - attr(*, "where")=List of 1 [18:41:24.194] ..$ ...: [18:41:24.194] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:24.194] - attr(*, "resolved")= logi TRUE [18:41:24.194] - attr(*, "total_size")= num NA [18:41:24.199] - Getting '...' globals ... DONE [18:41:24.200] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:24.200] List of 2 [18:41:24.200] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:24.200] $ ... :List of 1 [18:41:24.200] ..$ length: int 2 [18:41:24.200] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:24.200] - attr(*, "where")=List of 2 [18:41:24.200] ..$ ...future.FUN: [18:41:24.200] ..$ ... : [18:41:24.200] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:24.200] - attr(*, "resolved")= logi FALSE [18:41:24.200] - attr(*, "total_size")= int 4324 [18:41:24.206] Packages to be attached in all futures: [n=0] [18:41:24.206] getGlobalsAndPackagesXApply() ... DONE [18:41:24.207] Number of futures (= number of chunks): 2 [18:41:24.207] Launching 2 futures (chunks) ... [18:41:24.207] Chunk #1 of 2 ... [18:41:24.208] - Finding globals in 'X' for chunk #1 ... [18:41:24.208] getGlobalsAndPackages() ... [18:41:24.208] Searching for globals... [18:41:24.209] [18:41:24.209] Searching for globals ... DONE [18:41:24.209] - globals: [0] [18:41:24.209] getGlobalsAndPackages() ... DONE [18:41:24.210] + additional globals found: [n=0] [18:41:24.210] + additional namespaces needed: [n=0] [18:41:24.210] - Finding globals in 'X' for chunk #1 ... DONE [18:41:24.210] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:24.211] - seeds: [18:41:24.211] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:24.211] getGlobalsAndPackages() ... [18:41:24.211] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:24.212] Resolving globals: FALSE [18:41:24.212] Tweak future expression to call with '...' arguments ... [18:41:24.212] { [18:41:24.212] do.call(function(...) { [18:41:24.212] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:24.212] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:24.212] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:24.212] on.exit(options(oopts), add = TRUE) [18:41:24.212] } [18:41:24.212] { [18:41:24.212] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:24.212] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:24.212] ...future.FUN(...future.X_jj, ...) [18:41:24.212] }) [18:41:24.212] } [18:41:24.212] }, args = future.call.arguments) [18:41:24.212] } [18:41:24.213] Tweak future expression to call with '...' arguments ... DONE [18:41:24.214] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:24.214] [18:41:24.214] getGlobalsAndPackages() ... DONE [18:41:24.215] run() for 'Future' ... [18:41:24.215] - state: 'created' [18:41:24.215] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:24.235] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:24.235] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:24.236] - Field: 'node' [18:41:24.236] - Field: 'label' [18:41:24.236] - Field: 'local' [18:41:24.237] - Field: 'owner' [18:41:24.237] - Field: 'envir' [18:41:24.237] - Field: 'workers' [18:41:24.237] - Field: 'packages' [18:41:24.238] - Field: 'gc' [18:41:24.238] - Field: 'conditions' [18:41:24.238] - Field: 'persistent' [18:41:24.239] - Field: 'expr' [18:41:24.239] - Field: 'uuid' [18:41:24.239] - Field: 'seed' [18:41:24.239] - Field: 'version' [18:41:24.240] - Field: 'result' [18:41:24.240] - Field: 'asynchronous' [18:41:24.240] - Field: 'calls' [18:41:24.241] - Field: 'globals' [18:41:24.241] - Field: 'stdout' [18:41:24.241] - Field: 'earlySignal' [18:41:24.241] - Field: 'lazy' [18:41:24.242] - Field: 'state' [18:41:24.242] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:24.242] - Launch lazy future ... [18:41:24.243] Packages needed by the future expression (n = 0): [18:41:24.243] Packages needed by future strategies (n = 0): [18:41:24.244] { [18:41:24.244] { [18:41:24.244] { [18:41:24.244] ...future.startTime <- base::Sys.time() [18:41:24.244] { [18:41:24.244] { [18:41:24.244] { [18:41:24.244] { [18:41:24.244] base::local({ [18:41:24.244] has_future <- base::requireNamespace("future", [18:41:24.244] quietly = TRUE) [18:41:24.244] if (has_future) { [18:41:24.244] ns <- base::getNamespace("future") [18:41:24.244] version <- ns[[".package"]][["version"]] [18:41:24.244] if (is.null(version)) [18:41:24.244] version <- utils::packageVersion("future") [18:41:24.244] } [18:41:24.244] else { [18:41:24.244] version <- NULL [18:41:24.244] } [18:41:24.244] if (!has_future || version < "1.8.0") { [18:41:24.244] info <- base::c(r_version = base::gsub("R version ", [18:41:24.244] "", base::R.version$version.string), [18:41:24.244] platform = base::sprintf("%s (%s-bit)", [18:41:24.244] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:24.244] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:24.244] "release", "version")], collapse = " "), [18:41:24.244] hostname = base::Sys.info()[["nodename"]]) [18:41:24.244] info <- base::sprintf("%s: %s", base::names(info), [18:41:24.244] info) [18:41:24.244] info <- base::paste(info, collapse = "; ") [18:41:24.244] if (!has_future) { [18:41:24.244] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:24.244] info) [18:41:24.244] } [18:41:24.244] else { [18:41:24.244] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:24.244] info, version) [18:41:24.244] } [18:41:24.244] base::stop(msg) [18:41:24.244] } [18:41:24.244] }) [18:41:24.244] } [18:41:24.244] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:24.244] base::options(mc.cores = 1L) [18:41:24.244] } [18:41:24.244] ...future.strategy.old <- future::plan("list") [18:41:24.244] options(future.plan = NULL) [18:41:24.244] Sys.unsetenv("R_FUTURE_PLAN") [18:41:24.244] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:24.244] } [18:41:24.244] ...future.workdir <- getwd() [18:41:24.244] } [18:41:24.244] ...future.oldOptions <- base::as.list(base::.Options) [18:41:24.244] ...future.oldEnvVars <- base::Sys.getenv() [18:41:24.244] } [18:41:24.244] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:24.244] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:24.244] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:24.244] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:24.244] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:24.244] future.stdout.windows.reencode = NULL, width = 80L) [18:41:24.244] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:24.244] base::names(...future.oldOptions)) [18:41:24.244] } [18:41:24.244] if (FALSE) { [18:41:24.244] } [18:41:24.244] else { [18:41:24.244] if (TRUE) { [18:41:24.244] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:24.244] open = "w") [18:41:24.244] } [18:41:24.244] else { [18:41:24.244] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:24.244] windows = "NUL", "/dev/null"), open = "w") [18:41:24.244] } [18:41:24.244] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:24.244] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:24.244] base::sink(type = "output", split = FALSE) [18:41:24.244] base::close(...future.stdout) [18:41:24.244] }, add = TRUE) [18:41:24.244] } [18:41:24.244] ...future.frame <- base::sys.nframe() [18:41:24.244] ...future.conditions <- base::list() [18:41:24.244] ...future.rng <- base::globalenv()$.Random.seed [18:41:24.244] if (FALSE) { [18:41:24.244] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:24.244] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:24.244] } [18:41:24.244] ...future.result <- base::tryCatch({ [18:41:24.244] base::withCallingHandlers({ [18:41:24.244] ...future.value <- base::withVisible(base::local({ [18:41:24.244] ...future.makeSendCondition <- base::local({ [18:41:24.244] sendCondition <- NULL [18:41:24.244] function(frame = 1L) { [18:41:24.244] if (is.function(sendCondition)) [18:41:24.244] return(sendCondition) [18:41:24.244] ns <- getNamespace("parallel") [18:41:24.244] if (exists("sendData", mode = "function", [18:41:24.244] envir = ns)) { [18:41:24.244] parallel_sendData <- get("sendData", mode = "function", [18:41:24.244] envir = ns) [18:41:24.244] envir <- sys.frame(frame) [18:41:24.244] master <- NULL [18:41:24.244] while (!identical(envir, .GlobalEnv) && [18:41:24.244] !identical(envir, emptyenv())) { [18:41:24.244] if (exists("master", mode = "list", envir = envir, [18:41:24.244] inherits = FALSE)) { [18:41:24.244] master <- get("master", mode = "list", [18:41:24.244] envir = envir, inherits = FALSE) [18:41:24.244] if (inherits(master, c("SOCKnode", [18:41:24.244] "SOCK0node"))) { [18:41:24.244] sendCondition <<- function(cond) { [18:41:24.244] data <- list(type = "VALUE", value = cond, [18:41:24.244] success = TRUE) [18:41:24.244] parallel_sendData(master, data) [18:41:24.244] } [18:41:24.244] return(sendCondition) [18:41:24.244] } [18:41:24.244] } [18:41:24.244] frame <- frame + 1L [18:41:24.244] envir <- sys.frame(frame) [18:41:24.244] } [18:41:24.244] } [18:41:24.244] sendCondition <<- function(cond) NULL [18:41:24.244] } [18:41:24.244] }) [18:41:24.244] withCallingHandlers({ [18:41:24.244] { [18:41:24.244] do.call(function(...) { [18:41:24.244] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:24.244] if (!identical(...future.globals.maxSize.org, [18:41:24.244] ...future.globals.maxSize)) { [18:41:24.244] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:24.244] on.exit(options(oopts), add = TRUE) [18:41:24.244] } [18:41:24.244] { [18:41:24.244] lapply(seq_along(...future.elements_ii), [18:41:24.244] FUN = function(jj) { [18:41:24.244] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:24.244] ...future.FUN(...future.X_jj, ...) [18:41:24.244] }) [18:41:24.244] } [18:41:24.244] }, args = future.call.arguments) [18:41:24.244] } [18:41:24.244] }, immediateCondition = function(cond) { [18:41:24.244] sendCondition <- ...future.makeSendCondition() [18:41:24.244] sendCondition(cond) [18:41:24.244] muffleCondition <- function (cond, pattern = "^muffle") [18:41:24.244] { [18:41:24.244] inherits <- base::inherits [18:41:24.244] invokeRestart <- base::invokeRestart [18:41:24.244] is.null <- base::is.null [18:41:24.244] muffled <- FALSE [18:41:24.244] if (inherits(cond, "message")) { [18:41:24.244] muffled <- grepl(pattern, "muffleMessage") [18:41:24.244] if (muffled) [18:41:24.244] invokeRestart("muffleMessage") [18:41:24.244] } [18:41:24.244] else if (inherits(cond, "warning")) { [18:41:24.244] muffled <- grepl(pattern, "muffleWarning") [18:41:24.244] if (muffled) [18:41:24.244] invokeRestart("muffleWarning") [18:41:24.244] } [18:41:24.244] else if (inherits(cond, "condition")) { [18:41:24.244] if (!is.null(pattern)) { [18:41:24.244] computeRestarts <- base::computeRestarts [18:41:24.244] grepl <- base::grepl [18:41:24.244] restarts <- computeRestarts(cond) [18:41:24.244] for (restart in restarts) { [18:41:24.244] name <- restart$name [18:41:24.244] if (is.null(name)) [18:41:24.244] next [18:41:24.244] if (!grepl(pattern, name)) [18:41:24.244] next [18:41:24.244] invokeRestart(restart) [18:41:24.244] muffled <- TRUE [18:41:24.244] break [18:41:24.244] } [18:41:24.244] } [18:41:24.244] } [18:41:24.244] invisible(muffled) [18:41:24.244] } [18:41:24.244] muffleCondition(cond) [18:41:24.244] }) [18:41:24.244] })) [18:41:24.244] future::FutureResult(value = ...future.value$value, [18:41:24.244] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:24.244] ...future.rng), globalenv = if (FALSE) [18:41:24.244] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:24.244] ...future.globalenv.names)) [18:41:24.244] else NULL, started = ...future.startTime, version = "1.8") [18:41:24.244] }, condition = base::local({ [18:41:24.244] c <- base::c [18:41:24.244] inherits <- base::inherits [18:41:24.244] invokeRestart <- base::invokeRestart [18:41:24.244] length <- base::length [18:41:24.244] list <- base::list [18:41:24.244] seq.int <- base::seq.int [18:41:24.244] signalCondition <- base::signalCondition [18:41:24.244] sys.calls <- base::sys.calls [18:41:24.244] `[[` <- base::`[[` [18:41:24.244] `+` <- base::`+` [18:41:24.244] `<<-` <- base::`<<-` [18:41:24.244] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:24.244] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:24.244] 3L)] [18:41:24.244] } [18:41:24.244] function(cond) { [18:41:24.244] is_error <- inherits(cond, "error") [18:41:24.244] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:24.244] NULL) [18:41:24.244] if (is_error) { [18:41:24.244] sessionInformation <- function() { [18:41:24.244] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:24.244] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:24.244] search = base::search(), system = base::Sys.info()) [18:41:24.244] } [18:41:24.244] ...future.conditions[[length(...future.conditions) + [18:41:24.244] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:24.244] cond$call), session = sessionInformation(), [18:41:24.244] timestamp = base::Sys.time(), signaled = 0L) [18:41:24.244] signalCondition(cond) [18:41:24.244] } [18:41:24.244] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:24.244] "immediateCondition"))) { [18:41:24.244] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:24.244] ...future.conditions[[length(...future.conditions) + [18:41:24.244] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:24.244] if (TRUE && !signal) { [18:41:24.244] muffleCondition <- function (cond, pattern = "^muffle") [18:41:24.244] { [18:41:24.244] inherits <- base::inherits [18:41:24.244] invokeRestart <- base::invokeRestart [18:41:24.244] is.null <- base::is.null [18:41:24.244] muffled <- FALSE [18:41:24.244] if (inherits(cond, "message")) { [18:41:24.244] muffled <- grepl(pattern, "muffleMessage") [18:41:24.244] if (muffled) [18:41:24.244] invokeRestart("muffleMessage") [18:41:24.244] } [18:41:24.244] else if (inherits(cond, "warning")) { [18:41:24.244] muffled <- grepl(pattern, "muffleWarning") [18:41:24.244] if (muffled) [18:41:24.244] invokeRestart("muffleWarning") [18:41:24.244] } [18:41:24.244] else if (inherits(cond, "condition")) { [18:41:24.244] if (!is.null(pattern)) { [18:41:24.244] computeRestarts <- base::computeRestarts [18:41:24.244] grepl <- base::grepl [18:41:24.244] restarts <- computeRestarts(cond) [18:41:24.244] for (restart in restarts) { [18:41:24.244] name <- restart$name [18:41:24.244] if (is.null(name)) [18:41:24.244] next [18:41:24.244] if (!grepl(pattern, name)) [18:41:24.244] next [18:41:24.244] invokeRestart(restart) [18:41:24.244] muffled <- TRUE [18:41:24.244] break [18:41:24.244] } [18:41:24.244] } [18:41:24.244] } [18:41:24.244] invisible(muffled) [18:41:24.244] } [18:41:24.244] muffleCondition(cond, pattern = "^muffle") [18:41:24.244] } [18:41:24.244] } [18:41:24.244] else { [18:41:24.244] if (TRUE) { [18:41:24.244] muffleCondition <- function (cond, pattern = "^muffle") [18:41:24.244] { [18:41:24.244] inherits <- base::inherits [18:41:24.244] invokeRestart <- base::invokeRestart [18:41:24.244] is.null <- base::is.null [18:41:24.244] muffled <- FALSE [18:41:24.244] if (inherits(cond, "message")) { [18:41:24.244] muffled <- grepl(pattern, "muffleMessage") [18:41:24.244] if (muffled) [18:41:24.244] invokeRestart("muffleMessage") [18:41:24.244] } [18:41:24.244] else if (inherits(cond, "warning")) { [18:41:24.244] muffled <- grepl(pattern, "muffleWarning") [18:41:24.244] if (muffled) [18:41:24.244] invokeRestart("muffleWarning") [18:41:24.244] } [18:41:24.244] else if (inherits(cond, "condition")) { [18:41:24.244] if (!is.null(pattern)) { [18:41:24.244] computeRestarts <- base::computeRestarts [18:41:24.244] grepl <- base::grepl [18:41:24.244] restarts <- computeRestarts(cond) [18:41:24.244] for (restart in restarts) { [18:41:24.244] name <- restart$name [18:41:24.244] if (is.null(name)) [18:41:24.244] next [18:41:24.244] if (!grepl(pattern, name)) [18:41:24.244] next [18:41:24.244] invokeRestart(restart) [18:41:24.244] muffled <- TRUE [18:41:24.244] break [18:41:24.244] } [18:41:24.244] } [18:41:24.244] } [18:41:24.244] invisible(muffled) [18:41:24.244] } [18:41:24.244] muffleCondition(cond, pattern = "^muffle") [18:41:24.244] } [18:41:24.244] } [18:41:24.244] } [18:41:24.244] })) [18:41:24.244] }, error = function(ex) { [18:41:24.244] base::structure(base::list(value = NULL, visible = NULL, [18:41:24.244] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:24.244] ...future.rng), started = ...future.startTime, [18:41:24.244] finished = Sys.time(), session_uuid = NA_character_, [18:41:24.244] version = "1.8"), class = "FutureResult") [18:41:24.244] }, finally = { [18:41:24.244] if (!identical(...future.workdir, getwd())) [18:41:24.244] setwd(...future.workdir) [18:41:24.244] { [18:41:24.244] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:24.244] ...future.oldOptions$nwarnings <- NULL [18:41:24.244] } [18:41:24.244] base::options(...future.oldOptions) [18:41:24.244] if (.Platform$OS.type == "windows") { [18:41:24.244] old_names <- names(...future.oldEnvVars) [18:41:24.244] envs <- base::Sys.getenv() [18:41:24.244] names <- names(envs) [18:41:24.244] common <- intersect(names, old_names) [18:41:24.244] added <- setdiff(names, old_names) [18:41:24.244] removed <- setdiff(old_names, names) [18:41:24.244] changed <- common[...future.oldEnvVars[common] != [18:41:24.244] envs[common]] [18:41:24.244] NAMES <- toupper(changed) [18:41:24.244] args <- list() [18:41:24.244] for (kk in seq_along(NAMES)) { [18:41:24.244] name <- changed[[kk]] [18:41:24.244] NAME <- NAMES[[kk]] [18:41:24.244] if (name != NAME && is.element(NAME, old_names)) [18:41:24.244] next [18:41:24.244] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:24.244] } [18:41:24.244] NAMES <- toupper(added) [18:41:24.244] for (kk in seq_along(NAMES)) { [18:41:24.244] name <- added[[kk]] [18:41:24.244] NAME <- NAMES[[kk]] [18:41:24.244] if (name != NAME && is.element(NAME, old_names)) [18:41:24.244] next [18:41:24.244] args[[name]] <- "" [18:41:24.244] } [18:41:24.244] NAMES <- toupper(removed) [18:41:24.244] for (kk in seq_along(NAMES)) { [18:41:24.244] name <- removed[[kk]] [18:41:24.244] NAME <- NAMES[[kk]] [18:41:24.244] if (name != NAME && is.element(NAME, old_names)) [18:41:24.244] next [18:41:24.244] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:24.244] } [18:41:24.244] if (length(args) > 0) [18:41:24.244] base::do.call(base::Sys.setenv, args = args) [18:41:24.244] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:24.244] } [18:41:24.244] else { [18:41:24.244] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:24.244] } [18:41:24.244] { [18:41:24.244] if (base::length(...future.futureOptionsAdded) > [18:41:24.244] 0L) { [18:41:24.244] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:24.244] base::names(opts) <- ...future.futureOptionsAdded [18:41:24.244] base::options(opts) [18:41:24.244] } [18:41:24.244] { [18:41:24.244] { [18:41:24.244] base::options(mc.cores = ...future.mc.cores.old) [18:41:24.244] NULL [18:41:24.244] } [18:41:24.244] options(future.plan = NULL) [18:41:24.244] if (is.na(NA_character_)) [18:41:24.244] Sys.unsetenv("R_FUTURE_PLAN") [18:41:24.244] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:24.244] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:24.244] .init = FALSE) [18:41:24.244] } [18:41:24.244] } [18:41:24.244] } [18:41:24.244] }) [18:41:24.244] if (TRUE) { [18:41:24.244] base::sink(type = "output", split = FALSE) [18:41:24.244] if (TRUE) { [18:41:24.244] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:24.244] } [18:41:24.244] else { [18:41:24.244] ...future.result["stdout"] <- base::list(NULL) [18:41:24.244] } [18:41:24.244] base::close(...future.stdout) [18:41:24.244] ...future.stdout <- NULL [18:41:24.244] } [18:41:24.244] ...future.result$conditions <- ...future.conditions [18:41:24.244] ...future.result$finished <- base::Sys.time() [18:41:24.244] ...future.result [18:41:24.244] } [18:41:24.253] Exporting 5 global objects (1.20 KiB) to cluster node #1 ... [18:41:24.253] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... [18:41:24.254] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... DONE [18:41:24.254] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... [18:41:24.254] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... DONE [18:41:24.255] Exporting '...future.elements_ii' (128 bytes) to cluster node #1 ... [18:41:24.255] Exporting '...future.elements_ii' (128 bytes) to cluster node #1 ... DONE [18:41:24.256] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:24.256] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:24.256] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:24.257] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:24.257] Exporting 5 global objects (1.20 KiB) to cluster node #1 ... DONE [18:41:24.258] MultisessionFuture started [18:41:24.258] - Launch lazy future ... done [18:41:24.259] run() for 'MultisessionFuture' ... done [18:41:24.259] Created future: [18:41:24.289] receiveMessageFromWorker() for ClusterFuture ... [18:41:24.290] - Validating connection of MultisessionFuture [18:41:24.290] - received message: FutureResult [18:41:24.291] - Received FutureResult [18:41:24.291] - Erased future from FutureRegistry [18:41:24.291] result() for ClusterFuture ... [18:41:24.291] - result already collected: FutureResult [18:41:24.292] result() for ClusterFuture ... done [18:41:24.292] receiveMessageFromWorker() for ClusterFuture ... done [18:41:24.259] MultisessionFuture: [18:41:24.259] Label: 'future_lapply-1' [18:41:24.259] Expression: [18:41:24.259] { [18:41:24.259] do.call(function(...) { [18:41:24.259] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:24.259] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:24.259] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:24.259] on.exit(options(oopts), add = TRUE) [18:41:24.259] } [18:41:24.259] { [18:41:24.259] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:24.259] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:24.259] ...future.FUN(...future.X_jj, ...) [18:41:24.259] }) [18:41:24.259] } [18:41:24.259] }, args = future.call.arguments) [18:41:24.259] } [18:41:24.259] Lazy evaluation: FALSE [18:41:24.259] Asynchronous evaluation: TRUE [18:41:24.259] Local evaluation: TRUE [18:41:24.259] Environment: R_GlobalEnv [18:41:24.259] Capture standard output: TRUE [18:41:24.259] Capture condition classes: 'condition' (excluding 'nothing') [18:41:24.259] Globals: 5 objects totaling 790 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 128 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:24.259] Packages: [18:41:24.259] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:24.259] Resolved: TRUE [18:41:24.259] Value: [18:41:24.259] Conditions captured: [18:41:24.259] Early signaling: FALSE [18:41:24.259] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:24.259] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:24.292] Chunk #1 of 2 ... DONE [18:41:24.293] Chunk #2 of 2 ... [18:41:24.293] - Finding globals in 'X' for chunk #2 ... [18:41:24.293] getGlobalsAndPackages() ... [18:41:24.294] Searching for globals... [18:41:24.294] [18:41:24.294] Searching for globals ... DONE [18:41:24.295] - globals: [0] [18:41:24.295] getGlobalsAndPackages() ... DONE [18:41:24.295] + additional globals found: [n=0] [18:41:24.295] + additional namespaces needed: [n=0] [18:41:24.296] - Finding globals in 'X' for chunk #2 ... DONE [18:41:24.296] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:24.296] - seeds: [18:41:24.296] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:24.297] getGlobalsAndPackages() ... [18:41:24.297] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:24.297] Resolving globals: FALSE [18:41:24.297] Tweak future expression to call with '...' arguments ... [18:41:24.298] { [18:41:24.298] do.call(function(...) { [18:41:24.298] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:24.298] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:24.298] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:24.298] on.exit(options(oopts), add = TRUE) [18:41:24.298] } [18:41:24.298] { [18:41:24.298] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:24.298] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:24.298] ...future.FUN(...future.X_jj, ...) [18:41:24.298] }) [18:41:24.298] } [18:41:24.298] }, args = future.call.arguments) [18:41:24.298] } [18:41:24.298] Tweak future expression to call with '...' arguments ... DONE [18:41:24.299] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:24.299] [18:41:24.300] getGlobalsAndPackages() ... DONE [18:41:24.300] run() for 'Future' ... [18:41:24.301] - state: 'created' [18:41:24.301] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:24.321] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:24.321] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:24.321] - Field: 'node' [18:41:24.321] - Field: 'label' [18:41:24.322] - Field: 'local' [18:41:24.322] - Field: 'owner' [18:41:24.322] - Field: 'envir' [18:41:24.323] - Field: 'workers' [18:41:24.323] - Field: 'packages' [18:41:24.323] - Field: 'gc' [18:41:24.323] - Field: 'conditions' [18:41:24.324] - Field: 'persistent' [18:41:24.324] - Field: 'expr' [18:41:24.324] - Field: 'uuid' [18:41:24.325] - Field: 'seed' [18:41:24.325] - Field: 'version' [18:41:24.325] - Field: 'result' [18:41:24.325] - Field: 'asynchronous' [18:41:24.326] - Field: 'calls' [18:41:24.326] - Field: 'globals' [18:41:24.326] - Field: 'stdout' [18:41:24.326] - Field: 'earlySignal' [18:41:24.327] - Field: 'lazy' [18:41:24.327] - Field: 'state' [18:41:24.327] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:24.328] - Launch lazy future ... [18:41:24.328] Packages needed by the future expression (n = 0): [18:41:24.328] Packages needed by future strategies (n = 0): [18:41:24.329] { [18:41:24.329] { [18:41:24.329] { [18:41:24.329] ...future.startTime <- base::Sys.time() [18:41:24.329] { [18:41:24.329] { [18:41:24.329] { [18:41:24.329] { [18:41:24.329] base::local({ [18:41:24.329] has_future <- base::requireNamespace("future", [18:41:24.329] quietly = TRUE) [18:41:24.329] if (has_future) { [18:41:24.329] ns <- base::getNamespace("future") [18:41:24.329] version <- ns[[".package"]][["version"]] [18:41:24.329] if (is.null(version)) [18:41:24.329] version <- utils::packageVersion("future") [18:41:24.329] } [18:41:24.329] else { [18:41:24.329] version <- NULL [18:41:24.329] } [18:41:24.329] if (!has_future || version < "1.8.0") { [18:41:24.329] info <- base::c(r_version = base::gsub("R version ", [18:41:24.329] "", base::R.version$version.string), [18:41:24.329] platform = base::sprintf("%s (%s-bit)", [18:41:24.329] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:24.329] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:24.329] "release", "version")], collapse = " "), [18:41:24.329] hostname = base::Sys.info()[["nodename"]]) [18:41:24.329] info <- base::sprintf("%s: %s", base::names(info), [18:41:24.329] info) [18:41:24.329] info <- base::paste(info, collapse = "; ") [18:41:24.329] if (!has_future) { [18:41:24.329] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:24.329] info) [18:41:24.329] } [18:41:24.329] else { [18:41:24.329] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:24.329] info, version) [18:41:24.329] } [18:41:24.329] base::stop(msg) [18:41:24.329] } [18:41:24.329] }) [18:41:24.329] } [18:41:24.329] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:24.329] base::options(mc.cores = 1L) [18:41:24.329] } [18:41:24.329] ...future.strategy.old <- future::plan("list") [18:41:24.329] options(future.plan = NULL) [18:41:24.329] Sys.unsetenv("R_FUTURE_PLAN") [18:41:24.329] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:24.329] } [18:41:24.329] ...future.workdir <- getwd() [18:41:24.329] } [18:41:24.329] ...future.oldOptions <- base::as.list(base::.Options) [18:41:24.329] ...future.oldEnvVars <- base::Sys.getenv() [18:41:24.329] } [18:41:24.329] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:24.329] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:24.329] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:24.329] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:24.329] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:24.329] future.stdout.windows.reencode = NULL, width = 80L) [18:41:24.329] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:24.329] base::names(...future.oldOptions)) [18:41:24.329] } [18:41:24.329] if (FALSE) { [18:41:24.329] } [18:41:24.329] else { [18:41:24.329] if (TRUE) { [18:41:24.329] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:24.329] open = "w") [18:41:24.329] } [18:41:24.329] else { [18:41:24.329] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:24.329] windows = "NUL", "/dev/null"), open = "w") [18:41:24.329] } [18:41:24.329] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:24.329] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:24.329] base::sink(type = "output", split = FALSE) [18:41:24.329] base::close(...future.stdout) [18:41:24.329] }, add = TRUE) [18:41:24.329] } [18:41:24.329] ...future.frame <- base::sys.nframe() [18:41:24.329] ...future.conditions <- base::list() [18:41:24.329] ...future.rng <- base::globalenv()$.Random.seed [18:41:24.329] if (FALSE) { [18:41:24.329] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:24.329] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:24.329] } [18:41:24.329] ...future.result <- base::tryCatch({ [18:41:24.329] base::withCallingHandlers({ [18:41:24.329] ...future.value <- base::withVisible(base::local({ [18:41:24.329] ...future.makeSendCondition <- base::local({ [18:41:24.329] sendCondition <- NULL [18:41:24.329] function(frame = 1L) { [18:41:24.329] if (is.function(sendCondition)) [18:41:24.329] return(sendCondition) [18:41:24.329] ns <- getNamespace("parallel") [18:41:24.329] if (exists("sendData", mode = "function", [18:41:24.329] envir = ns)) { [18:41:24.329] parallel_sendData <- get("sendData", mode = "function", [18:41:24.329] envir = ns) [18:41:24.329] envir <- sys.frame(frame) [18:41:24.329] master <- NULL [18:41:24.329] while (!identical(envir, .GlobalEnv) && [18:41:24.329] !identical(envir, emptyenv())) { [18:41:24.329] if (exists("master", mode = "list", envir = envir, [18:41:24.329] inherits = FALSE)) { [18:41:24.329] master <- get("master", mode = "list", [18:41:24.329] envir = envir, inherits = FALSE) [18:41:24.329] if (inherits(master, c("SOCKnode", [18:41:24.329] "SOCK0node"))) { [18:41:24.329] sendCondition <<- function(cond) { [18:41:24.329] data <- list(type = "VALUE", value = cond, [18:41:24.329] success = TRUE) [18:41:24.329] parallel_sendData(master, data) [18:41:24.329] } [18:41:24.329] return(sendCondition) [18:41:24.329] } [18:41:24.329] } [18:41:24.329] frame <- frame + 1L [18:41:24.329] envir <- sys.frame(frame) [18:41:24.329] } [18:41:24.329] } [18:41:24.329] sendCondition <<- function(cond) NULL [18:41:24.329] } [18:41:24.329] }) [18:41:24.329] withCallingHandlers({ [18:41:24.329] { [18:41:24.329] do.call(function(...) { [18:41:24.329] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:24.329] if (!identical(...future.globals.maxSize.org, [18:41:24.329] ...future.globals.maxSize)) { [18:41:24.329] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:24.329] on.exit(options(oopts), add = TRUE) [18:41:24.329] } [18:41:24.329] { [18:41:24.329] lapply(seq_along(...future.elements_ii), [18:41:24.329] FUN = function(jj) { [18:41:24.329] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:24.329] ...future.FUN(...future.X_jj, ...) [18:41:24.329] }) [18:41:24.329] } [18:41:24.329] }, args = future.call.arguments) [18:41:24.329] } [18:41:24.329] }, immediateCondition = function(cond) { [18:41:24.329] sendCondition <- ...future.makeSendCondition() [18:41:24.329] sendCondition(cond) [18:41:24.329] muffleCondition <- function (cond, pattern = "^muffle") [18:41:24.329] { [18:41:24.329] inherits <- base::inherits [18:41:24.329] invokeRestart <- base::invokeRestart [18:41:24.329] is.null <- base::is.null [18:41:24.329] muffled <- FALSE [18:41:24.329] if (inherits(cond, "message")) { [18:41:24.329] muffled <- grepl(pattern, "muffleMessage") [18:41:24.329] if (muffled) [18:41:24.329] invokeRestart("muffleMessage") [18:41:24.329] } [18:41:24.329] else if (inherits(cond, "warning")) { [18:41:24.329] muffled <- grepl(pattern, "muffleWarning") [18:41:24.329] if (muffled) [18:41:24.329] invokeRestart("muffleWarning") [18:41:24.329] } [18:41:24.329] else if (inherits(cond, "condition")) { [18:41:24.329] if (!is.null(pattern)) { [18:41:24.329] computeRestarts <- base::computeRestarts [18:41:24.329] grepl <- base::grepl [18:41:24.329] restarts <- computeRestarts(cond) [18:41:24.329] for (restart in restarts) { [18:41:24.329] name <- restart$name [18:41:24.329] if (is.null(name)) [18:41:24.329] next [18:41:24.329] if (!grepl(pattern, name)) [18:41:24.329] next [18:41:24.329] invokeRestart(restart) [18:41:24.329] muffled <- TRUE [18:41:24.329] break [18:41:24.329] } [18:41:24.329] } [18:41:24.329] } [18:41:24.329] invisible(muffled) [18:41:24.329] } [18:41:24.329] muffleCondition(cond) [18:41:24.329] }) [18:41:24.329] })) [18:41:24.329] future::FutureResult(value = ...future.value$value, [18:41:24.329] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:24.329] ...future.rng), globalenv = if (FALSE) [18:41:24.329] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:24.329] ...future.globalenv.names)) [18:41:24.329] else NULL, started = ...future.startTime, version = "1.8") [18:41:24.329] }, condition = base::local({ [18:41:24.329] c <- base::c [18:41:24.329] inherits <- base::inherits [18:41:24.329] invokeRestart <- base::invokeRestart [18:41:24.329] length <- base::length [18:41:24.329] list <- base::list [18:41:24.329] seq.int <- base::seq.int [18:41:24.329] signalCondition <- base::signalCondition [18:41:24.329] sys.calls <- base::sys.calls [18:41:24.329] `[[` <- base::`[[` [18:41:24.329] `+` <- base::`+` [18:41:24.329] `<<-` <- base::`<<-` [18:41:24.329] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:24.329] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:24.329] 3L)] [18:41:24.329] } [18:41:24.329] function(cond) { [18:41:24.329] is_error <- inherits(cond, "error") [18:41:24.329] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:24.329] NULL) [18:41:24.329] if (is_error) { [18:41:24.329] sessionInformation <- function() { [18:41:24.329] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:24.329] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:24.329] search = base::search(), system = base::Sys.info()) [18:41:24.329] } [18:41:24.329] ...future.conditions[[length(...future.conditions) + [18:41:24.329] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:24.329] cond$call), session = sessionInformation(), [18:41:24.329] timestamp = base::Sys.time(), signaled = 0L) [18:41:24.329] signalCondition(cond) [18:41:24.329] } [18:41:24.329] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:24.329] "immediateCondition"))) { [18:41:24.329] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:24.329] ...future.conditions[[length(...future.conditions) + [18:41:24.329] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:24.329] if (TRUE && !signal) { [18:41:24.329] muffleCondition <- function (cond, pattern = "^muffle") [18:41:24.329] { [18:41:24.329] inherits <- base::inherits [18:41:24.329] invokeRestart <- base::invokeRestart [18:41:24.329] is.null <- base::is.null [18:41:24.329] muffled <- FALSE [18:41:24.329] if (inherits(cond, "message")) { [18:41:24.329] muffled <- grepl(pattern, "muffleMessage") [18:41:24.329] if (muffled) [18:41:24.329] invokeRestart("muffleMessage") [18:41:24.329] } [18:41:24.329] else if (inherits(cond, "warning")) { [18:41:24.329] muffled <- grepl(pattern, "muffleWarning") [18:41:24.329] if (muffled) [18:41:24.329] invokeRestart("muffleWarning") [18:41:24.329] } [18:41:24.329] else if (inherits(cond, "condition")) { [18:41:24.329] if (!is.null(pattern)) { [18:41:24.329] computeRestarts <- base::computeRestarts [18:41:24.329] grepl <- base::grepl [18:41:24.329] restarts <- computeRestarts(cond) [18:41:24.329] for (restart in restarts) { [18:41:24.329] name <- restart$name [18:41:24.329] if (is.null(name)) [18:41:24.329] next [18:41:24.329] if (!grepl(pattern, name)) [18:41:24.329] next [18:41:24.329] invokeRestart(restart) [18:41:24.329] muffled <- TRUE [18:41:24.329] break [18:41:24.329] } [18:41:24.329] } [18:41:24.329] } [18:41:24.329] invisible(muffled) [18:41:24.329] } [18:41:24.329] muffleCondition(cond, pattern = "^muffle") [18:41:24.329] } [18:41:24.329] } [18:41:24.329] else { [18:41:24.329] if (TRUE) { [18:41:24.329] muffleCondition <- function (cond, pattern = "^muffle") [18:41:24.329] { [18:41:24.329] inherits <- base::inherits [18:41:24.329] invokeRestart <- base::invokeRestart [18:41:24.329] is.null <- base::is.null [18:41:24.329] muffled <- FALSE [18:41:24.329] if (inherits(cond, "message")) { [18:41:24.329] muffled <- grepl(pattern, "muffleMessage") [18:41:24.329] if (muffled) [18:41:24.329] invokeRestart("muffleMessage") [18:41:24.329] } [18:41:24.329] else if (inherits(cond, "warning")) { [18:41:24.329] muffled <- grepl(pattern, "muffleWarning") [18:41:24.329] if (muffled) [18:41:24.329] invokeRestart("muffleWarning") [18:41:24.329] } [18:41:24.329] else if (inherits(cond, "condition")) { [18:41:24.329] if (!is.null(pattern)) { [18:41:24.329] computeRestarts <- base::computeRestarts [18:41:24.329] grepl <- base::grepl [18:41:24.329] restarts <- computeRestarts(cond) [18:41:24.329] for (restart in restarts) { [18:41:24.329] name <- restart$name [18:41:24.329] if (is.null(name)) [18:41:24.329] next [18:41:24.329] if (!grepl(pattern, name)) [18:41:24.329] next [18:41:24.329] invokeRestart(restart) [18:41:24.329] muffled <- TRUE [18:41:24.329] break [18:41:24.329] } [18:41:24.329] } [18:41:24.329] } [18:41:24.329] invisible(muffled) [18:41:24.329] } [18:41:24.329] muffleCondition(cond, pattern = "^muffle") [18:41:24.329] } [18:41:24.329] } [18:41:24.329] } [18:41:24.329] })) [18:41:24.329] }, error = function(ex) { [18:41:24.329] base::structure(base::list(value = NULL, visible = NULL, [18:41:24.329] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:24.329] ...future.rng), started = ...future.startTime, [18:41:24.329] finished = Sys.time(), session_uuid = NA_character_, [18:41:24.329] version = "1.8"), class = "FutureResult") [18:41:24.329] }, finally = { [18:41:24.329] if (!identical(...future.workdir, getwd())) [18:41:24.329] setwd(...future.workdir) [18:41:24.329] { [18:41:24.329] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:24.329] ...future.oldOptions$nwarnings <- NULL [18:41:24.329] } [18:41:24.329] base::options(...future.oldOptions) [18:41:24.329] if (.Platform$OS.type == "windows") { [18:41:24.329] old_names <- names(...future.oldEnvVars) [18:41:24.329] envs <- base::Sys.getenv() [18:41:24.329] names <- names(envs) [18:41:24.329] common <- intersect(names, old_names) [18:41:24.329] added <- setdiff(names, old_names) [18:41:24.329] removed <- setdiff(old_names, names) [18:41:24.329] changed <- common[...future.oldEnvVars[common] != [18:41:24.329] envs[common]] [18:41:24.329] NAMES <- toupper(changed) [18:41:24.329] args <- list() [18:41:24.329] for (kk in seq_along(NAMES)) { [18:41:24.329] name <- changed[[kk]] [18:41:24.329] NAME <- NAMES[[kk]] [18:41:24.329] if (name != NAME && is.element(NAME, old_names)) [18:41:24.329] next [18:41:24.329] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:24.329] } [18:41:24.329] NAMES <- toupper(added) [18:41:24.329] for (kk in seq_along(NAMES)) { [18:41:24.329] name <- added[[kk]] [18:41:24.329] NAME <- NAMES[[kk]] [18:41:24.329] if (name != NAME && is.element(NAME, old_names)) [18:41:24.329] next [18:41:24.329] args[[name]] <- "" [18:41:24.329] } [18:41:24.329] NAMES <- toupper(removed) [18:41:24.329] for (kk in seq_along(NAMES)) { [18:41:24.329] name <- removed[[kk]] [18:41:24.329] NAME <- NAMES[[kk]] [18:41:24.329] if (name != NAME && is.element(NAME, old_names)) [18:41:24.329] next [18:41:24.329] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:24.329] } [18:41:24.329] if (length(args) > 0) [18:41:24.329] base::do.call(base::Sys.setenv, args = args) [18:41:24.329] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:24.329] } [18:41:24.329] else { [18:41:24.329] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:24.329] } [18:41:24.329] { [18:41:24.329] if (base::length(...future.futureOptionsAdded) > [18:41:24.329] 0L) { [18:41:24.329] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:24.329] base::names(opts) <- ...future.futureOptionsAdded [18:41:24.329] base::options(opts) [18:41:24.329] } [18:41:24.329] { [18:41:24.329] { [18:41:24.329] base::options(mc.cores = ...future.mc.cores.old) [18:41:24.329] NULL [18:41:24.329] } [18:41:24.329] options(future.plan = NULL) [18:41:24.329] if (is.na(NA_character_)) [18:41:24.329] Sys.unsetenv("R_FUTURE_PLAN") [18:41:24.329] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:24.329] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:24.329] .init = FALSE) [18:41:24.329] } [18:41:24.329] } [18:41:24.329] } [18:41:24.329] }) [18:41:24.329] if (TRUE) { [18:41:24.329] base::sink(type = "output", split = FALSE) [18:41:24.329] if (TRUE) { [18:41:24.329] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:24.329] } [18:41:24.329] else { [18:41:24.329] ...future.result["stdout"] <- base::list(NULL) [18:41:24.329] } [18:41:24.329] base::close(...future.stdout) [18:41:24.329] ...future.stdout <- NULL [18:41:24.329] } [18:41:24.329] ...future.result$conditions <- ...future.conditions [18:41:24.329] ...future.result$finished <- base::Sys.time() [18:41:24.329] ...future.result [18:41:24.329] } [18:41:24.338] Exporting 5 global objects (1.20 KiB) to cluster node #1 ... [18:41:24.338] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... [18:41:24.339] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... DONE [18:41:24.339] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... [18:41:24.340] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... DONE [18:41:24.340] Exporting '...future.elements_ii' (127 bytes) to cluster node #1 ... [18:41:24.341] Exporting '...future.elements_ii' (127 bytes) to cluster node #1 ... DONE [18:41:24.341] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:24.341] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:24.342] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:24.342] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:24.343] Exporting 5 global objects (1.20 KiB) to cluster node #1 ... DONE [18:41:24.343] MultisessionFuture started [18:41:24.344] - Launch lazy future ... done [18:41:24.344] run() for 'MultisessionFuture' ... done [18:41:24.344] Created future: [18:41:24.369] receiveMessageFromWorker() for ClusterFuture ... [18:41:24.369] - Validating connection of MultisessionFuture [18:41:24.369] - received message: FutureResult [18:41:24.370] - Received FutureResult [18:41:24.370] - Erased future from FutureRegistry [18:41:24.370] result() for ClusterFuture ... [18:41:24.371] - result already collected: FutureResult [18:41:24.371] result() for ClusterFuture ... done [18:41:24.371] receiveMessageFromWorker() for ClusterFuture ... done [18:41:24.345] MultisessionFuture: [18:41:24.345] Label: 'future_lapply-2' [18:41:24.345] Expression: [18:41:24.345] { [18:41:24.345] do.call(function(...) { [18:41:24.345] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:24.345] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:24.345] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:24.345] on.exit(options(oopts), add = TRUE) [18:41:24.345] } [18:41:24.345] { [18:41:24.345] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:24.345] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:24.345] ...future.FUN(...future.X_jj, ...) [18:41:24.345] }) [18:41:24.345] } [18:41:24.345] }, args = future.call.arguments) [18:41:24.345] } [18:41:24.345] Lazy evaluation: FALSE [18:41:24.345] Asynchronous evaluation: TRUE [18:41:24.345] Local evaluation: TRUE [18:41:24.345] Environment: R_GlobalEnv [18:41:24.345] Capture standard output: TRUE [18:41:24.345] Capture condition classes: 'condition' (excluding 'nothing') [18:41:24.345] Globals: 5 objects totaling 789 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 127 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:24.345] Packages: [18:41:24.345] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:24.345] Resolved: TRUE [18:41:24.345] Value: [18:41:24.345] Conditions captured: [18:41:24.345] Early signaling: FALSE [18:41:24.345] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:24.345] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:24.372] Chunk #2 of 2 ... DONE [18:41:24.372] Launching 2 futures (chunks) ... DONE [18:41:24.372] Resolving 2 futures (chunks) ... [18:41:24.373] resolve() on list ... [18:41:24.373] recursive: 0 [18:41:24.373] length: 2 [18:41:24.373] [18:41:24.374] Future #1 [18:41:24.374] result() for ClusterFuture ... [18:41:24.374] - result already collected: FutureResult [18:41:24.374] result() for ClusterFuture ... done [18:41:24.375] result() for ClusterFuture ... [18:41:24.375] - result already collected: FutureResult [18:41:24.375] result() for ClusterFuture ... done [18:41:24.375] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:24.376] - nx: 2 [18:41:24.376] - relay: TRUE [18:41:24.376] - stdout: TRUE [18:41:24.376] - signal: TRUE [18:41:24.377] - resignal: FALSE [18:41:24.377] - force: TRUE [18:41:24.377] - relayed: [n=2] FALSE, FALSE [18:41:24.377] - queued futures: [n=2] FALSE, FALSE [18:41:24.381] - until=1 [18:41:24.381] - relaying element #1 [18:41:24.381] result() for ClusterFuture ... [18:41:24.382] - result already collected: FutureResult [18:41:24.382] result() for ClusterFuture ... done [18:41:24.382] result() for ClusterFuture ... [18:41:24.382] - result already collected: FutureResult [18:41:24.383] result() for ClusterFuture ... done [18:41:24.383] result() for ClusterFuture ... [18:41:24.383] - result already collected: FutureResult [18:41:24.383] result() for ClusterFuture ... done [18:41:24.384] result() for ClusterFuture ... [18:41:24.384] - result already collected: FutureResult [18:41:24.384] result() for ClusterFuture ... done [18:41:24.384] - relayed: [n=2] TRUE, FALSE [18:41:24.385] - queued futures: [n=2] TRUE, FALSE [18:41:24.385] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:24.385] length: 1 (resolved future 1) [18:41:24.385] Future #2 [18:41:24.386] result() for ClusterFuture ... [18:41:24.386] - result already collected: FutureResult [18:41:24.386] result() for ClusterFuture ... done [18:41:24.386] result() for ClusterFuture ... [18:41:24.387] - result already collected: FutureResult [18:41:24.387] result() for ClusterFuture ... done [18:41:24.387] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:24.387] - nx: 2 [18:41:24.388] - relay: TRUE [18:41:24.388] - stdout: TRUE [18:41:24.388] - signal: TRUE [18:41:24.388] - resignal: FALSE [18:41:24.389] - force: TRUE [18:41:24.389] - relayed: [n=2] TRUE, FALSE [18:41:24.389] - queued futures: [n=2] TRUE, FALSE [18:41:24.389] - until=2 [18:41:24.390] - relaying element #2 [18:41:24.390] result() for ClusterFuture ... [18:41:24.390] - result already collected: FutureResult [18:41:24.390] result() for ClusterFuture ... done [18:41:24.390] result() for ClusterFuture ... [18:41:24.391] - result already collected: FutureResult [18:41:24.391] result() for ClusterFuture ... done [18:41:24.391] result() for ClusterFuture ... [18:41:24.392] - result already collected: FutureResult [18:41:24.392] result() for ClusterFuture ... done [18:41:24.392] result() for ClusterFuture ... [18:41:24.392] - result already collected: FutureResult [18:41:24.392] result() for ClusterFuture ... done [18:41:24.393] - relayed: [n=2] TRUE, TRUE [18:41:24.393] - queued futures: [n=2] TRUE, TRUE [18:41:24.393] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:24.394] length: 0 (resolved future 2) [18:41:24.394] Relaying remaining futures [18:41:24.394] signalConditionsASAP(NULL, pos=0) ... [18:41:24.394] - nx: 2 [18:41:24.394] - relay: TRUE [18:41:24.395] - stdout: TRUE [18:41:24.395] - signal: TRUE [18:41:24.395] - resignal: FALSE [18:41:24.395] - force: TRUE [18:41:24.396] - relayed: [n=2] TRUE, TRUE [18:41:24.396] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:24.396] - relayed: [n=2] TRUE, TRUE [18:41:24.397] - queued futures: [n=2] TRUE, TRUE [18:41:24.397] signalConditionsASAP(NULL, pos=0) ... done [18:41:24.397] resolve() on list ... DONE [18:41:24.397] result() for ClusterFuture ... [18:41:24.398] - result already collected: FutureResult [18:41:24.398] result() for ClusterFuture ... done [18:41:24.398] result() for ClusterFuture ... [18:41:24.398] - result already collected: FutureResult [18:41:24.398] result() for ClusterFuture ... done [18:41:24.399] result() for ClusterFuture ... [18:41:24.399] - result already collected: FutureResult [18:41:24.399] result() for ClusterFuture ... done [18:41:24.400] result() for ClusterFuture ... [18:41:24.400] - result already collected: FutureResult [18:41:24.400] result() for ClusterFuture ... done [18:41:24.400] - Number of value chunks collected: 2 [18:41:24.401] Resolving 2 futures (chunks) ... DONE [18:41:24.401] Reducing values from 2 chunks ... [18:41:24.401] - Number of values collected after concatenation: 4 [18:41:24.401] - Number of values expected: 4 [18:41:24.401] Reducing values from 2 chunks ... DONE [18:41:24.402] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL - future_lapply(x, FUN = base::vector, ...) ... [18:41:24.406] future_lapply() ... [18:41:24.411] Number of chunks: 2 [18:41:24.411] getGlobalsAndPackagesXApply() ... [18:41:24.411] - future.globals: TRUE [18:41:24.411] getGlobalsAndPackages() ... [18:41:24.412] Searching for globals... [18:41:24.414] - globals found: [2] 'FUN', '.Internal' [18:41:24.414] Searching for globals ... DONE [18:41:24.414] Resolving globals: FALSE [18:41:24.415] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:24.416] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:24.416] - globals: [1] 'FUN' [18:41:24.416] [18:41:24.417] getGlobalsAndPackages() ... DONE [18:41:24.417] - globals found/used: [n=1] 'FUN' [18:41:24.417] - needed namespaces: [n=0] [18:41:24.417] Finding globals ... DONE [18:41:24.418] - use_args: TRUE [18:41:24.418] - Getting '...' globals ... [18:41:24.419] resolve() on list ... [18:41:24.419] recursive: 0 [18:41:24.419] length: 1 [18:41:24.419] elements: '...' [18:41:24.420] length: 0 (resolved future 1) [18:41:24.420] resolve() on list ... DONE [18:41:24.420] - '...' content: [n=1] 'length' [18:41:24.420] List of 1 [18:41:24.420] $ ...:List of 1 [18:41:24.420] ..$ length: int 2 [18:41:24.420] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:24.420] - attr(*, "where")=List of 1 [18:41:24.420] ..$ ...: [18:41:24.420] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:24.420] - attr(*, "resolved")= logi TRUE [18:41:24.420] - attr(*, "total_size")= num NA [18:41:24.425] - Getting '...' globals ... DONE [18:41:24.426] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:24.426] List of 2 [18:41:24.426] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:24.426] $ ... :List of 1 [18:41:24.426] ..$ length: int 2 [18:41:24.426] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:24.426] - attr(*, "where")=List of 2 [18:41:24.426] ..$ ...future.FUN: [18:41:24.426] ..$ ... : [18:41:24.426] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:24.426] - attr(*, "resolved")= logi FALSE [18:41:24.426] - attr(*, "total_size")= int 4406 [18:41:24.432] Packages to be attached in all futures: [n=0] [18:41:24.432] getGlobalsAndPackagesXApply() ... DONE [18:41:24.433] Number of futures (= number of chunks): 2 [18:41:24.433] Launching 2 futures (chunks) ... [18:41:24.433] Chunk #1 of 2 ... [18:41:24.433] - Finding globals in 'X' for chunk #1 ... [18:41:24.434] getGlobalsAndPackages() ... [18:41:24.434] Searching for globals... [18:41:24.435] [18:41:24.435] Searching for globals ... DONE [18:41:24.435] - globals: [0] [18:41:24.435] getGlobalsAndPackages() ... DONE [18:41:24.435] + additional globals found: [n=0] [18:41:24.436] + additional namespaces needed: [n=0] [18:41:24.436] - Finding globals in 'X' for chunk #1 ... DONE [18:41:24.436] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:24.436] - seeds: [18:41:24.437] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:24.437] getGlobalsAndPackages() ... [18:41:24.437] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:24.438] Resolving globals: FALSE [18:41:24.438] Tweak future expression to call with '...' arguments ... [18:41:24.438] { [18:41:24.438] do.call(function(...) { [18:41:24.438] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:24.438] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:24.438] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:24.438] on.exit(options(oopts), add = TRUE) [18:41:24.438] } [18:41:24.438] { [18:41:24.438] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:24.438] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:24.438] ...future.FUN(...future.X_jj, ...) [18:41:24.438] }) [18:41:24.438] } [18:41:24.438] }, args = future.call.arguments) [18:41:24.438] } [18:41:24.439] Tweak future expression to call with '...' arguments ... DONE [18:41:24.439] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:24.440] [18:41:24.440] getGlobalsAndPackages() ... DONE [18:41:24.440] run() for 'Future' ... [18:41:24.440] - state: 'created' [18:41:24.441] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:24.456] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:24.456] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:24.456] - Field: 'node' [18:41:24.456] - Field: 'label' [18:41:24.457] - Field: 'local' [18:41:24.457] - Field: 'owner' [18:41:24.457] - Field: 'envir' [18:41:24.457] - Field: 'workers' [18:41:24.457] - Field: 'packages' [18:41:24.458] - Field: 'gc' [18:41:24.458] - Field: 'conditions' [18:41:24.458] - Field: 'persistent' [18:41:24.458] - Field: 'expr' [18:41:24.458] - Field: 'uuid' [18:41:24.458] - Field: 'seed' [18:41:24.459] - Field: 'version' [18:41:24.459] - Field: 'result' [18:41:24.459] - Field: 'asynchronous' [18:41:24.459] - Field: 'calls' [18:41:24.459] - Field: 'globals' [18:41:24.459] - Field: 'stdout' [18:41:24.460] - Field: 'earlySignal' [18:41:24.460] - Field: 'lazy' [18:41:24.460] - Field: 'state' [18:41:24.460] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:24.460] - Launch lazy future ... [18:41:24.461] Packages needed by the future expression (n = 0): [18:41:24.461] Packages needed by future strategies (n = 0): [18:41:24.461] { [18:41:24.461] { [18:41:24.461] { [18:41:24.461] ...future.startTime <- base::Sys.time() [18:41:24.461] { [18:41:24.461] { [18:41:24.461] { [18:41:24.461] { [18:41:24.461] base::local({ [18:41:24.461] has_future <- base::requireNamespace("future", [18:41:24.461] quietly = TRUE) [18:41:24.461] if (has_future) { [18:41:24.461] ns <- base::getNamespace("future") [18:41:24.461] version <- ns[[".package"]][["version"]] [18:41:24.461] if (is.null(version)) [18:41:24.461] version <- utils::packageVersion("future") [18:41:24.461] } [18:41:24.461] else { [18:41:24.461] version <- NULL [18:41:24.461] } [18:41:24.461] if (!has_future || version < "1.8.0") { [18:41:24.461] info <- base::c(r_version = base::gsub("R version ", [18:41:24.461] "", base::R.version$version.string), [18:41:24.461] platform = base::sprintf("%s (%s-bit)", [18:41:24.461] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:24.461] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:24.461] "release", "version")], collapse = " "), [18:41:24.461] hostname = base::Sys.info()[["nodename"]]) [18:41:24.461] info <- base::sprintf("%s: %s", base::names(info), [18:41:24.461] info) [18:41:24.461] info <- base::paste(info, collapse = "; ") [18:41:24.461] if (!has_future) { [18:41:24.461] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:24.461] info) [18:41:24.461] } [18:41:24.461] else { [18:41:24.461] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:24.461] info, version) [18:41:24.461] } [18:41:24.461] base::stop(msg) [18:41:24.461] } [18:41:24.461] }) [18:41:24.461] } [18:41:24.461] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:24.461] base::options(mc.cores = 1L) [18:41:24.461] } [18:41:24.461] ...future.strategy.old <- future::plan("list") [18:41:24.461] options(future.plan = NULL) [18:41:24.461] Sys.unsetenv("R_FUTURE_PLAN") [18:41:24.461] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:24.461] } [18:41:24.461] ...future.workdir <- getwd() [18:41:24.461] } [18:41:24.461] ...future.oldOptions <- base::as.list(base::.Options) [18:41:24.461] ...future.oldEnvVars <- base::Sys.getenv() [18:41:24.461] } [18:41:24.461] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:24.461] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:24.461] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:24.461] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:24.461] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:24.461] future.stdout.windows.reencode = NULL, width = 80L) [18:41:24.461] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:24.461] base::names(...future.oldOptions)) [18:41:24.461] } [18:41:24.461] if (FALSE) { [18:41:24.461] } [18:41:24.461] else { [18:41:24.461] if (TRUE) { [18:41:24.461] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:24.461] open = "w") [18:41:24.461] } [18:41:24.461] else { [18:41:24.461] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:24.461] windows = "NUL", "/dev/null"), open = "w") [18:41:24.461] } [18:41:24.461] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:24.461] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:24.461] base::sink(type = "output", split = FALSE) [18:41:24.461] base::close(...future.stdout) [18:41:24.461] }, add = TRUE) [18:41:24.461] } [18:41:24.461] ...future.frame <- base::sys.nframe() [18:41:24.461] ...future.conditions <- base::list() [18:41:24.461] ...future.rng <- base::globalenv()$.Random.seed [18:41:24.461] if (FALSE) { [18:41:24.461] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:24.461] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:24.461] } [18:41:24.461] ...future.result <- base::tryCatch({ [18:41:24.461] base::withCallingHandlers({ [18:41:24.461] ...future.value <- base::withVisible(base::local({ [18:41:24.461] ...future.makeSendCondition <- base::local({ [18:41:24.461] sendCondition <- NULL [18:41:24.461] function(frame = 1L) { [18:41:24.461] if (is.function(sendCondition)) [18:41:24.461] return(sendCondition) [18:41:24.461] ns <- getNamespace("parallel") [18:41:24.461] if (exists("sendData", mode = "function", [18:41:24.461] envir = ns)) { [18:41:24.461] parallel_sendData <- get("sendData", mode = "function", [18:41:24.461] envir = ns) [18:41:24.461] envir <- sys.frame(frame) [18:41:24.461] master <- NULL [18:41:24.461] while (!identical(envir, .GlobalEnv) && [18:41:24.461] !identical(envir, emptyenv())) { [18:41:24.461] if (exists("master", mode = "list", envir = envir, [18:41:24.461] inherits = FALSE)) { [18:41:24.461] master <- get("master", mode = "list", [18:41:24.461] envir = envir, inherits = FALSE) [18:41:24.461] if (inherits(master, c("SOCKnode", [18:41:24.461] "SOCK0node"))) { [18:41:24.461] sendCondition <<- function(cond) { [18:41:24.461] data <- list(type = "VALUE", value = cond, [18:41:24.461] success = TRUE) [18:41:24.461] parallel_sendData(master, data) [18:41:24.461] } [18:41:24.461] return(sendCondition) [18:41:24.461] } [18:41:24.461] } [18:41:24.461] frame <- frame + 1L [18:41:24.461] envir <- sys.frame(frame) [18:41:24.461] } [18:41:24.461] } [18:41:24.461] sendCondition <<- function(cond) NULL [18:41:24.461] } [18:41:24.461] }) [18:41:24.461] withCallingHandlers({ [18:41:24.461] { [18:41:24.461] do.call(function(...) { [18:41:24.461] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:24.461] if (!identical(...future.globals.maxSize.org, [18:41:24.461] ...future.globals.maxSize)) { [18:41:24.461] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:24.461] on.exit(options(oopts), add = TRUE) [18:41:24.461] } [18:41:24.461] { [18:41:24.461] lapply(seq_along(...future.elements_ii), [18:41:24.461] FUN = function(jj) { [18:41:24.461] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:24.461] ...future.FUN(...future.X_jj, ...) [18:41:24.461] }) [18:41:24.461] } [18:41:24.461] }, args = future.call.arguments) [18:41:24.461] } [18:41:24.461] }, immediateCondition = function(cond) { [18:41:24.461] sendCondition <- ...future.makeSendCondition() [18:41:24.461] sendCondition(cond) [18:41:24.461] muffleCondition <- function (cond, pattern = "^muffle") [18:41:24.461] { [18:41:24.461] inherits <- base::inherits [18:41:24.461] invokeRestart <- base::invokeRestart [18:41:24.461] is.null <- base::is.null [18:41:24.461] muffled <- FALSE [18:41:24.461] if (inherits(cond, "message")) { [18:41:24.461] muffled <- grepl(pattern, "muffleMessage") [18:41:24.461] if (muffled) [18:41:24.461] invokeRestart("muffleMessage") [18:41:24.461] } [18:41:24.461] else if (inherits(cond, "warning")) { [18:41:24.461] muffled <- grepl(pattern, "muffleWarning") [18:41:24.461] if (muffled) [18:41:24.461] invokeRestart("muffleWarning") [18:41:24.461] } [18:41:24.461] else if (inherits(cond, "condition")) { [18:41:24.461] if (!is.null(pattern)) { [18:41:24.461] computeRestarts <- base::computeRestarts [18:41:24.461] grepl <- base::grepl [18:41:24.461] restarts <- computeRestarts(cond) [18:41:24.461] for (restart in restarts) { [18:41:24.461] name <- restart$name [18:41:24.461] if (is.null(name)) [18:41:24.461] next [18:41:24.461] if (!grepl(pattern, name)) [18:41:24.461] next [18:41:24.461] invokeRestart(restart) [18:41:24.461] muffled <- TRUE [18:41:24.461] break [18:41:24.461] } [18:41:24.461] } [18:41:24.461] } [18:41:24.461] invisible(muffled) [18:41:24.461] } [18:41:24.461] muffleCondition(cond) [18:41:24.461] }) [18:41:24.461] })) [18:41:24.461] future::FutureResult(value = ...future.value$value, [18:41:24.461] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:24.461] ...future.rng), globalenv = if (FALSE) [18:41:24.461] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:24.461] ...future.globalenv.names)) [18:41:24.461] else NULL, started = ...future.startTime, version = "1.8") [18:41:24.461] }, condition = base::local({ [18:41:24.461] c <- base::c [18:41:24.461] inherits <- base::inherits [18:41:24.461] invokeRestart <- base::invokeRestart [18:41:24.461] length <- base::length [18:41:24.461] list <- base::list [18:41:24.461] seq.int <- base::seq.int [18:41:24.461] signalCondition <- base::signalCondition [18:41:24.461] sys.calls <- base::sys.calls [18:41:24.461] `[[` <- base::`[[` [18:41:24.461] `+` <- base::`+` [18:41:24.461] `<<-` <- base::`<<-` [18:41:24.461] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:24.461] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:24.461] 3L)] [18:41:24.461] } [18:41:24.461] function(cond) { [18:41:24.461] is_error <- inherits(cond, "error") [18:41:24.461] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:24.461] NULL) [18:41:24.461] if (is_error) { [18:41:24.461] sessionInformation <- function() { [18:41:24.461] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:24.461] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:24.461] search = base::search(), system = base::Sys.info()) [18:41:24.461] } [18:41:24.461] ...future.conditions[[length(...future.conditions) + [18:41:24.461] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:24.461] cond$call), session = sessionInformation(), [18:41:24.461] timestamp = base::Sys.time(), signaled = 0L) [18:41:24.461] signalCondition(cond) [18:41:24.461] } [18:41:24.461] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:24.461] "immediateCondition"))) { [18:41:24.461] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:24.461] ...future.conditions[[length(...future.conditions) + [18:41:24.461] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:24.461] if (TRUE && !signal) { [18:41:24.461] muffleCondition <- function (cond, pattern = "^muffle") [18:41:24.461] { [18:41:24.461] inherits <- base::inherits [18:41:24.461] invokeRestart <- base::invokeRestart [18:41:24.461] is.null <- base::is.null [18:41:24.461] muffled <- FALSE [18:41:24.461] if (inherits(cond, "message")) { [18:41:24.461] muffled <- grepl(pattern, "muffleMessage") [18:41:24.461] if (muffled) [18:41:24.461] invokeRestart("muffleMessage") [18:41:24.461] } [18:41:24.461] else if (inherits(cond, "warning")) { [18:41:24.461] muffled <- grepl(pattern, "muffleWarning") [18:41:24.461] if (muffled) [18:41:24.461] invokeRestart("muffleWarning") [18:41:24.461] } [18:41:24.461] else if (inherits(cond, "condition")) { [18:41:24.461] if (!is.null(pattern)) { [18:41:24.461] computeRestarts <- base::computeRestarts [18:41:24.461] grepl <- base::grepl [18:41:24.461] restarts <- computeRestarts(cond) [18:41:24.461] for (restart in restarts) { [18:41:24.461] name <- restart$name [18:41:24.461] if (is.null(name)) [18:41:24.461] next [18:41:24.461] if (!grepl(pattern, name)) [18:41:24.461] next [18:41:24.461] invokeRestart(restart) [18:41:24.461] muffled <- TRUE [18:41:24.461] break [18:41:24.461] } [18:41:24.461] } [18:41:24.461] } [18:41:24.461] invisible(muffled) [18:41:24.461] } [18:41:24.461] muffleCondition(cond, pattern = "^muffle") [18:41:24.461] } [18:41:24.461] } [18:41:24.461] else { [18:41:24.461] if (TRUE) { [18:41:24.461] muffleCondition <- function (cond, pattern = "^muffle") [18:41:24.461] { [18:41:24.461] inherits <- base::inherits [18:41:24.461] invokeRestart <- base::invokeRestart [18:41:24.461] is.null <- base::is.null [18:41:24.461] muffled <- FALSE [18:41:24.461] if (inherits(cond, "message")) { [18:41:24.461] muffled <- grepl(pattern, "muffleMessage") [18:41:24.461] if (muffled) [18:41:24.461] invokeRestart("muffleMessage") [18:41:24.461] } [18:41:24.461] else if (inherits(cond, "warning")) { [18:41:24.461] muffled <- grepl(pattern, "muffleWarning") [18:41:24.461] if (muffled) [18:41:24.461] invokeRestart("muffleWarning") [18:41:24.461] } [18:41:24.461] else if (inherits(cond, "condition")) { [18:41:24.461] if (!is.null(pattern)) { [18:41:24.461] computeRestarts <- base::computeRestarts [18:41:24.461] grepl <- base::grepl [18:41:24.461] restarts <- computeRestarts(cond) [18:41:24.461] for (restart in restarts) { [18:41:24.461] name <- restart$name [18:41:24.461] if (is.null(name)) [18:41:24.461] next [18:41:24.461] if (!grepl(pattern, name)) [18:41:24.461] next [18:41:24.461] invokeRestart(restart) [18:41:24.461] muffled <- TRUE [18:41:24.461] break [18:41:24.461] } [18:41:24.461] } [18:41:24.461] } [18:41:24.461] invisible(muffled) [18:41:24.461] } [18:41:24.461] muffleCondition(cond, pattern = "^muffle") [18:41:24.461] } [18:41:24.461] } [18:41:24.461] } [18:41:24.461] })) [18:41:24.461] }, error = function(ex) { [18:41:24.461] base::structure(base::list(value = NULL, visible = NULL, [18:41:24.461] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:24.461] ...future.rng), started = ...future.startTime, [18:41:24.461] finished = Sys.time(), session_uuid = NA_character_, [18:41:24.461] version = "1.8"), class = "FutureResult") [18:41:24.461] }, finally = { [18:41:24.461] if (!identical(...future.workdir, getwd())) [18:41:24.461] setwd(...future.workdir) [18:41:24.461] { [18:41:24.461] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:24.461] ...future.oldOptions$nwarnings <- NULL [18:41:24.461] } [18:41:24.461] base::options(...future.oldOptions) [18:41:24.461] if (.Platform$OS.type == "windows") { [18:41:24.461] old_names <- names(...future.oldEnvVars) [18:41:24.461] envs <- base::Sys.getenv() [18:41:24.461] names <- names(envs) [18:41:24.461] common <- intersect(names, old_names) [18:41:24.461] added <- setdiff(names, old_names) [18:41:24.461] removed <- setdiff(old_names, names) [18:41:24.461] changed <- common[...future.oldEnvVars[common] != [18:41:24.461] envs[common]] [18:41:24.461] NAMES <- toupper(changed) [18:41:24.461] args <- list() [18:41:24.461] for (kk in seq_along(NAMES)) { [18:41:24.461] name <- changed[[kk]] [18:41:24.461] NAME <- NAMES[[kk]] [18:41:24.461] if (name != NAME && is.element(NAME, old_names)) [18:41:24.461] next [18:41:24.461] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:24.461] } [18:41:24.461] NAMES <- toupper(added) [18:41:24.461] for (kk in seq_along(NAMES)) { [18:41:24.461] name <- added[[kk]] [18:41:24.461] NAME <- NAMES[[kk]] [18:41:24.461] if (name != NAME && is.element(NAME, old_names)) [18:41:24.461] next [18:41:24.461] args[[name]] <- "" [18:41:24.461] } [18:41:24.461] NAMES <- toupper(removed) [18:41:24.461] for (kk in seq_along(NAMES)) { [18:41:24.461] name <- removed[[kk]] [18:41:24.461] NAME <- NAMES[[kk]] [18:41:24.461] if (name != NAME && is.element(NAME, old_names)) [18:41:24.461] next [18:41:24.461] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:24.461] } [18:41:24.461] if (length(args) > 0) [18:41:24.461] base::do.call(base::Sys.setenv, args = args) [18:41:24.461] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:24.461] } [18:41:24.461] else { [18:41:24.461] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:24.461] } [18:41:24.461] { [18:41:24.461] if (base::length(...future.futureOptionsAdded) > [18:41:24.461] 0L) { [18:41:24.461] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:24.461] base::names(opts) <- ...future.futureOptionsAdded [18:41:24.461] base::options(opts) [18:41:24.461] } [18:41:24.461] { [18:41:24.461] { [18:41:24.461] base::options(mc.cores = ...future.mc.cores.old) [18:41:24.461] NULL [18:41:24.461] } [18:41:24.461] options(future.plan = NULL) [18:41:24.461] if (is.na(NA_character_)) [18:41:24.461] Sys.unsetenv("R_FUTURE_PLAN") [18:41:24.461] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:24.461] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:24.461] .init = FALSE) [18:41:24.461] } [18:41:24.461] } [18:41:24.461] } [18:41:24.461] }) [18:41:24.461] if (TRUE) { [18:41:24.461] base::sink(type = "output", split = FALSE) [18:41:24.461] if (TRUE) { [18:41:24.461] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:24.461] } [18:41:24.461] else { [18:41:24.461] ...future.result["stdout"] <- base::list(NULL) [18:41:24.461] } [18:41:24.461] base::close(...future.stdout) [18:41:24.461] ...future.stdout <- NULL [18:41:24.461] } [18:41:24.461] ...future.result$conditions <- ...future.conditions [18:41:24.461] ...future.result$finished <- base::Sys.time() [18:41:24.461] ...future.result [18:41:24.461] } [18:41:24.467] Exporting 5 global objects (1.20 KiB) to cluster node #1 ... [18:41:24.467] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... [18:41:24.467] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... DONE [18:41:24.468] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... [18:41:24.468] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... DONE [18:41:24.468] Exporting '...future.elements_ii' (128 bytes) to cluster node #1 ... [18:41:24.469] Exporting '...future.elements_ii' (128 bytes) to cluster node #1 ... DONE [18:41:24.469] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:24.469] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:24.469] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:24.470] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:24.470] Exporting 5 global objects (1.20 KiB) to cluster node #1 ... DONE [18:41:24.471] MultisessionFuture started [18:41:24.471] - Launch lazy future ... done [18:41:24.471] run() for 'MultisessionFuture' ... done [18:41:24.472] Created future: [18:41:24.488] receiveMessageFromWorker() for ClusterFuture ... [18:41:24.488] - Validating connection of MultisessionFuture [18:41:24.488] - received message: FutureResult [18:41:24.489] - Received FutureResult [18:41:24.489] - Erased future from FutureRegistry [18:41:24.489] result() for ClusterFuture ... [18:41:24.489] - result already collected: FutureResult [18:41:24.489] result() for ClusterFuture ... done [18:41:24.490] receiveMessageFromWorker() for ClusterFuture ... done [18:41:24.472] MultisessionFuture: [18:41:24.472] Label: 'future_lapply-1' [18:41:24.472] Expression: [18:41:24.472] { [18:41:24.472] do.call(function(...) { [18:41:24.472] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:24.472] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:24.472] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:24.472] on.exit(options(oopts), add = TRUE) [18:41:24.472] } [18:41:24.472] { [18:41:24.472] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:24.472] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:24.472] ...future.FUN(...future.X_jj, ...) [18:41:24.472] }) [18:41:24.472] } [18:41:24.472] }, args = future.call.arguments) [18:41:24.472] } [18:41:24.472] Lazy evaluation: FALSE [18:41:24.472] Asynchronous evaluation: TRUE [18:41:24.472] Local evaluation: TRUE [18:41:24.472] Environment: R_GlobalEnv [18:41:24.472] Capture standard output: TRUE [18:41:24.472] Capture condition classes: 'condition' (excluding 'nothing') [18:41:24.472] Globals: 5 objects totaling 790 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 128 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:24.472] Packages: [18:41:24.472] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:24.472] Resolved: TRUE [18:41:24.472] Value: [18:41:24.472] Conditions captured: [18:41:24.472] Early signaling: FALSE [18:41:24.472] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:24.472] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:24.490] Chunk #1 of 2 ... DONE [18:41:24.490] Chunk #2 of 2 ... [18:41:24.490] - Finding globals in 'X' for chunk #2 ... [18:41:24.490] getGlobalsAndPackages() ... [18:41:24.491] Searching for globals... [18:41:24.491] [18:41:24.491] Searching for globals ... DONE [18:41:24.491] - globals: [0] [18:41:24.491] getGlobalsAndPackages() ... DONE [18:41:24.492] + additional globals found: [n=0] [18:41:24.492] + additional namespaces needed: [n=0] [18:41:24.492] - Finding globals in 'X' for chunk #2 ... DONE [18:41:24.492] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:24.492] - seeds: [18:41:24.492] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:24.493] getGlobalsAndPackages() ... [18:41:24.493] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:24.493] Resolving globals: FALSE [18:41:24.493] Tweak future expression to call with '...' arguments ... [18:41:24.493] { [18:41:24.493] do.call(function(...) { [18:41:24.493] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:24.493] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:24.493] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:24.493] on.exit(options(oopts), add = TRUE) [18:41:24.493] } [18:41:24.493] { [18:41:24.493] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:24.493] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:24.493] ...future.FUN(...future.X_jj, ...) [18:41:24.493] }) [18:41:24.493] } [18:41:24.493] }, args = future.call.arguments) [18:41:24.493] } [18:41:24.494] Tweak future expression to call with '...' arguments ... DONE [18:41:24.494] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:24.495] [18:41:24.495] getGlobalsAndPackages() ... DONE [18:41:24.495] run() for 'Future' ... [18:41:24.495] - state: 'created' [18:41:24.495] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:24.511] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:24.511] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:24.511] - Field: 'node' [18:41:24.511] - Field: 'label' [18:41:24.511] - Field: 'local' [18:41:24.512] - Field: 'owner' [18:41:24.512] - Field: 'envir' [18:41:24.512] - Field: 'workers' [18:41:24.512] - Field: 'packages' [18:41:24.512] - Field: 'gc' [18:41:24.512] - Field: 'conditions' [18:41:24.513] - Field: 'persistent' [18:41:24.513] - Field: 'expr' [18:41:24.513] - Field: 'uuid' [18:41:24.513] - Field: 'seed' [18:41:24.513] - Field: 'version' [18:41:24.513] - Field: 'result' [18:41:24.514] - Field: 'asynchronous' [18:41:24.514] - Field: 'calls' [18:41:24.514] - Field: 'globals' [18:41:24.514] - Field: 'stdout' [18:41:24.514] - Field: 'earlySignal' [18:41:24.514] - Field: 'lazy' [18:41:24.515] - Field: 'state' [18:41:24.515] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:24.515] - Launch lazy future ... [18:41:24.515] Packages needed by the future expression (n = 0): [18:41:24.516] Packages needed by future strategies (n = 0): [18:41:24.516] { [18:41:24.516] { [18:41:24.516] { [18:41:24.516] ...future.startTime <- base::Sys.time() [18:41:24.516] { [18:41:24.516] { [18:41:24.516] { [18:41:24.516] { [18:41:24.516] base::local({ [18:41:24.516] has_future <- base::requireNamespace("future", [18:41:24.516] quietly = TRUE) [18:41:24.516] if (has_future) { [18:41:24.516] ns <- base::getNamespace("future") [18:41:24.516] version <- ns[[".package"]][["version"]] [18:41:24.516] if (is.null(version)) [18:41:24.516] version <- utils::packageVersion("future") [18:41:24.516] } [18:41:24.516] else { [18:41:24.516] version <- NULL [18:41:24.516] } [18:41:24.516] if (!has_future || version < "1.8.0") { [18:41:24.516] info <- base::c(r_version = base::gsub("R version ", [18:41:24.516] "", base::R.version$version.string), [18:41:24.516] platform = base::sprintf("%s (%s-bit)", [18:41:24.516] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:24.516] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:24.516] "release", "version")], collapse = " "), [18:41:24.516] hostname = base::Sys.info()[["nodename"]]) [18:41:24.516] info <- base::sprintf("%s: %s", base::names(info), [18:41:24.516] info) [18:41:24.516] info <- base::paste(info, collapse = "; ") [18:41:24.516] if (!has_future) { [18:41:24.516] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:24.516] info) [18:41:24.516] } [18:41:24.516] else { [18:41:24.516] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:24.516] info, version) [18:41:24.516] } [18:41:24.516] base::stop(msg) [18:41:24.516] } [18:41:24.516] }) [18:41:24.516] } [18:41:24.516] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:24.516] base::options(mc.cores = 1L) [18:41:24.516] } [18:41:24.516] ...future.strategy.old <- future::plan("list") [18:41:24.516] options(future.plan = NULL) [18:41:24.516] Sys.unsetenv("R_FUTURE_PLAN") [18:41:24.516] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:24.516] } [18:41:24.516] ...future.workdir <- getwd() [18:41:24.516] } [18:41:24.516] ...future.oldOptions <- base::as.list(base::.Options) [18:41:24.516] ...future.oldEnvVars <- base::Sys.getenv() [18:41:24.516] } [18:41:24.516] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:24.516] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:24.516] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:24.516] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:24.516] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:24.516] future.stdout.windows.reencode = NULL, width = 80L) [18:41:24.516] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:24.516] base::names(...future.oldOptions)) [18:41:24.516] } [18:41:24.516] if (FALSE) { [18:41:24.516] } [18:41:24.516] else { [18:41:24.516] if (TRUE) { [18:41:24.516] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:24.516] open = "w") [18:41:24.516] } [18:41:24.516] else { [18:41:24.516] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:24.516] windows = "NUL", "/dev/null"), open = "w") [18:41:24.516] } [18:41:24.516] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:24.516] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:24.516] base::sink(type = "output", split = FALSE) [18:41:24.516] base::close(...future.stdout) [18:41:24.516] }, add = TRUE) [18:41:24.516] } [18:41:24.516] ...future.frame <- base::sys.nframe() [18:41:24.516] ...future.conditions <- base::list() [18:41:24.516] ...future.rng <- base::globalenv()$.Random.seed [18:41:24.516] if (FALSE) { [18:41:24.516] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:24.516] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:24.516] } [18:41:24.516] ...future.result <- base::tryCatch({ [18:41:24.516] base::withCallingHandlers({ [18:41:24.516] ...future.value <- base::withVisible(base::local({ [18:41:24.516] ...future.makeSendCondition <- base::local({ [18:41:24.516] sendCondition <- NULL [18:41:24.516] function(frame = 1L) { [18:41:24.516] if (is.function(sendCondition)) [18:41:24.516] return(sendCondition) [18:41:24.516] ns <- getNamespace("parallel") [18:41:24.516] if (exists("sendData", mode = "function", [18:41:24.516] envir = ns)) { [18:41:24.516] parallel_sendData <- get("sendData", mode = "function", [18:41:24.516] envir = ns) [18:41:24.516] envir <- sys.frame(frame) [18:41:24.516] master <- NULL [18:41:24.516] while (!identical(envir, .GlobalEnv) && [18:41:24.516] !identical(envir, emptyenv())) { [18:41:24.516] if (exists("master", mode = "list", envir = envir, [18:41:24.516] inherits = FALSE)) { [18:41:24.516] master <- get("master", mode = "list", [18:41:24.516] envir = envir, inherits = FALSE) [18:41:24.516] if (inherits(master, c("SOCKnode", [18:41:24.516] "SOCK0node"))) { [18:41:24.516] sendCondition <<- function(cond) { [18:41:24.516] data <- list(type = "VALUE", value = cond, [18:41:24.516] success = TRUE) [18:41:24.516] parallel_sendData(master, data) [18:41:24.516] } [18:41:24.516] return(sendCondition) [18:41:24.516] } [18:41:24.516] } [18:41:24.516] frame <- frame + 1L [18:41:24.516] envir <- sys.frame(frame) [18:41:24.516] } [18:41:24.516] } [18:41:24.516] sendCondition <<- function(cond) NULL [18:41:24.516] } [18:41:24.516] }) [18:41:24.516] withCallingHandlers({ [18:41:24.516] { [18:41:24.516] do.call(function(...) { [18:41:24.516] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:24.516] if (!identical(...future.globals.maxSize.org, [18:41:24.516] ...future.globals.maxSize)) { [18:41:24.516] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:24.516] on.exit(options(oopts), add = TRUE) [18:41:24.516] } [18:41:24.516] { [18:41:24.516] lapply(seq_along(...future.elements_ii), [18:41:24.516] FUN = function(jj) { [18:41:24.516] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:24.516] ...future.FUN(...future.X_jj, ...) [18:41:24.516] }) [18:41:24.516] } [18:41:24.516] }, args = future.call.arguments) [18:41:24.516] } [18:41:24.516] }, immediateCondition = function(cond) { [18:41:24.516] sendCondition <- ...future.makeSendCondition() [18:41:24.516] sendCondition(cond) [18:41:24.516] muffleCondition <- function (cond, pattern = "^muffle") [18:41:24.516] { [18:41:24.516] inherits <- base::inherits [18:41:24.516] invokeRestart <- base::invokeRestart [18:41:24.516] is.null <- base::is.null [18:41:24.516] muffled <- FALSE [18:41:24.516] if (inherits(cond, "message")) { [18:41:24.516] muffled <- grepl(pattern, "muffleMessage") [18:41:24.516] if (muffled) [18:41:24.516] invokeRestart("muffleMessage") [18:41:24.516] } [18:41:24.516] else if (inherits(cond, "warning")) { [18:41:24.516] muffled <- grepl(pattern, "muffleWarning") [18:41:24.516] if (muffled) [18:41:24.516] invokeRestart("muffleWarning") [18:41:24.516] } [18:41:24.516] else if (inherits(cond, "condition")) { [18:41:24.516] if (!is.null(pattern)) { [18:41:24.516] computeRestarts <- base::computeRestarts [18:41:24.516] grepl <- base::grepl [18:41:24.516] restarts <- computeRestarts(cond) [18:41:24.516] for (restart in restarts) { [18:41:24.516] name <- restart$name [18:41:24.516] if (is.null(name)) [18:41:24.516] next [18:41:24.516] if (!grepl(pattern, name)) [18:41:24.516] next [18:41:24.516] invokeRestart(restart) [18:41:24.516] muffled <- TRUE [18:41:24.516] break [18:41:24.516] } [18:41:24.516] } [18:41:24.516] } [18:41:24.516] invisible(muffled) [18:41:24.516] } [18:41:24.516] muffleCondition(cond) [18:41:24.516] }) [18:41:24.516] })) [18:41:24.516] future::FutureResult(value = ...future.value$value, [18:41:24.516] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:24.516] ...future.rng), globalenv = if (FALSE) [18:41:24.516] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:24.516] ...future.globalenv.names)) [18:41:24.516] else NULL, started = ...future.startTime, version = "1.8") [18:41:24.516] }, condition = base::local({ [18:41:24.516] c <- base::c [18:41:24.516] inherits <- base::inherits [18:41:24.516] invokeRestart <- base::invokeRestart [18:41:24.516] length <- base::length [18:41:24.516] list <- base::list [18:41:24.516] seq.int <- base::seq.int [18:41:24.516] signalCondition <- base::signalCondition [18:41:24.516] sys.calls <- base::sys.calls [18:41:24.516] `[[` <- base::`[[` [18:41:24.516] `+` <- base::`+` [18:41:24.516] `<<-` <- base::`<<-` [18:41:24.516] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:24.516] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:24.516] 3L)] [18:41:24.516] } [18:41:24.516] function(cond) { [18:41:24.516] is_error <- inherits(cond, "error") [18:41:24.516] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:24.516] NULL) [18:41:24.516] if (is_error) { [18:41:24.516] sessionInformation <- function() { [18:41:24.516] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:24.516] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:24.516] search = base::search(), system = base::Sys.info()) [18:41:24.516] } [18:41:24.516] ...future.conditions[[length(...future.conditions) + [18:41:24.516] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:24.516] cond$call), session = sessionInformation(), [18:41:24.516] timestamp = base::Sys.time(), signaled = 0L) [18:41:24.516] signalCondition(cond) [18:41:24.516] } [18:41:24.516] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:24.516] "immediateCondition"))) { [18:41:24.516] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:24.516] ...future.conditions[[length(...future.conditions) + [18:41:24.516] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:24.516] if (TRUE && !signal) { [18:41:24.516] muffleCondition <- function (cond, pattern = "^muffle") [18:41:24.516] { [18:41:24.516] inherits <- base::inherits [18:41:24.516] invokeRestart <- base::invokeRestart [18:41:24.516] is.null <- base::is.null [18:41:24.516] muffled <- FALSE [18:41:24.516] if (inherits(cond, "message")) { [18:41:24.516] muffled <- grepl(pattern, "muffleMessage") [18:41:24.516] if (muffled) [18:41:24.516] invokeRestart("muffleMessage") [18:41:24.516] } [18:41:24.516] else if (inherits(cond, "warning")) { [18:41:24.516] muffled <- grepl(pattern, "muffleWarning") [18:41:24.516] if (muffled) [18:41:24.516] invokeRestart("muffleWarning") [18:41:24.516] } [18:41:24.516] else if (inherits(cond, "condition")) { [18:41:24.516] if (!is.null(pattern)) { [18:41:24.516] computeRestarts <- base::computeRestarts [18:41:24.516] grepl <- base::grepl [18:41:24.516] restarts <- computeRestarts(cond) [18:41:24.516] for (restart in restarts) { [18:41:24.516] name <- restart$name [18:41:24.516] if (is.null(name)) [18:41:24.516] next [18:41:24.516] if (!grepl(pattern, name)) [18:41:24.516] next [18:41:24.516] invokeRestart(restart) [18:41:24.516] muffled <- TRUE [18:41:24.516] break [18:41:24.516] } [18:41:24.516] } [18:41:24.516] } [18:41:24.516] invisible(muffled) [18:41:24.516] } [18:41:24.516] muffleCondition(cond, pattern = "^muffle") [18:41:24.516] } [18:41:24.516] } [18:41:24.516] else { [18:41:24.516] if (TRUE) { [18:41:24.516] muffleCondition <- function (cond, pattern = "^muffle") [18:41:24.516] { [18:41:24.516] inherits <- base::inherits [18:41:24.516] invokeRestart <- base::invokeRestart [18:41:24.516] is.null <- base::is.null [18:41:24.516] muffled <- FALSE [18:41:24.516] if (inherits(cond, "message")) { [18:41:24.516] muffled <- grepl(pattern, "muffleMessage") [18:41:24.516] if (muffled) [18:41:24.516] invokeRestart("muffleMessage") [18:41:24.516] } [18:41:24.516] else if (inherits(cond, "warning")) { [18:41:24.516] muffled <- grepl(pattern, "muffleWarning") [18:41:24.516] if (muffled) [18:41:24.516] invokeRestart("muffleWarning") [18:41:24.516] } [18:41:24.516] else if (inherits(cond, "condition")) { [18:41:24.516] if (!is.null(pattern)) { [18:41:24.516] computeRestarts <- base::computeRestarts [18:41:24.516] grepl <- base::grepl [18:41:24.516] restarts <- computeRestarts(cond) [18:41:24.516] for (restart in restarts) { [18:41:24.516] name <- restart$name [18:41:24.516] if (is.null(name)) [18:41:24.516] next [18:41:24.516] if (!grepl(pattern, name)) [18:41:24.516] next [18:41:24.516] invokeRestart(restart) [18:41:24.516] muffled <- TRUE [18:41:24.516] break [18:41:24.516] } [18:41:24.516] } [18:41:24.516] } [18:41:24.516] invisible(muffled) [18:41:24.516] } [18:41:24.516] muffleCondition(cond, pattern = "^muffle") [18:41:24.516] } [18:41:24.516] } [18:41:24.516] } [18:41:24.516] })) [18:41:24.516] }, error = function(ex) { [18:41:24.516] base::structure(base::list(value = NULL, visible = NULL, [18:41:24.516] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:24.516] ...future.rng), started = ...future.startTime, [18:41:24.516] finished = Sys.time(), session_uuid = NA_character_, [18:41:24.516] version = "1.8"), class = "FutureResult") [18:41:24.516] }, finally = { [18:41:24.516] if (!identical(...future.workdir, getwd())) [18:41:24.516] setwd(...future.workdir) [18:41:24.516] { [18:41:24.516] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:24.516] ...future.oldOptions$nwarnings <- NULL [18:41:24.516] } [18:41:24.516] base::options(...future.oldOptions) [18:41:24.516] if (.Platform$OS.type == "windows") { [18:41:24.516] old_names <- names(...future.oldEnvVars) [18:41:24.516] envs <- base::Sys.getenv() [18:41:24.516] names <- names(envs) [18:41:24.516] common <- intersect(names, old_names) [18:41:24.516] added <- setdiff(names, old_names) [18:41:24.516] removed <- setdiff(old_names, names) [18:41:24.516] changed <- common[...future.oldEnvVars[common] != [18:41:24.516] envs[common]] [18:41:24.516] NAMES <- toupper(changed) [18:41:24.516] args <- list() [18:41:24.516] for (kk in seq_along(NAMES)) { [18:41:24.516] name <- changed[[kk]] [18:41:24.516] NAME <- NAMES[[kk]] [18:41:24.516] if (name != NAME && is.element(NAME, old_names)) [18:41:24.516] next [18:41:24.516] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:24.516] } [18:41:24.516] NAMES <- toupper(added) [18:41:24.516] for (kk in seq_along(NAMES)) { [18:41:24.516] name <- added[[kk]] [18:41:24.516] NAME <- NAMES[[kk]] [18:41:24.516] if (name != NAME && is.element(NAME, old_names)) [18:41:24.516] next [18:41:24.516] args[[name]] <- "" [18:41:24.516] } [18:41:24.516] NAMES <- toupper(removed) [18:41:24.516] for (kk in seq_along(NAMES)) { [18:41:24.516] name <- removed[[kk]] [18:41:24.516] NAME <- NAMES[[kk]] [18:41:24.516] if (name != NAME && is.element(NAME, old_names)) [18:41:24.516] next [18:41:24.516] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:24.516] } [18:41:24.516] if (length(args) > 0) [18:41:24.516] base::do.call(base::Sys.setenv, args = args) [18:41:24.516] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:24.516] } [18:41:24.516] else { [18:41:24.516] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:24.516] } [18:41:24.516] { [18:41:24.516] if (base::length(...future.futureOptionsAdded) > [18:41:24.516] 0L) { [18:41:24.516] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:24.516] base::names(opts) <- ...future.futureOptionsAdded [18:41:24.516] base::options(opts) [18:41:24.516] } [18:41:24.516] { [18:41:24.516] { [18:41:24.516] base::options(mc.cores = ...future.mc.cores.old) [18:41:24.516] NULL [18:41:24.516] } [18:41:24.516] options(future.plan = NULL) [18:41:24.516] if (is.na(NA_character_)) [18:41:24.516] Sys.unsetenv("R_FUTURE_PLAN") [18:41:24.516] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:24.516] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:24.516] .init = FALSE) [18:41:24.516] } [18:41:24.516] } [18:41:24.516] } [18:41:24.516] }) [18:41:24.516] if (TRUE) { [18:41:24.516] base::sink(type = "output", split = FALSE) [18:41:24.516] if (TRUE) { [18:41:24.516] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:24.516] } [18:41:24.516] else { [18:41:24.516] ...future.result["stdout"] <- base::list(NULL) [18:41:24.516] } [18:41:24.516] base::close(...future.stdout) [18:41:24.516] ...future.stdout <- NULL [18:41:24.516] } [18:41:24.516] ...future.result$conditions <- ...future.conditions [18:41:24.516] ...future.result$finished <- base::Sys.time() [18:41:24.516] ...future.result [18:41:24.516] } [18:41:24.521] Exporting 5 global objects (1.20 KiB) to cluster node #1 ... [18:41:24.521] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... [18:41:24.522] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... DONE [18:41:24.522] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... [18:41:24.522] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... DONE [18:41:24.523] Exporting '...future.elements_ii' (127 bytes) to cluster node #1 ... [18:41:24.523] Exporting '...future.elements_ii' (127 bytes) to cluster node #1 ... DONE [18:41:24.523] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:24.524] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:24.524] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:24.524] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:24.524] Exporting 5 global objects (1.20 KiB) to cluster node #1 ... DONE [18:41:24.525] MultisessionFuture started [18:41:24.525] - Launch lazy future ... done [18:41:24.526] run() for 'MultisessionFuture' ... done [18:41:24.526] Created future: [18:41:24.542] receiveMessageFromWorker() for ClusterFuture ... [18:41:24.542] - Validating connection of MultisessionFuture [18:41:24.542] - received message: FutureResult [18:41:24.542] - Received FutureResult [18:41:24.543] - Erased future from FutureRegistry [18:41:24.543] result() for ClusterFuture ... [18:41:24.543] - result already collected: FutureResult [18:41:24.543] result() for ClusterFuture ... done [18:41:24.543] receiveMessageFromWorker() for ClusterFuture ... done [18:41:24.526] MultisessionFuture: [18:41:24.526] Label: 'future_lapply-2' [18:41:24.526] Expression: [18:41:24.526] { [18:41:24.526] do.call(function(...) { [18:41:24.526] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:24.526] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:24.526] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:24.526] on.exit(options(oopts), add = TRUE) [18:41:24.526] } [18:41:24.526] { [18:41:24.526] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:24.526] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:24.526] ...future.FUN(...future.X_jj, ...) [18:41:24.526] }) [18:41:24.526] } [18:41:24.526] }, args = future.call.arguments) [18:41:24.526] } [18:41:24.526] Lazy evaluation: FALSE [18:41:24.526] Asynchronous evaluation: TRUE [18:41:24.526] Local evaluation: TRUE [18:41:24.526] Environment: R_GlobalEnv [18:41:24.526] Capture standard output: TRUE [18:41:24.526] Capture condition classes: 'condition' (excluding 'nothing') [18:41:24.526] Globals: 5 objects totaling 789 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 127 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:24.526] Packages: [18:41:24.526] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:24.526] Resolved: TRUE [18:41:24.526] Value: [18:41:24.526] Conditions captured: [18:41:24.526] Early signaling: FALSE [18:41:24.526] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:24.526] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:24.544] Chunk #2 of 2 ... DONE [18:41:24.544] Launching 2 futures (chunks) ... DONE [18:41:24.544] Resolving 2 futures (chunks) ... [18:41:24.544] resolve() on list ... [18:41:24.544] recursive: 0 [18:41:24.545] length: 2 [18:41:24.545] [18:41:24.545] Future #1 [18:41:24.545] result() for ClusterFuture ... [18:41:24.545] - result already collected: FutureResult [18:41:24.545] result() for ClusterFuture ... done [18:41:24.545] result() for ClusterFuture ... [18:41:24.546] - result already collected: FutureResult [18:41:24.546] result() for ClusterFuture ... done [18:41:24.546] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:24.546] - nx: 2 [18:41:24.546] - relay: TRUE [18:41:24.546] - stdout: TRUE [18:41:24.547] - signal: TRUE [18:41:24.547] - resignal: FALSE [18:41:24.547] - force: TRUE [18:41:24.547] - relayed: [n=2] FALSE, FALSE [18:41:24.547] - queued futures: [n=2] FALSE, FALSE [18:41:24.547] - until=1 [18:41:24.548] - relaying element #1 [18:41:24.548] result() for ClusterFuture ... [18:41:24.548] - result already collected: FutureResult [18:41:24.548] result() for ClusterFuture ... done [18:41:24.548] result() for ClusterFuture ... [18:41:24.548] - result already collected: FutureResult [18:41:24.548] result() for ClusterFuture ... done [18:41:24.549] result() for ClusterFuture ... [18:41:24.549] - result already collected: FutureResult [18:41:24.549] result() for ClusterFuture ... done [18:41:24.549] result() for ClusterFuture ... [18:41:24.549] - result already collected: FutureResult [18:41:24.549] result() for ClusterFuture ... done [18:41:24.550] - relayed: [n=2] TRUE, FALSE [18:41:24.550] - queued futures: [n=2] TRUE, FALSE [18:41:24.550] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:24.550] length: 1 (resolved future 1) [18:41:24.550] Future #2 [18:41:24.550] result() for ClusterFuture ... [18:41:24.551] - result already collected: FutureResult [18:41:24.551] result() for ClusterFuture ... done [18:41:24.551] result() for ClusterFuture ... [18:41:24.551] - result already collected: FutureResult [18:41:24.551] result() for ClusterFuture ... done [18:41:24.551] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:24.552] - nx: 2 [18:41:24.552] - relay: TRUE [18:41:24.552] - stdout: TRUE [18:41:24.552] - signal: TRUE [18:41:24.552] - resignal: FALSE [18:41:24.552] - force: TRUE [18:41:24.552] - relayed: [n=2] TRUE, FALSE [18:41:24.553] - queued futures: [n=2] TRUE, FALSE [18:41:24.553] - until=2 [18:41:24.553] - relaying element #2 [18:41:24.553] result() for ClusterFuture ... [18:41:24.553] - result already collected: FutureResult [18:41:24.553] result() for ClusterFuture ... done [18:41:24.554] result() for ClusterFuture ... [18:41:24.554] - result already collected: FutureResult [18:41:24.554] result() for ClusterFuture ... done [18:41:24.554] result() for ClusterFuture ... [18:41:24.554] - result already collected: FutureResult [18:41:24.554] result() for ClusterFuture ... done [18:41:24.555] result() for ClusterFuture ... [18:41:24.555] - result already collected: FutureResult [18:41:24.555] result() for ClusterFuture ... done [18:41:24.555] - relayed: [n=2] TRUE, TRUE [18:41:24.555] - queued futures: [n=2] TRUE, TRUE [18:41:24.555] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:24.555] length: 0 (resolved future 2) [18:41:24.556] Relaying remaining futures [18:41:24.556] signalConditionsASAP(NULL, pos=0) ... [18:41:24.556] - nx: 2 [18:41:24.556] - relay: TRUE [18:41:24.556] - stdout: TRUE [18:41:24.556] - signal: TRUE [18:41:24.557] - resignal: FALSE [18:41:24.557] - force: TRUE [18:41:24.557] - relayed: [n=2] TRUE, TRUE [18:41:24.557] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:24.557] - relayed: [n=2] TRUE, TRUE [18:41:24.557] - queued futures: [n=2] TRUE, TRUE [18:41:24.558] signalConditionsASAP(NULL, pos=0) ... done [18:41:24.558] resolve() on list ... DONE [18:41:24.558] result() for ClusterFuture ... [18:41:24.558] - result already collected: FutureResult [18:41:24.558] result() for ClusterFuture ... done [18:41:24.558] result() for ClusterFuture ... [18:41:24.559] - result already collected: FutureResult [18:41:24.559] result() for ClusterFuture ... done [18:41:24.559] result() for ClusterFuture ... [18:41:24.559] - result already collected: FutureResult [18:41:24.559] result() for ClusterFuture ... done [18:41:24.559] result() for ClusterFuture ... [18:41:24.559] - result already collected: FutureResult [18:41:24.560] result() for ClusterFuture ... done [18:41:24.560] - Number of value chunks collected: 2 [18:41:24.560] Resolving 2 futures (chunks) ... DONE [18:41:24.560] Reducing values from 2 chunks ... [18:41:24.560] - Number of values collected after concatenation: 4 [18:41:24.560] - Number of values expected: 4 [18:41:24.561] Reducing values from 2 chunks ... DONE [18:41:24.561] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL - future_lapply(x, FUN = future:::hpaste, ...) ... [18:41:24.564] future_lapply() ... [18:41:24.576] Number of chunks: 1 [18:41:24.576] getGlobalsAndPackagesXApply() ... [18:41:24.577] - future.globals: TRUE [18:41:24.577] getGlobalsAndPackages() ... [18:41:24.577] Searching for globals... [18:41:24.586] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [18:41:24.586] Searching for globals ... DONE [18:41:24.587] Resolving globals: FALSE [18:41:24.588] The total size of the 1 globals is 7.17 KiB (7342 bytes) [18:41:24.588] The total size of the 1 globals exported for future expression ('FUN(collapse = "; ", maxHead = 3L)') is 7.17 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (7.17 KiB of class 'function') [18:41:24.588] - globals: [1] 'FUN' [18:41:24.588] - packages: [1] 'future' [18:41:24.589] getGlobalsAndPackages() ... DONE [18:41:24.589] - globals found/used: [n=1] 'FUN' [18:41:24.589] - needed namespaces: [n=1] 'future' [18:41:24.589] Finding globals ... DONE [18:41:24.589] - use_args: TRUE [18:41:24.589] - Getting '...' globals ... [18:41:24.590] resolve() on list ... [18:41:24.590] recursive: 0 [18:41:24.590] length: 1 [18:41:24.590] elements: '...' [18:41:24.591] length: 0 (resolved future 1) [18:41:24.591] resolve() on list ... DONE [18:41:24.591] - '...' content: [n=2] 'collapse', 'maxHead' [18:41:24.591] List of 1 [18:41:24.591] $ ...:List of 2 [18:41:24.591] ..$ collapse: chr "; " [18:41:24.591] ..$ maxHead : int 3 [18:41:24.591] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:24.591] - attr(*, "where")=List of 1 [18:41:24.591] ..$ ...: [18:41:24.591] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:24.591] - attr(*, "resolved")= logi TRUE [18:41:24.591] - attr(*, "total_size")= num NA [18:41:24.595] - Getting '...' globals ... DONE [18:41:24.595] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:24.595] List of 2 [18:41:24.595] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [18:41:24.595] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [18:41:24.595] $ ... :List of 2 [18:41:24.595] ..$ collapse: chr "; " [18:41:24.595] ..$ maxHead : int 3 [18:41:24.595] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:24.595] - attr(*, "where")=List of 2 [18:41:24.595] ..$ ...future.FUN: [18:41:24.595] ..$ ... : [18:41:24.595] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:24.595] - attr(*, "resolved")= logi FALSE [18:41:24.595] - attr(*, "total_size")= int 20301 [18:41:24.599] Packages to be attached in all futures: [n=1] 'future' [18:41:24.600] getGlobalsAndPackagesXApply() ... DONE [18:41:24.600] Number of futures (= number of chunks): 1 [18:41:24.600] Launching 1 futures (chunks) ... [18:41:24.600] Chunk #1 of 1 ... [18:41:24.600] - Finding globals in 'X' for chunk #1 ... [18:41:24.601] getGlobalsAndPackages() ... [18:41:24.601] Searching for globals... [18:41:24.601] [18:41:24.601] Searching for globals ... DONE [18:41:24.601] - globals: [0] [18:41:24.602] getGlobalsAndPackages() ... DONE [18:41:24.602] + additional globals found: [n=0] [18:41:24.602] + additional namespaces needed: [n=0] [18:41:24.602] - Finding globals in 'X' for chunk #1 ... DONE [18:41:24.602] - seeds: [18:41:24.602] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:24.602] getGlobalsAndPackages() ... [18:41:24.603] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:24.603] Resolving globals: FALSE [18:41:24.603] Tweak future expression to call with '...' arguments ... [18:41:24.603] { [18:41:24.603] do.call(function(...) { [18:41:24.603] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:24.603] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:24.603] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:24.603] on.exit(options(oopts), add = TRUE) [18:41:24.603] } [18:41:24.603] { [18:41:24.603] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:24.603] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:24.603] ...future.FUN(...future.X_jj, ...) [18:41:24.603] }) [18:41:24.603] } [18:41:24.603] }, args = future.call.arguments) [18:41:24.603] } [18:41:24.604] Tweak future expression to call with '...' arguments ... DONE [18:41:24.604] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:24.604] - packages: [1] 'future' [18:41:24.605] getGlobalsAndPackages() ... DONE [18:41:24.605] run() for 'Future' ... [18:41:24.605] - state: 'created' [18:41:24.605] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:24.621] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:24.621] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:24.621] - Field: 'node' [18:41:24.621] - Field: 'label' [18:41:24.622] - Field: 'local' [18:41:24.622] - Field: 'owner' [18:41:24.622] - Field: 'envir' [18:41:24.622] - Field: 'workers' [18:41:24.622] - Field: 'packages' [18:41:24.622] - Field: 'gc' [18:41:24.623] - Field: 'conditions' [18:41:24.623] - Field: 'persistent' [18:41:24.623] - Field: 'expr' [18:41:24.623] - Field: 'uuid' [18:41:24.623] - Field: 'seed' [18:41:24.623] - Field: 'version' [18:41:24.624] - Field: 'result' [18:41:24.624] - Field: 'asynchronous' [18:41:24.624] - Field: 'calls' [18:41:24.624] - Field: 'globals' [18:41:24.624] - Field: 'stdout' [18:41:24.624] - Field: 'earlySignal' [18:41:24.625] - Field: 'lazy' [18:41:24.625] - Field: 'state' [18:41:24.625] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:24.625] - Launch lazy future ... [18:41:24.625] Packages needed by the future expression (n = 1): 'future' [18:41:24.626] Packages needed by future strategies (n = 0): [18:41:24.626] { [18:41:24.626] { [18:41:24.626] { [18:41:24.626] ...future.startTime <- base::Sys.time() [18:41:24.626] { [18:41:24.626] { [18:41:24.626] { [18:41:24.626] { [18:41:24.626] { [18:41:24.626] base::local({ [18:41:24.626] has_future <- base::requireNamespace("future", [18:41:24.626] quietly = TRUE) [18:41:24.626] if (has_future) { [18:41:24.626] ns <- base::getNamespace("future") [18:41:24.626] version <- ns[[".package"]][["version"]] [18:41:24.626] if (is.null(version)) [18:41:24.626] version <- utils::packageVersion("future") [18:41:24.626] } [18:41:24.626] else { [18:41:24.626] version <- NULL [18:41:24.626] } [18:41:24.626] if (!has_future || version < "1.8.0") { [18:41:24.626] info <- base::c(r_version = base::gsub("R version ", [18:41:24.626] "", base::R.version$version.string), [18:41:24.626] platform = base::sprintf("%s (%s-bit)", [18:41:24.626] base::R.version$platform, 8 * [18:41:24.626] base::.Machine$sizeof.pointer), [18:41:24.626] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:24.626] "release", "version")], collapse = " "), [18:41:24.626] hostname = base::Sys.info()[["nodename"]]) [18:41:24.626] info <- base::sprintf("%s: %s", base::names(info), [18:41:24.626] info) [18:41:24.626] info <- base::paste(info, collapse = "; ") [18:41:24.626] if (!has_future) { [18:41:24.626] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:24.626] info) [18:41:24.626] } [18:41:24.626] else { [18:41:24.626] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:24.626] info, version) [18:41:24.626] } [18:41:24.626] base::stop(msg) [18:41:24.626] } [18:41:24.626] }) [18:41:24.626] } [18:41:24.626] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:24.626] base::options(mc.cores = 1L) [18:41:24.626] } [18:41:24.626] base::local({ [18:41:24.626] for (pkg in "future") { [18:41:24.626] base::loadNamespace(pkg) [18:41:24.626] base::library(pkg, character.only = TRUE) [18:41:24.626] } [18:41:24.626] }) [18:41:24.626] } [18:41:24.626] ...future.strategy.old <- future::plan("list") [18:41:24.626] options(future.plan = NULL) [18:41:24.626] Sys.unsetenv("R_FUTURE_PLAN") [18:41:24.626] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:24.626] } [18:41:24.626] ...future.workdir <- getwd() [18:41:24.626] } [18:41:24.626] ...future.oldOptions <- base::as.list(base::.Options) [18:41:24.626] ...future.oldEnvVars <- base::Sys.getenv() [18:41:24.626] } [18:41:24.626] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:24.626] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:24.626] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:24.626] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:24.626] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:24.626] future.stdout.windows.reencode = NULL, width = 80L) [18:41:24.626] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:24.626] base::names(...future.oldOptions)) [18:41:24.626] } [18:41:24.626] if (FALSE) { [18:41:24.626] } [18:41:24.626] else { [18:41:24.626] if (TRUE) { [18:41:24.626] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:24.626] open = "w") [18:41:24.626] } [18:41:24.626] else { [18:41:24.626] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:24.626] windows = "NUL", "/dev/null"), open = "w") [18:41:24.626] } [18:41:24.626] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:24.626] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:24.626] base::sink(type = "output", split = FALSE) [18:41:24.626] base::close(...future.stdout) [18:41:24.626] }, add = TRUE) [18:41:24.626] } [18:41:24.626] ...future.frame <- base::sys.nframe() [18:41:24.626] ...future.conditions <- base::list() [18:41:24.626] ...future.rng <- base::globalenv()$.Random.seed [18:41:24.626] if (FALSE) { [18:41:24.626] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:24.626] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:24.626] } [18:41:24.626] ...future.result <- base::tryCatch({ [18:41:24.626] base::withCallingHandlers({ [18:41:24.626] ...future.value <- base::withVisible(base::local({ [18:41:24.626] ...future.makeSendCondition <- base::local({ [18:41:24.626] sendCondition <- NULL [18:41:24.626] function(frame = 1L) { [18:41:24.626] if (is.function(sendCondition)) [18:41:24.626] return(sendCondition) [18:41:24.626] ns <- getNamespace("parallel") [18:41:24.626] if (exists("sendData", mode = "function", [18:41:24.626] envir = ns)) { [18:41:24.626] parallel_sendData <- get("sendData", mode = "function", [18:41:24.626] envir = ns) [18:41:24.626] envir <- sys.frame(frame) [18:41:24.626] master <- NULL [18:41:24.626] while (!identical(envir, .GlobalEnv) && [18:41:24.626] !identical(envir, emptyenv())) { [18:41:24.626] if (exists("master", mode = "list", envir = envir, [18:41:24.626] inherits = FALSE)) { [18:41:24.626] master <- get("master", mode = "list", [18:41:24.626] envir = envir, inherits = FALSE) [18:41:24.626] if (inherits(master, c("SOCKnode", [18:41:24.626] "SOCK0node"))) { [18:41:24.626] sendCondition <<- function(cond) { [18:41:24.626] data <- list(type = "VALUE", value = cond, [18:41:24.626] success = TRUE) [18:41:24.626] parallel_sendData(master, data) [18:41:24.626] } [18:41:24.626] return(sendCondition) [18:41:24.626] } [18:41:24.626] } [18:41:24.626] frame <- frame + 1L [18:41:24.626] envir <- sys.frame(frame) [18:41:24.626] } [18:41:24.626] } [18:41:24.626] sendCondition <<- function(cond) NULL [18:41:24.626] } [18:41:24.626] }) [18:41:24.626] withCallingHandlers({ [18:41:24.626] { [18:41:24.626] do.call(function(...) { [18:41:24.626] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:24.626] if (!identical(...future.globals.maxSize.org, [18:41:24.626] ...future.globals.maxSize)) { [18:41:24.626] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:24.626] on.exit(options(oopts), add = TRUE) [18:41:24.626] } [18:41:24.626] { [18:41:24.626] lapply(seq_along(...future.elements_ii), [18:41:24.626] FUN = function(jj) { [18:41:24.626] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:24.626] ...future.FUN(...future.X_jj, ...) [18:41:24.626] }) [18:41:24.626] } [18:41:24.626] }, args = future.call.arguments) [18:41:24.626] } [18:41:24.626] }, immediateCondition = function(cond) { [18:41:24.626] sendCondition <- ...future.makeSendCondition() [18:41:24.626] sendCondition(cond) [18:41:24.626] muffleCondition <- function (cond, pattern = "^muffle") [18:41:24.626] { [18:41:24.626] inherits <- base::inherits [18:41:24.626] invokeRestart <- base::invokeRestart [18:41:24.626] is.null <- base::is.null [18:41:24.626] muffled <- FALSE [18:41:24.626] if (inherits(cond, "message")) { [18:41:24.626] muffled <- grepl(pattern, "muffleMessage") [18:41:24.626] if (muffled) [18:41:24.626] invokeRestart("muffleMessage") [18:41:24.626] } [18:41:24.626] else if (inherits(cond, "warning")) { [18:41:24.626] muffled <- grepl(pattern, "muffleWarning") [18:41:24.626] if (muffled) [18:41:24.626] invokeRestart("muffleWarning") [18:41:24.626] } [18:41:24.626] else if (inherits(cond, "condition")) { [18:41:24.626] if (!is.null(pattern)) { [18:41:24.626] computeRestarts <- base::computeRestarts [18:41:24.626] grepl <- base::grepl [18:41:24.626] restarts <- computeRestarts(cond) [18:41:24.626] for (restart in restarts) { [18:41:24.626] name <- restart$name [18:41:24.626] if (is.null(name)) [18:41:24.626] next [18:41:24.626] if (!grepl(pattern, name)) [18:41:24.626] next [18:41:24.626] invokeRestart(restart) [18:41:24.626] muffled <- TRUE [18:41:24.626] break [18:41:24.626] } [18:41:24.626] } [18:41:24.626] } [18:41:24.626] invisible(muffled) [18:41:24.626] } [18:41:24.626] muffleCondition(cond) [18:41:24.626] }) [18:41:24.626] })) [18:41:24.626] future::FutureResult(value = ...future.value$value, [18:41:24.626] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:24.626] ...future.rng), globalenv = if (FALSE) [18:41:24.626] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:24.626] ...future.globalenv.names)) [18:41:24.626] else NULL, started = ...future.startTime, version = "1.8") [18:41:24.626] }, condition = base::local({ [18:41:24.626] c <- base::c [18:41:24.626] inherits <- base::inherits [18:41:24.626] invokeRestart <- base::invokeRestart [18:41:24.626] length <- base::length [18:41:24.626] list <- base::list [18:41:24.626] seq.int <- base::seq.int [18:41:24.626] signalCondition <- base::signalCondition [18:41:24.626] sys.calls <- base::sys.calls [18:41:24.626] `[[` <- base::`[[` [18:41:24.626] `+` <- base::`+` [18:41:24.626] `<<-` <- base::`<<-` [18:41:24.626] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:24.626] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:24.626] 3L)] [18:41:24.626] } [18:41:24.626] function(cond) { [18:41:24.626] is_error <- inherits(cond, "error") [18:41:24.626] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:24.626] NULL) [18:41:24.626] if (is_error) { [18:41:24.626] sessionInformation <- function() { [18:41:24.626] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:24.626] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:24.626] search = base::search(), system = base::Sys.info()) [18:41:24.626] } [18:41:24.626] ...future.conditions[[length(...future.conditions) + [18:41:24.626] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:24.626] cond$call), session = sessionInformation(), [18:41:24.626] timestamp = base::Sys.time(), signaled = 0L) [18:41:24.626] signalCondition(cond) [18:41:24.626] } [18:41:24.626] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:24.626] "immediateCondition"))) { [18:41:24.626] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:24.626] ...future.conditions[[length(...future.conditions) + [18:41:24.626] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:24.626] if (TRUE && !signal) { [18:41:24.626] muffleCondition <- function (cond, pattern = "^muffle") [18:41:24.626] { [18:41:24.626] inherits <- base::inherits [18:41:24.626] invokeRestart <- base::invokeRestart [18:41:24.626] is.null <- base::is.null [18:41:24.626] muffled <- FALSE [18:41:24.626] if (inherits(cond, "message")) { [18:41:24.626] muffled <- grepl(pattern, "muffleMessage") [18:41:24.626] if (muffled) [18:41:24.626] invokeRestart("muffleMessage") [18:41:24.626] } [18:41:24.626] else if (inherits(cond, "warning")) { [18:41:24.626] muffled <- grepl(pattern, "muffleWarning") [18:41:24.626] if (muffled) [18:41:24.626] invokeRestart("muffleWarning") [18:41:24.626] } [18:41:24.626] else if (inherits(cond, "condition")) { [18:41:24.626] if (!is.null(pattern)) { [18:41:24.626] computeRestarts <- base::computeRestarts [18:41:24.626] grepl <- base::grepl [18:41:24.626] restarts <- computeRestarts(cond) [18:41:24.626] for (restart in restarts) { [18:41:24.626] name <- restart$name [18:41:24.626] if (is.null(name)) [18:41:24.626] next [18:41:24.626] if (!grepl(pattern, name)) [18:41:24.626] next [18:41:24.626] invokeRestart(restart) [18:41:24.626] muffled <- TRUE [18:41:24.626] break [18:41:24.626] } [18:41:24.626] } [18:41:24.626] } [18:41:24.626] invisible(muffled) [18:41:24.626] } [18:41:24.626] muffleCondition(cond, pattern = "^muffle") [18:41:24.626] } [18:41:24.626] } [18:41:24.626] else { [18:41:24.626] if (TRUE) { [18:41:24.626] muffleCondition <- function (cond, pattern = "^muffle") [18:41:24.626] { [18:41:24.626] inherits <- base::inherits [18:41:24.626] invokeRestart <- base::invokeRestart [18:41:24.626] is.null <- base::is.null [18:41:24.626] muffled <- FALSE [18:41:24.626] if (inherits(cond, "message")) { [18:41:24.626] muffled <- grepl(pattern, "muffleMessage") [18:41:24.626] if (muffled) [18:41:24.626] invokeRestart("muffleMessage") [18:41:24.626] } [18:41:24.626] else if (inherits(cond, "warning")) { [18:41:24.626] muffled <- grepl(pattern, "muffleWarning") [18:41:24.626] if (muffled) [18:41:24.626] invokeRestart("muffleWarning") [18:41:24.626] } [18:41:24.626] else if (inherits(cond, "condition")) { [18:41:24.626] if (!is.null(pattern)) { [18:41:24.626] computeRestarts <- base::computeRestarts [18:41:24.626] grepl <- base::grepl [18:41:24.626] restarts <- computeRestarts(cond) [18:41:24.626] for (restart in restarts) { [18:41:24.626] name <- restart$name [18:41:24.626] if (is.null(name)) [18:41:24.626] next [18:41:24.626] if (!grepl(pattern, name)) [18:41:24.626] next [18:41:24.626] invokeRestart(restart) [18:41:24.626] muffled <- TRUE [18:41:24.626] break [18:41:24.626] } [18:41:24.626] } [18:41:24.626] } [18:41:24.626] invisible(muffled) [18:41:24.626] } [18:41:24.626] muffleCondition(cond, pattern = "^muffle") [18:41:24.626] } [18:41:24.626] } [18:41:24.626] } [18:41:24.626] })) [18:41:24.626] }, error = function(ex) { [18:41:24.626] base::structure(base::list(value = NULL, visible = NULL, [18:41:24.626] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:24.626] ...future.rng), started = ...future.startTime, [18:41:24.626] finished = Sys.time(), session_uuid = NA_character_, [18:41:24.626] version = "1.8"), class = "FutureResult") [18:41:24.626] }, finally = { [18:41:24.626] if (!identical(...future.workdir, getwd())) [18:41:24.626] setwd(...future.workdir) [18:41:24.626] { [18:41:24.626] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:24.626] ...future.oldOptions$nwarnings <- NULL [18:41:24.626] } [18:41:24.626] base::options(...future.oldOptions) [18:41:24.626] if (.Platform$OS.type == "windows") { [18:41:24.626] old_names <- names(...future.oldEnvVars) [18:41:24.626] envs <- base::Sys.getenv() [18:41:24.626] names <- names(envs) [18:41:24.626] common <- intersect(names, old_names) [18:41:24.626] added <- setdiff(names, old_names) [18:41:24.626] removed <- setdiff(old_names, names) [18:41:24.626] changed <- common[...future.oldEnvVars[common] != [18:41:24.626] envs[common]] [18:41:24.626] NAMES <- toupper(changed) [18:41:24.626] args <- list() [18:41:24.626] for (kk in seq_along(NAMES)) { [18:41:24.626] name <- changed[[kk]] [18:41:24.626] NAME <- NAMES[[kk]] [18:41:24.626] if (name != NAME && is.element(NAME, old_names)) [18:41:24.626] next [18:41:24.626] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:24.626] } [18:41:24.626] NAMES <- toupper(added) [18:41:24.626] for (kk in seq_along(NAMES)) { [18:41:24.626] name <- added[[kk]] [18:41:24.626] NAME <- NAMES[[kk]] [18:41:24.626] if (name != NAME && is.element(NAME, old_names)) [18:41:24.626] next [18:41:24.626] args[[name]] <- "" [18:41:24.626] } [18:41:24.626] NAMES <- toupper(removed) [18:41:24.626] for (kk in seq_along(NAMES)) { [18:41:24.626] name <- removed[[kk]] [18:41:24.626] NAME <- NAMES[[kk]] [18:41:24.626] if (name != NAME && is.element(NAME, old_names)) [18:41:24.626] next [18:41:24.626] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:24.626] } [18:41:24.626] if (length(args) > 0) [18:41:24.626] base::do.call(base::Sys.setenv, args = args) [18:41:24.626] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:24.626] } [18:41:24.626] else { [18:41:24.626] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:24.626] } [18:41:24.626] { [18:41:24.626] if (base::length(...future.futureOptionsAdded) > [18:41:24.626] 0L) { [18:41:24.626] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:24.626] base::names(opts) <- ...future.futureOptionsAdded [18:41:24.626] base::options(opts) [18:41:24.626] } [18:41:24.626] { [18:41:24.626] { [18:41:24.626] base::options(mc.cores = ...future.mc.cores.old) [18:41:24.626] NULL [18:41:24.626] } [18:41:24.626] options(future.plan = NULL) [18:41:24.626] if (is.na(NA_character_)) [18:41:24.626] Sys.unsetenv("R_FUTURE_PLAN") [18:41:24.626] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:24.626] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:24.626] .init = FALSE) [18:41:24.626] } [18:41:24.626] } [18:41:24.626] } [18:41:24.626] }) [18:41:24.626] if (TRUE) { [18:41:24.626] base::sink(type = "output", split = FALSE) [18:41:24.626] if (TRUE) { [18:41:24.626] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:24.626] } [18:41:24.626] else { [18:41:24.626] ...future.result["stdout"] <- base::list(NULL) [18:41:24.626] } [18:41:24.626] base::close(...future.stdout) [18:41:24.626] ...future.stdout <- NULL [18:41:24.626] } [18:41:24.626] ...future.result$conditions <- ...future.conditions [18:41:24.626] ...future.result$finished <- base::Sys.time() [18:41:24.626] ...future.result [18:41:24.626] } [18:41:24.632] Exporting 5 global objects (9.99 KiB) to cluster node #1 ... [18:41:24.632] Exporting '...future.FUN' (7.17 KiB) to cluster node #1 ... [18:41:24.632] Exporting '...future.FUN' (7.17 KiB) to cluster node #1 ... DONE [18:41:24.633] Exporting 'future.call.arguments' (187 bytes) to cluster node #1 ... [18:41:24.633] Exporting 'future.call.arguments' (187 bytes) to cluster node #1 ... DONE [18:41:24.633] Exporting '...future.elements_ii' (2.15 KiB) to cluster node #1 ... [18:41:24.634] Exporting '...future.elements_ii' (2.15 KiB) to cluster node #1 ... DONE [18:41:24.634] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:24.634] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:24.635] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:24.635] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:24.635] Exporting 5 global objects (9.99 KiB) to cluster node #1 ... DONE [18:41:24.636] MultisessionFuture started [18:41:24.636] - Launch lazy future ... done [18:41:24.636] run() for 'MultisessionFuture' ... done [18:41:24.637] Created future: [18:41:24.653] receiveMessageFromWorker() for ClusterFuture ... [18:41:24.653] - Validating connection of MultisessionFuture [18:41:24.654] - received message: FutureResult [18:41:24.654] - Received FutureResult [18:41:24.654] - Erased future from FutureRegistry [18:41:24.654] result() for ClusterFuture ... [18:41:24.654] - result already collected: FutureResult [18:41:24.655] result() for ClusterFuture ... done [18:41:24.655] receiveMessageFromWorker() for ClusterFuture ... done [18:41:24.637] MultisessionFuture: [18:41:24.637] Label: 'future_lapply-1' [18:41:24.637] Expression: [18:41:24.637] { [18:41:24.637] do.call(function(...) { [18:41:24.637] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:24.637] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:24.637] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:24.637] on.exit(options(oopts), add = TRUE) [18:41:24.637] } [18:41:24.637] { [18:41:24.637] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:24.637] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:24.637] ...future.FUN(...future.X_jj, ...) [18:41:24.637] }) [18:41:24.637] } [18:41:24.637] }, args = future.call.arguments) [18:41:24.637] } [18:41:24.637] Lazy evaluation: FALSE [18:41:24.637] Asynchronous evaluation: TRUE [18:41:24.637] Local evaluation: TRUE [18:41:24.637] Environment: R_GlobalEnv [18:41:24.637] Capture standard output: TRUE [18:41:24.637] Capture condition classes: 'condition' (excluding 'nothing') [18:41:24.637] Globals: 5 objects totaling 9.56 KiB (function '...future.FUN' of 7.17 KiB, DotDotDotList 'future.call.arguments' of 187 bytes, list '...future.elements_ii' of 2.15 KiB, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:24.637] Packages: 1 packages ('future') [18:41:24.637] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:24.637] Resolved: TRUE [18:41:24.637] Value: [18:41:24.637] Conditions captured: [18:41:24.637] Early signaling: FALSE [18:41:24.637] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:24.637] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:24.655] Chunk #1 of 1 ... DONE [18:41:24.655] Launching 1 futures (chunks) ... DONE [18:41:24.656] Resolving 1 futures (chunks) ... [18:41:24.656] resolve() on list ... [18:41:24.656] recursive: 0 [18:41:24.656] length: 1 [18:41:24.656] [18:41:24.656] Future #1 [18:41:24.656] result() for ClusterFuture ... [18:41:24.657] - result already collected: FutureResult [18:41:24.657] result() for ClusterFuture ... done [18:41:24.657] result() for ClusterFuture ... [18:41:24.657] - result already collected: FutureResult [18:41:24.657] result() for ClusterFuture ... done [18:41:24.657] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:24.658] - nx: 1 [18:41:24.658] - relay: TRUE [18:41:24.658] - stdout: TRUE [18:41:24.658] - signal: TRUE [18:41:24.658] - resignal: FALSE [18:41:24.659] - force: TRUE [18:41:24.659] - relayed: [n=1] FALSE [18:41:24.659] - queued futures: [n=1] FALSE [18:41:24.659] - until=1 [18:41:24.659] - relaying element #1 [18:41:24.659] result() for ClusterFuture ... [18:41:24.659] - result already collected: FutureResult [18:41:24.660] result() for ClusterFuture ... done [18:41:24.660] result() for ClusterFuture ... [18:41:24.660] - result already collected: FutureResult [18:41:24.660] result() for ClusterFuture ... done [18:41:24.660] result() for ClusterFuture ... [18:41:24.661] - result already collected: FutureResult [18:41:24.661] result() for ClusterFuture ... done [18:41:24.661] result() for ClusterFuture ... [18:41:24.661] - result already collected: FutureResult [18:41:24.661] result() for ClusterFuture ... done [18:41:24.661] - relayed: [n=1] TRUE [18:41:24.661] - queued futures: [n=1] TRUE [18:41:24.662] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:24.662] length: 0 (resolved future 1) [18:41:24.662] Relaying remaining futures [18:41:24.662] signalConditionsASAP(NULL, pos=0) ... [18:41:24.662] - nx: 1 [18:41:24.663] - relay: TRUE [18:41:24.663] - stdout: TRUE [18:41:24.663] - signal: TRUE [18:41:24.663] - resignal: FALSE [18:41:24.663] - force: TRUE [18:41:24.663] - relayed: [n=1] TRUE [18:41:24.663] - queued futures: [n=1] TRUE - flush all [18:41:24.664] - relayed: [n=1] TRUE [18:41:24.664] - queued futures: [n=1] TRUE [18:41:24.664] signalConditionsASAP(NULL, pos=0) ... done [18:41:24.664] resolve() on list ... DONE [18:41:24.664] result() for ClusterFuture ... [18:41:24.665] - result already collected: FutureResult [18:41:24.665] result() for ClusterFuture ... done [18:41:24.665] result() for ClusterFuture ... [18:41:24.665] - result already collected: FutureResult [18:41:24.665] result() for ClusterFuture ... done [18:41:24.665] - Number of value chunks collected: 1 [18:41:24.666] Resolving 1 futures (chunks) ... DONE [18:41:24.666] Reducing values from 1 chunks ... [18:41:24.666] - Number of values collected after concatenation: 1 [18:41:24.666] - Number of values expected: 1 [18:41:24.666] Reducing values from 1 chunks ... DONE [18:41:24.666] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [18:41:24.668] future_lapply() ... [18:41:24.671] Number of chunks: 2 [18:41:24.671] getGlobalsAndPackagesXApply() ... [18:41:24.671] - future.globals: TRUE [18:41:24.671] getGlobalsAndPackages() ... [18:41:24.672] Searching for globals... [18:41:24.673] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [18:41:24.673] Searching for globals ... DONE [18:41:24.674] Resolving globals: FALSE [18:41:24.674] The total size of the 1 globals is 911 bytes (911 bytes) [18:41:24.675] The total size of the 1 globals exported for future expression ('FUN()') is 911 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (911 bytes of class 'function') [18:41:24.675] - globals: [1] 'FUN' [18:41:24.675] - packages: [1] 'listenv' [18:41:24.675] getGlobalsAndPackages() ... DONE [18:41:24.675] - globals found/used: [n=1] 'FUN' [18:41:24.676] - needed namespaces: [n=1] 'listenv' [18:41:24.676] Finding globals ... DONE [18:41:24.676] - use_args: TRUE [18:41:24.676] - Getting '...' globals ... [18:41:24.677] resolve() on list ... [18:41:24.677] recursive: 0 [18:41:24.677] length: 1 [18:41:24.677] elements: '...' [18:41:24.677] length: 0 (resolved future 1) [18:41:24.678] resolve() on list ... DONE [18:41:24.678] - '...' content: [n=0] [18:41:24.678] List of 1 [18:41:24.678] $ ...: list() [18:41:24.678] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:24.678] - attr(*, "where")=List of 1 [18:41:24.678] ..$ ...: [18:41:24.678] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:24.678] - attr(*, "resolved")= logi TRUE [18:41:24.678] - attr(*, "total_size")= num NA [18:41:24.681] - Getting '...' globals ... DONE [18:41:24.681] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:24.682] List of 2 [18:41:24.682] $ ...future.FUN:function (x, ...) [18:41:24.682] $ ... : list() [18:41:24.682] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:24.682] - attr(*, "where")=List of 2 [18:41:24.682] ..$ ...future.FUN: [18:41:24.682] ..$ ... : [18:41:24.682] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:24.682] - attr(*, "resolved")= logi FALSE [18:41:24.682] - attr(*, "total_size")= int 8145 [18:41:24.685] Packages to be attached in all futures: [n=1] 'listenv' [18:41:24.685] getGlobalsAndPackagesXApply() ... DONE [18:41:24.686] Number of futures (= number of chunks): 2 [18:41:24.686] Launching 2 futures (chunks) ... [18:41:24.686] Chunk #1 of 2 ... [18:41:24.686] - Finding globals in 'X' for chunk #1 ... [18:41:24.686] getGlobalsAndPackages() ... [18:41:24.686] Searching for globals... [18:41:24.687] [18:41:24.687] Searching for globals ... DONE [18:41:24.687] - globals: [0] [18:41:24.688] getGlobalsAndPackages() ... DONE [18:41:24.688] + additional globals found: [n=0] [18:41:24.688] + additional namespaces needed: [n=0] [18:41:24.688] - Finding globals in 'X' for chunk #1 ... DONE [18:41:24.688] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:24.688] - seeds: [18:41:24.689] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:24.689] getGlobalsAndPackages() ... [18:41:24.689] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:24.689] Resolving globals: FALSE [18:41:24.689] Tweak future expression to call with '...' arguments ... [18:41:24.690] { [18:41:24.690] do.call(function(...) { [18:41:24.690] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:24.690] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:24.690] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:24.690] on.exit(options(oopts), add = TRUE) [18:41:24.690] } [18:41:24.690] { [18:41:24.690] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:24.690] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:24.690] ...future.FUN(...future.X_jj, ...) [18:41:24.690] }) [18:41:24.690] } [18:41:24.690] }, args = future.call.arguments) [18:41:24.690] } [18:41:24.690] Tweak future expression to call with '...' arguments ... DONE [18:41:24.691] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:24.691] - packages: [1] 'listenv' [18:41:24.692] getGlobalsAndPackages() ... DONE [18:41:24.692] run() for 'Future' ... [18:41:24.692] - state: 'created' [18:41:24.693] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:24.708] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:24.708] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:24.708] - Field: 'node' [18:41:24.708] - Field: 'label' [18:41:24.709] - Field: 'local' [18:41:24.709] - Field: 'owner' [18:41:24.709] - Field: 'envir' [18:41:24.709] - Field: 'workers' [18:41:24.709] - Field: 'packages' [18:41:24.709] - Field: 'gc' [18:41:24.710] - Field: 'conditions' [18:41:24.710] - Field: 'persistent' [18:41:24.710] - Field: 'expr' [18:41:24.710] - Field: 'uuid' [18:41:24.710] - Field: 'seed' [18:41:24.711] - Field: 'version' [18:41:24.711] - Field: 'result' [18:41:24.711] - Field: 'asynchronous' [18:41:24.711] - Field: 'calls' [18:41:24.711] - Field: 'globals' [18:41:24.711] - Field: 'stdout' [18:41:24.712] - Field: 'earlySignal' [18:41:24.712] - Field: 'lazy' [18:41:24.712] - Field: 'state' [18:41:24.712] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:24.712] - Launch lazy future ... [18:41:24.713] Packages needed by the future expression (n = 1): 'listenv' [18:41:24.713] Packages needed by future strategies (n = 0): [18:41:24.713] { [18:41:24.713] { [18:41:24.713] { [18:41:24.713] ...future.startTime <- base::Sys.time() [18:41:24.713] { [18:41:24.713] { [18:41:24.713] { [18:41:24.713] { [18:41:24.713] { [18:41:24.713] base::local({ [18:41:24.713] has_future <- base::requireNamespace("future", [18:41:24.713] quietly = TRUE) [18:41:24.713] if (has_future) { [18:41:24.713] ns <- base::getNamespace("future") [18:41:24.713] version <- ns[[".package"]][["version"]] [18:41:24.713] if (is.null(version)) [18:41:24.713] version <- utils::packageVersion("future") [18:41:24.713] } [18:41:24.713] else { [18:41:24.713] version <- NULL [18:41:24.713] } [18:41:24.713] if (!has_future || version < "1.8.0") { [18:41:24.713] info <- base::c(r_version = base::gsub("R version ", [18:41:24.713] "", base::R.version$version.string), [18:41:24.713] platform = base::sprintf("%s (%s-bit)", [18:41:24.713] base::R.version$platform, 8 * [18:41:24.713] base::.Machine$sizeof.pointer), [18:41:24.713] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:24.713] "release", "version")], collapse = " "), [18:41:24.713] hostname = base::Sys.info()[["nodename"]]) [18:41:24.713] info <- base::sprintf("%s: %s", base::names(info), [18:41:24.713] info) [18:41:24.713] info <- base::paste(info, collapse = "; ") [18:41:24.713] if (!has_future) { [18:41:24.713] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:24.713] info) [18:41:24.713] } [18:41:24.713] else { [18:41:24.713] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:24.713] info, version) [18:41:24.713] } [18:41:24.713] base::stop(msg) [18:41:24.713] } [18:41:24.713] }) [18:41:24.713] } [18:41:24.713] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:24.713] base::options(mc.cores = 1L) [18:41:24.713] } [18:41:24.713] base::local({ [18:41:24.713] for (pkg in "listenv") { [18:41:24.713] base::loadNamespace(pkg) [18:41:24.713] base::library(pkg, character.only = TRUE) [18:41:24.713] } [18:41:24.713] }) [18:41:24.713] } [18:41:24.713] ...future.strategy.old <- future::plan("list") [18:41:24.713] options(future.plan = NULL) [18:41:24.713] Sys.unsetenv("R_FUTURE_PLAN") [18:41:24.713] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:24.713] } [18:41:24.713] ...future.workdir <- getwd() [18:41:24.713] } [18:41:24.713] ...future.oldOptions <- base::as.list(base::.Options) [18:41:24.713] ...future.oldEnvVars <- base::Sys.getenv() [18:41:24.713] } [18:41:24.713] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:24.713] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:24.713] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:24.713] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:24.713] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:24.713] future.stdout.windows.reencode = NULL, width = 80L) [18:41:24.713] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:24.713] base::names(...future.oldOptions)) [18:41:24.713] } [18:41:24.713] if (FALSE) { [18:41:24.713] } [18:41:24.713] else { [18:41:24.713] if (TRUE) { [18:41:24.713] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:24.713] open = "w") [18:41:24.713] } [18:41:24.713] else { [18:41:24.713] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:24.713] windows = "NUL", "/dev/null"), open = "w") [18:41:24.713] } [18:41:24.713] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:24.713] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:24.713] base::sink(type = "output", split = FALSE) [18:41:24.713] base::close(...future.stdout) [18:41:24.713] }, add = TRUE) [18:41:24.713] } [18:41:24.713] ...future.frame <- base::sys.nframe() [18:41:24.713] ...future.conditions <- base::list() [18:41:24.713] ...future.rng <- base::globalenv()$.Random.seed [18:41:24.713] if (FALSE) { [18:41:24.713] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:24.713] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:24.713] } [18:41:24.713] ...future.result <- base::tryCatch({ [18:41:24.713] base::withCallingHandlers({ [18:41:24.713] ...future.value <- base::withVisible(base::local({ [18:41:24.713] ...future.makeSendCondition <- base::local({ [18:41:24.713] sendCondition <- NULL [18:41:24.713] function(frame = 1L) { [18:41:24.713] if (is.function(sendCondition)) [18:41:24.713] return(sendCondition) [18:41:24.713] ns <- getNamespace("parallel") [18:41:24.713] if (exists("sendData", mode = "function", [18:41:24.713] envir = ns)) { [18:41:24.713] parallel_sendData <- get("sendData", mode = "function", [18:41:24.713] envir = ns) [18:41:24.713] envir <- sys.frame(frame) [18:41:24.713] master <- NULL [18:41:24.713] while (!identical(envir, .GlobalEnv) && [18:41:24.713] !identical(envir, emptyenv())) { [18:41:24.713] if (exists("master", mode = "list", envir = envir, [18:41:24.713] inherits = FALSE)) { [18:41:24.713] master <- get("master", mode = "list", [18:41:24.713] envir = envir, inherits = FALSE) [18:41:24.713] if (inherits(master, c("SOCKnode", [18:41:24.713] "SOCK0node"))) { [18:41:24.713] sendCondition <<- function(cond) { [18:41:24.713] data <- list(type = "VALUE", value = cond, [18:41:24.713] success = TRUE) [18:41:24.713] parallel_sendData(master, data) [18:41:24.713] } [18:41:24.713] return(sendCondition) [18:41:24.713] } [18:41:24.713] } [18:41:24.713] frame <- frame + 1L [18:41:24.713] envir <- sys.frame(frame) [18:41:24.713] } [18:41:24.713] } [18:41:24.713] sendCondition <<- function(cond) NULL [18:41:24.713] } [18:41:24.713] }) [18:41:24.713] withCallingHandlers({ [18:41:24.713] { [18:41:24.713] do.call(function(...) { [18:41:24.713] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:24.713] if (!identical(...future.globals.maxSize.org, [18:41:24.713] ...future.globals.maxSize)) { [18:41:24.713] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:24.713] on.exit(options(oopts), add = TRUE) [18:41:24.713] } [18:41:24.713] { [18:41:24.713] lapply(seq_along(...future.elements_ii), [18:41:24.713] FUN = function(jj) { [18:41:24.713] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:24.713] ...future.FUN(...future.X_jj, ...) [18:41:24.713] }) [18:41:24.713] } [18:41:24.713] }, args = future.call.arguments) [18:41:24.713] } [18:41:24.713] }, immediateCondition = function(cond) { [18:41:24.713] sendCondition <- ...future.makeSendCondition() [18:41:24.713] sendCondition(cond) [18:41:24.713] muffleCondition <- function (cond, pattern = "^muffle") [18:41:24.713] { [18:41:24.713] inherits <- base::inherits [18:41:24.713] invokeRestart <- base::invokeRestart [18:41:24.713] is.null <- base::is.null [18:41:24.713] muffled <- FALSE [18:41:24.713] if (inherits(cond, "message")) { [18:41:24.713] muffled <- grepl(pattern, "muffleMessage") [18:41:24.713] if (muffled) [18:41:24.713] invokeRestart("muffleMessage") [18:41:24.713] } [18:41:24.713] else if (inherits(cond, "warning")) { [18:41:24.713] muffled <- grepl(pattern, "muffleWarning") [18:41:24.713] if (muffled) [18:41:24.713] invokeRestart("muffleWarning") [18:41:24.713] } [18:41:24.713] else if (inherits(cond, "condition")) { [18:41:24.713] if (!is.null(pattern)) { [18:41:24.713] computeRestarts <- base::computeRestarts [18:41:24.713] grepl <- base::grepl [18:41:24.713] restarts <- computeRestarts(cond) [18:41:24.713] for (restart in restarts) { [18:41:24.713] name <- restart$name [18:41:24.713] if (is.null(name)) [18:41:24.713] next [18:41:24.713] if (!grepl(pattern, name)) [18:41:24.713] next [18:41:24.713] invokeRestart(restart) [18:41:24.713] muffled <- TRUE [18:41:24.713] break [18:41:24.713] } [18:41:24.713] } [18:41:24.713] } [18:41:24.713] invisible(muffled) [18:41:24.713] } [18:41:24.713] muffleCondition(cond) [18:41:24.713] }) [18:41:24.713] })) [18:41:24.713] future::FutureResult(value = ...future.value$value, [18:41:24.713] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:24.713] ...future.rng), globalenv = if (FALSE) [18:41:24.713] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:24.713] ...future.globalenv.names)) [18:41:24.713] else NULL, started = ...future.startTime, version = "1.8") [18:41:24.713] }, condition = base::local({ [18:41:24.713] c <- base::c [18:41:24.713] inherits <- base::inherits [18:41:24.713] invokeRestart <- base::invokeRestart [18:41:24.713] length <- base::length [18:41:24.713] list <- base::list [18:41:24.713] seq.int <- base::seq.int [18:41:24.713] signalCondition <- base::signalCondition [18:41:24.713] sys.calls <- base::sys.calls [18:41:24.713] `[[` <- base::`[[` [18:41:24.713] `+` <- base::`+` [18:41:24.713] `<<-` <- base::`<<-` [18:41:24.713] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:24.713] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:24.713] 3L)] [18:41:24.713] } [18:41:24.713] function(cond) { [18:41:24.713] is_error <- inherits(cond, "error") [18:41:24.713] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:24.713] NULL) [18:41:24.713] if (is_error) { [18:41:24.713] sessionInformation <- function() { [18:41:24.713] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:24.713] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:24.713] search = base::search(), system = base::Sys.info()) [18:41:24.713] } [18:41:24.713] ...future.conditions[[length(...future.conditions) + [18:41:24.713] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:24.713] cond$call), session = sessionInformation(), [18:41:24.713] timestamp = base::Sys.time(), signaled = 0L) [18:41:24.713] signalCondition(cond) [18:41:24.713] } [18:41:24.713] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:24.713] "immediateCondition"))) { [18:41:24.713] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:24.713] ...future.conditions[[length(...future.conditions) + [18:41:24.713] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:24.713] if (TRUE && !signal) { [18:41:24.713] muffleCondition <- function (cond, pattern = "^muffle") [18:41:24.713] { [18:41:24.713] inherits <- base::inherits [18:41:24.713] invokeRestart <- base::invokeRestart [18:41:24.713] is.null <- base::is.null [18:41:24.713] muffled <- FALSE [18:41:24.713] if (inherits(cond, "message")) { [18:41:24.713] muffled <- grepl(pattern, "muffleMessage") [18:41:24.713] if (muffled) [18:41:24.713] invokeRestart("muffleMessage") [18:41:24.713] } [18:41:24.713] else if (inherits(cond, "warning")) { [18:41:24.713] muffled <- grepl(pattern, "muffleWarning") [18:41:24.713] if (muffled) [18:41:24.713] invokeRestart("muffleWarning") [18:41:24.713] } [18:41:24.713] else if (inherits(cond, "condition")) { [18:41:24.713] if (!is.null(pattern)) { [18:41:24.713] computeRestarts <- base::computeRestarts [18:41:24.713] grepl <- base::grepl [18:41:24.713] restarts <- computeRestarts(cond) [18:41:24.713] for (restart in restarts) { [18:41:24.713] name <- restart$name [18:41:24.713] if (is.null(name)) [18:41:24.713] next [18:41:24.713] if (!grepl(pattern, name)) [18:41:24.713] next [18:41:24.713] invokeRestart(restart) [18:41:24.713] muffled <- TRUE [18:41:24.713] break [18:41:24.713] } [18:41:24.713] } [18:41:24.713] } [18:41:24.713] invisible(muffled) [18:41:24.713] } [18:41:24.713] muffleCondition(cond, pattern = "^muffle") [18:41:24.713] } [18:41:24.713] } [18:41:24.713] else { [18:41:24.713] if (TRUE) { [18:41:24.713] muffleCondition <- function (cond, pattern = "^muffle") [18:41:24.713] { [18:41:24.713] inherits <- base::inherits [18:41:24.713] invokeRestart <- base::invokeRestart [18:41:24.713] is.null <- base::is.null [18:41:24.713] muffled <- FALSE [18:41:24.713] if (inherits(cond, "message")) { [18:41:24.713] muffled <- grepl(pattern, "muffleMessage") [18:41:24.713] if (muffled) [18:41:24.713] invokeRestart("muffleMessage") [18:41:24.713] } [18:41:24.713] else if (inherits(cond, "warning")) { [18:41:24.713] muffled <- grepl(pattern, "muffleWarning") [18:41:24.713] if (muffled) [18:41:24.713] invokeRestart("muffleWarning") [18:41:24.713] } [18:41:24.713] else if (inherits(cond, "condition")) { [18:41:24.713] if (!is.null(pattern)) { [18:41:24.713] computeRestarts <- base::computeRestarts [18:41:24.713] grepl <- base::grepl [18:41:24.713] restarts <- computeRestarts(cond) [18:41:24.713] for (restart in restarts) { [18:41:24.713] name <- restart$name [18:41:24.713] if (is.null(name)) [18:41:24.713] next [18:41:24.713] if (!grepl(pattern, name)) [18:41:24.713] next [18:41:24.713] invokeRestart(restart) [18:41:24.713] muffled <- TRUE [18:41:24.713] break [18:41:24.713] } [18:41:24.713] } [18:41:24.713] } [18:41:24.713] invisible(muffled) [18:41:24.713] } [18:41:24.713] muffleCondition(cond, pattern = "^muffle") [18:41:24.713] } [18:41:24.713] } [18:41:24.713] } [18:41:24.713] })) [18:41:24.713] }, error = function(ex) { [18:41:24.713] base::structure(base::list(value = NULL, visible = NULL, [18:41:24.713] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:24.713] ...future.rng), started = ...future.startTime, [18:41:24.713] finished = Sys.time(), session_uuid = NA_character_, [18:41:24.713] version = "1.8"), class = "FutureResult") [18:41:24.713] }, finally = { [18:41:24.713] if (!identical(...future.workdir, getwd())) [18:41:24.713] setwd(...future.workdir) [18:41:24.713] { [18:41:24.713] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:24.713] ...future.oldOptions$nwarnings <- NULL [18:41:24.713] } [18:41:24.713] base::options(...future.oldOptions) [18:41:24.713] if (.Platform$OS.type == "windows") { [18:41:24.713] old_names <- names(...future.oldEnvVars) [18:41:24.713] envs <- base::Sys.getenv() [18:41:24.713] names <- names(envs) [18:41:24.713] common <- intersect(names, old_names) [18:41:24.713] added <- setdiff(names, old_names) [18:41:24.713] removed <- setdiff(old_names, names) [18:41:24.713] changed <- common[...future.oldEnvVars[common] != [18:41:24.713] envs[common]] [18:41:24.713] NAMES <- toupper(changed) [18:41:24.713] args <- list() [18:41:24.713] for (kk in seq_along(NAMES)) { [18:41:24.713] name <- changed[[kk]] [18:41:24.713] NAME <- NAMES[[kk]] [18:41:24.713] if (name != NAME && is.element(NAME, old_names)) [18:41:24.713] next [18:41:24.713] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:24.713] } [18:41:24.713] NAMES <- toupper(added) [18:41:24.713] for (kk in seq_along(NAMES)) { [18:41:24.713] name <- added[[kk]] [18:41:24.713] NAME <- NAMES[[kk]] [18:41:24.713] if (name != NAME && is.element(NAME, old_names)) [18:41:24.713] next [18:41:24.713] args[[name]] <- "" [18:41:24.713] } [18:41:24.713] NAMES <- toupper(removed) [18:41:24.713] for (kk in seq_along(NAMES)) { [18:41:24.713] name <- removed[[kk]] [18:41:24.713] NAME <- NAMES[[kk]] [18:41:24.713] if (name != NAME && is.element(NAME, old_names)) [18:41:24.713] next [18:41:24.713] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:24.713] } [18:41:24.713] if (length(args) > 0) [18:41:24.713] base::do.call(base::Sys.setenv, args = args) [18:41:24.713] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:24.713] } [18:41:24.713] else { [18:41:24.713] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:24.713] } [18:41:24.713] { [18:41:24.713] if (base::length(...future.futureOptionsAdded) > [18:41:24.713] 0L) { [18:41:24.713] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:24.713] base::names(opts) <- ...future.futureOptionsAdded [18:41:24.713] base::options(opts) [18:41:24.713] } [18:41:24.713] { [18:41:24.713] { [18:41:24.713] base::options(mc.cores = ...future.mc.cores.old) [18:41:24.713] NULL [18:41:24.713] } [18:41:24.713] options(future.plan = NULL) [18:41:24.713] if (is.na(NA_character_)) [18:41:24.713] Sys.unsetenv("R_FUTURE_PLAN") [18:41:24.713] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:24.713] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:24.713] .init = FALSE) [18:41:24.713] } [18:41:24.713] } [18:41:24.713] } [18:41:24.713] }) [18:41:24.713] if (TRUE) { [18:41:24.713] base::sink(type = "output", split = FALSE) [18:41:24.713] if (TRUE) { [18:41:24.713] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:24.713] } [18:41:24.713] else { [18:41:24.713] ...future.result["stdout"] <- base::list(NULL) [18:41:24.713] } [18:41:24.713] base::close(...future.stdout) [18:41:24.713] ...future.stdout <- NULL [18:41:24.713] } [18:41:24.713] ...future.result$conditions <- ...future.conditions [18:41:24.713] ...future.result$finished <- base::Sys.time() [18:41:24.713] ...future.result [18:41:24.713] } [18:41:24.719] Exporting 5 global objects (2.02 KiB) to cluster node #1 ... [18:41:24.719] Exporting '...future.FUN' (911 bytes) to cluster node #1 ... [18:41:24.720] Exporting '...future.FUN' (911 bytes) to cluster node #1 ... DONE [18:41:24.720] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:24.720] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:24.720] Exporting '...future.elements_ii' (569 bytes) to cluster node #1 ... [18:41:24.721] Exporting '...future.elements_ii' (569 bytes) to cluster node #1 ... DONE [18:41:24.721] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:24.722] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:24.722] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:24.722] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:24.722] Exporting 5 global objects (2.02 KiB) to cluster node #1 ... DONE [18:41:24.723] MultisessionFuture started [18:41:24.723] - Launch lazy future ... done [18:41:24.723] run() for 'MultisessionFuture' ... done [18:41:24.724] Created future: [18:41:24.739] receiveMessageFromWorker() for ClusterFuture ... [18:41:24.739] - Validating connection of MultisessionFuture [18:41:24.739] - received message: FutureResult [18:41:24.740] - Received FutureResult [18:41:24.740] - Erased future from FutureRegistry [18:41:24.740] result() for ClusterFuture ... [18:41:24.740] - result already collected: FutureResult [18:41:24.740] result() for ClusterFuture ... done [18:41:24.740] receiveMessageFromWorker() for ClusterFuture ... done [18:41:24.724] MultisessionFuture: [18:41:24.724] Label: 'future_lapply-1' [18:41:24.724] Expression: [18:41:24.724] { [18:41:24.724] do.call(function(...) { [18:41:24.724] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:24.724] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:24.724] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:24.724] on.exit(options(oopts), add = TRUE) [18:41:24.724] } [18:41:24.724] { [18:41:24.724] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:24.724] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:24.724] ...future.FUN(...future.X_jj, ...) [18:41:24.724] }) [18:41:24.724] } [18:41:24.724] }, args = future.call.arguments) [18:41:24.724] } [18:41:24.724] Lazy evaluation: FALSE [18:41:24.724] Asynchronous evaluation: TRUE [18:41:24.724] Local evaluation: TRUE [18:41:24.724] Environment: R_GlobalEnv [18:41:24.724] Capture standard output: TRUE [18:41:24.724] Capture condition classes: 'condition' (excluding 'nothing') [18:41:24.724] Globals: 5 objects totaling 1.59 KiB (function '...future.FUN' of 911 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 569 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:24.724] Packages: 1 packages ('listenv') [18:41:24.724] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:24.724] Resolved: TRUE [18:41:24.724] Value: [18:41:24.724] Conditions captured: [18:41:24.724] Early signaling: FALSE [18:41:24.724] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:24.724] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:24.743] Chunk #1 of 2 ... DONE [18:41:24.743] Chunk #2 of 2 ... [18:41:24.744] - Finding globals in 'X' for chunk #2 ... [18:41:24.744] getGlobalsAndPackages() ... [18:41:24.744] Searching for globals... [18:41:24.745] [18:41:24.745] Searching for globals ... DONE [18:41:24.745] - globals: [0] [18:41:24.745] getGlobalsAndPackages() ... DONE [18:41:24.745] + additional globals found: [n=0] [18:41:24.745] + additional namespaces needed: [n=0] [18:41:24.745] - Finding globals in 'X' for chunk #2 ... DONE [18:41:24.746] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:24.746] - seeds: [18:41:24.746] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:24.746] getGlobalsAndPackages() ... [18:41:24.746] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:24.746] Resolving globals: FALSE [18:41:24.747] Tweak future expression to call with '...' arguments ... [18:41:24.747] { [18:41:24.747] do.call(function(...) { [18:41:24.747] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:24.747] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:24.747] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:24.747] on.exit(options(oopts), add = TRUE) [18:41:24.747] } [18:41:24.747] { [18:41:24.747] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:24.747] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:24.747] ...future.FUN(...future.X_jj, ...) [18:41:24.747] }) [18:41:24.747] } [18:41:24.747] }, args = future.call.arguments) [18:41:24.747] } [18:41:24.747] Tweak future expression to call with '...' arguments ... DONE [18:41:24.748] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:24.748] - packages: [1] 'listenv' [18:41:24.748] getGlobalsAndPackages() ... DONE [18:41:24.748] run() for 'Future' ... [18:41:24.749] - state: 'created' [18:41:24.749] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:24.764] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:24.764] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:24.764] - Field: 'node' [18:41:24.765] - Field: 'label' [18:41:24.765] - Field: 'local' [18:41:24.765] - Field: 'owner' [18:41:24.765] - Field: 'envir' [18:41:24.765] - Field: 'workers' [18:41:24.765] - Field: 'packages' [18:41:24.766] - Field: 'gc' [18:41:24.766] - Field: 'conditions' [18:41:24.766] - Field: 'persistent' [18:41:24.766] - Field: 'expr' [18:41:24.766] - Field: 'uuid' [18:41:24.766] - Field: 'seed' [18:41:24.767] - Field: 'version' [18:41:24.767] - Field: 'result' [18:41:24.767] - Field: 'asynchronous' [18:41:24.767] - Field: 'calls' [18:41:24.767] - Field: 'globals' [18:41:24.767] - Field: 'stdout' [18:41:24.768] - Field: 'earlySignal' [18:41:24.768] - Field: 'lazy' [18:41:24.768] - Field: 'state' [18:41:24.768] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:24.768] - Launch lazy future ... [18:41:24.769] Packages needed by the future expression (n = 1): 'listenv' [18:41:24.769] Packages needed by future strategies (n = 0): [18:41:24.769] { [18:41:24.769] { [18:41:24.769] { [18:41:24.769] ...future.startTime <- base::Sys.time() [18:41:24.769] { [18:41:24.769] { [18:41:24.769] { [18:41:24.769] { [18:41:24.769] { [18:41:24.769] base::local({ [18:41:24.769] has_future <- base::requireNamespace("future", [18:41:24.769] quietly = TRUE) [18:41:24.769] if (has_future) { [18:41:24.769] ns <- base::getNamespace("future") [18:41:24.769] version <- ns[[".package"]][["version"]] [18:41:24.769] if (is.null(version)) [18:41:24.769] version <- utils::packageVersion("future") [18:41:24.769] } [18:41:24.769] else { [18:41:24.769] version <- NULL [18:41:24.769] } [18:41:24.769] if (!has_future || version < "1.8.0") { [18:41:24.769] info <- base::c(r_version = base::gsub("R version ", [18:41:24.769] "", base::R.version$version.string), [18:41:24.769] platform = base::sprintf("%s (%s-bit)", [18:41:24.769] base::R.version$platform, 8 * [18:41:24.769] base::.Machine$sizeof.pointer), [18:41:24.769] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:24.769] "release", "version")], collapse = " "), [18:41:24.769] hostname = base::Sys.info()[["nodename"]]) [18:41:24.769] info <- base::sprintf("%s: %s", base::names(info), [18:41:24.769] info) [18:41:24.769] info <- base::paste(info, collapse = "; ") [18:41:24.769] if (!has_future) { [18:41:24.769] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:24.769] info) [18:41:24.769] } [18:41:24.769] else { [18:41:24.769] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:24.769] info, version) [18:41:24.769] } [18:41:24.769] base::stop(msg) [18:41:24.769] } [18:41:24.769] }) [18:41:24.769] } [18:41:24.769] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:24.769] base::options(mc.cores = 1L) [18:41:24.769] } [18:41:24.769] base::local({ [18:41:24.769] for (pkg in "listenv") { [18:41:24.769] base::loadNamespace(pkg) [18:41:24.769] base::library(pkg, character.only = TRUE) [18:41:24.769] } [18:41:24.769] }) [18:41:24.769] } [18:41:24.769] ...future.strategy.old <- future::plan("list") [18:41:24.769] options(future.plan = NULL) [18:41:24.769] Sys.unsetenv("R_FUTURE_PLAN") [18:41:24.769] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:24.769] } [18:41:24.769] ...future.workdir <- getwd() [18:41:24.769] } [18:41:24.769] ...future.oldOptions <- base::as.list(base::.Options) [18:41:24.769] ...future.oldEnvVars <- base::Sys.getenv() [18:41:24.769] } [18:41:24.769] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:24.769] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:24.769] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:24.769] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:24.769] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:24.769] future.stdout.windows.reencode = NULL, width = 80L) [18:41:24.769] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:24.769] base::names(...future.oldOptions)) [18:41:24.769] } [18:41:24.769] if (FALSE) { [18:41:24.769] } [18:41:24.769] else { [18:41:24.769] if (TRUE) { [18:41:24.769] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:24.769] open = "w") [18:41:24.769] } [18:41:24.769] else { [18:41:24.769] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:24.769] windows = "NUL", "/dev/null"), open = "w") [18:41:24.769] } [18:41:24.769] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:24.769] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:24.769] base::sink(type = "output", split = FALSE) [18:41:24.769] base::close(...future.stdout) [18:41:24.769] }, add = TRUE) [18:41:24.769] } [18:41:24.769] ...future.frame <- base::sys.nframe() [18:41:24.769] ...future.conditions <- base::list() [18:41:24.769] ...future.rng <- base::globalenv()$.Random.seed [18:41:24.769] if (FALSE) { [18:41:24.769] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:24.769] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:24.769] } [18:41:24.769] ...future.result <- base::tryCatch({ [18:41:24.769] base::withCallingHandlers({ [18:41:24.769] ...future.value <- base::withVisible(base::local({ [18:41:24.769] ...future.makeSendCondition <- base::local({ [18:41:24.769] sendCondition <- NULL [18:41:24.769] function(frame = 1L) { [18:41:24.769] if (is.function(sendCondition)) [18:41:24.769] return(sendCondition) [18:41:24.769] ns <- getNamespace("parallel") [18:41:24.769] if (exists("sendData", mode = "function", [18:41:24.769] envir = ns)) { [18:41:24.769] parallel_sendData <- get("sendData", mode = "function", [18:41:24.769] envir = ns) [18:41:24.769] envir <- sys.frame(frame) [18:41:24.769] master <- NULL [18:41:24.769] while (!identical(envir, .GlobalEnv) && [18:41:24.769] !identical(envir, emptyenv())) { [18:41:24.769] if (exists("master", mode = "list", envir = envir, [18:41:24.769] inherits = FALSE)) { [18:41:24.769] master <- get("master", mode = "list", [18:41:24.769] envir = envir, inherits = FALSE) [18:41:24.769] if (inherits(master, c("SOCKnode", [18:41:24.769] "SOCK0node"))) { [18:41:24.769] sendCondition <<- function(cond) { [18:41:24.769] data <- list(type = "VALUE", value = cond, [18:41:24.769] success = TRUE) [18:41:24.769] parallel_sendData(master, data) [18:41:24.769] } [18:41:24.769] return(sendCondition) [18:41:24.769] } [18:41:24.769] } [18:41:24.769] frame <- frame + 1L [18:41:24.769] envir <- sys.frame(frame) [18:41:24.769] } [18:41:24.769] } [18:41:24.769] sendCondition <<- function(cond) NULL [18:41:24.769] } [18:41:24.769] }) [18:41:24.769] withCallingHandlers({ [18:41:24.769] { [18:41:24.769] do.call(function(...) { [18:41:24.769] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:24.769] if (!identical(...future.globals.maxSize.org, [18:41:24.769] ...future.globals.maxSize)) { [18:41:24.769] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:24.769] on.exit(options(oopts), add = TRUE) [18:41:24.769] } [18:41:24.769] { [18:41:24.769] lapply(seq_along(...future.elements_ii), [18:41:24.769] FUN = function(jj) { [18:41:24.769] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:24.769] ...future.FUN(...future.X_jj, ...) [18:41:24.769] }) [18:41:24.769] } [18:41:24.769] }, args = future.call.arguments) [18:41:24.769] } [18:41:24.769] }, immediateCondition = function(cond) { [18:41:24.769] sendCondition <- ...future.makeSendCondition() [18:41:24.769] sendCondition(cond) [18:41:24.769] muffleCondition <- function (cond, pattern = "^muffle") [18:41:24.769] { [18:41:24.769] inherits <- base::inherits [18:41:24.769] invokeRestart <- base::invokeRestart [18:41:24.769] is.null <- base::is.null [18:41:24.769] muffled <- FALSE [18:41:24.769] if (inherits(cond, "message")) { [18:41:24.769] muffled <- grepl(pattern, "muffleMessage") [18:41:24.769] if (muffled) [18:41:24.769] invokeRestart("muffleMessage") [18:41:24.769] } [18:41:24.769] else if (inherits(cond, "warning")) { [18:41:24.769] muffled <- grepl(pattern, "muffleWarning") [18:41:24.769] if (muffled) [18:41:24.769] invokeRestart("muffleWarning") [18:41:24.769] } [18:41:24.769] else if (inherits(cond, "condition")) { [18:41:24.769] if (!is.null(pattern)) { [18:41:24.769] computeRestarts <- base::computeRestarts [18:41:24.769] grepl <- base::grepl [18:41:24.769] restarts <- computeRestarts(cond) [18:41:24.769] for (restart in restarts) { [18:41:24.769] name <- restart$name [18:41:24.769] if (is.null(name)) [18:41:24.769] next [18:41:24.769] if (!grepl(pattern, name)) [18:41:24.769] next [18:41:24.769] invokeRestart(restart) [18:41:24.769] muffled <- TRUE [18:41:24.769] break [18:41:24.769] } [18:41:24.769] } [18:41:24.769] } [18:41:24.769] invisible(muffled) [18:41:24.769] } [18:41:24.769] muffleCondition(cond) [18:41:24.769] }) [18:41:24.769] })) [18:41:24.769] future::FutureResult(value = ...future.value$value, [18:41:24.769] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:24.769] ...future.rng), globalenv = if (FALSE) [18:41:24.769] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:24.769] ...future.globalenv.names)) [18:41:24.769] else NULL, started = ...future.startTime, version = "1.8") [18:41:24.769] }, condition = base::local({ [18:41:24.769] c <- base::c [18:41:24.769] inherits <- base::inherits [18:41:24.769] invokeRestart <- base::invokeRestart [18:41:24.769] length <- base::length [18:41:24.769] list <- base::list [18:41:24.769] seq.int <- base::seq.int [18:41:24.769] signalCondition <- base::signalCondition [18:41:24.769] sys.calls <- base::sys.calls [18:41:24.769] `[[` <- base::`[[` [18:41:24.769] `+` <- base::`+` [18:41:24.769] `<<-` <- base::`<<-` [18:41:24.769] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:24.769] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:24.769] 3L)] [18:41:24.769] } [18:41:24.769] function(cond) { [18:41:24.769] is_error <- inherits(cond, "error") [18:41:24.769] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:24.769] NULL) [18:41:24.769] if (is_error) { [18:41:24.769] sessionInformation <- function() { [18:41:24.769] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:24.769] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:24.769] search = base::search(), system = base::Sys.info()) [18:41:24.769] } [18:41:24.769] ...future.conditions[[length(...future.conditions) + [18:41:24.769] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:24.769] cond$call), session = sessionInformation(), [18:41:24.769] timestamp = base::Sys.time(), signaled = 0L) [18:41:24.769] signalCondition(cond) [18:41:24.769] } [18:41:24.769] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:24.769] "immediateCondition"))) { [18:41:24.769] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:24.769] ...future.conditions[[length(...future.conditions) + [18:41:24.769] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:24.769] if (TRUE && !signal) { [18:41:24.769] muffleCondition <- function (cond, pattern = "^muffle") [18:41:24.769] { [18:41:24.769] inherits <- base::inherits [18:41:24.769] invokeRestart <- base::invokeRestart [18:41:24.769] is.null <- base::is.null [18:41:24.769] muffled <- FALSE [18:41:24.769] if (inherits(cond, "message")) { [18:41:24.769] muffled <- grepl(pattern, "muffleMessage") [18:41:24.769] if (muffled) [18:41:24.769] invokeRestart("muffleMessage") [18:41:24.769] } [18:41:24.769] else if (inherits(cond, "warning")) { [18:41:24.769] muffled <- grepl(pattern, "muffleWarning") [18:41:24.769] if (muffled) [18:41:24.769] invokeRestart("muffleWarning") [18:41:24.769] } [18:41:24.769] else if (inherits(cond, "condition")) { [18:41:24.769] if (!is.null(pattern)) { [18:41:24.769] computeRestarts <- base::computeRestarts [18:41:24.769] grepl <- base::grepl [18:41:24.769] restarts <- computeRestarts(cond) [18:41:24.769] for (restart in restarts) { [18:41:24.769] name <- restart$name [18:41:24.769] if (is.null(name)) [18:41:24.769] next [18:41:24.769] if (!grepl(pattern, name)) [18:41:24.769] next [18:41:24.769] invokeRestart(restart) [18:41:24.769] muffled <- TRUE [18:41:24.769] break [18:41:24.769] } [18:41:24.769] } [18:41:24.769] } [18:41:24.769] invisible(muffled) [18:41:24.769] } [18:41:24.769] muffleCondition(cond, pattern = "^muffle") [18:41:24.769] } [18:41:24.769] } [18:41:24.769] else { [18:41:24.769] if (TRUE) { [18:41:24.769] muffleCondition <- function (cond, pattern = "^muffle") [18:41:24.769] { [18:41:24.769] inherits <- base::inherits [18:41:24.769] invokeRestart <- base::invokeRestart [18:41:24.769] is.null <- base::is.null [18:41:24.769] muffled <- FALSE [18:41:24.769] if (inherits(cond, "message")) { [18:41:24.769] muffled <- grepl(pattern, "muffleMessage") [18:41:24.769] if (muffled) [18:41:24.769] invokeRestart("muffleMessage") [18:41:24.769] } [18:41:24.769] else if (inherits(cond, "warning")) { [18:41:24.769] muffled <- grepl(pattern, "muffleWarning") [18:41:24.769] if (muffled) [18:41:24.769] invokeRestart("muffleWarning") [18:41:24.769] } [18:41:24.769] else if (inherits(cond, "condition")) { [18:41:24.769] if (!is.null(pattern)) { [18:41:24.769] computeRestarts <- base::computeRestarts [18:41:24.769] grepl <- base::grepl [18:41:24.769] restarts <- computeRestarts(cond) [18:41:24.769] for (restart in restarts) { [18:41:24.769] name <- restart$name [18:41:24.769] if (is.null(name)) [18:41:24.769] next [18:41:24.769] if (!grepl(pattern, name)) [18:41:24.769] next [18:41:24.769] invokeRestart(restart) [18:41:24.769] muffled <- TRUE [18:41:24.769] break [18:41:24.769] } [18:41:24.769] } [18:41:24.769] } [18:41:24.769] invisible(muffled) [18:41:24.769] } [18:41:24.769] muffleCondition(cond, pattern = "^muffle") [18:41:24.769] } [18:41:24.769] } [18:41:24.769] } [18:41:24.769] })) [18:41:24.769] }, error = function(ex) { [18:41:24.769] base::structure(base::list(value = NULL, visible = NULL, [18:41:24.769] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:24.769] ...future.rng), started = ...future.startTime, [18:41:24.769] finished = Sys.time(), session_uuid = NA_character_, [18:41:24.769] version = "1.8"), class = "FutureResult") [18:41:24.769] }, finally = { [18:41:24.769] if (!identical(...future.workdir, getwd())) [18:41:24.769] setwd(...future.workdir) [18:41:24.769] { [18:41:24.769] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:24.769] ...future.oldOptions$nwarnings <- NULL [18:41:24.769] } [18:41:24.769] base::options(...future.oldOptions) [18:41:24.769] if (.Platform$OS.type == "windows") { [18:41:24.769] old_names <- names(...future.oldEnvVars) [18:41:24.769] envs <- base::Sys.getenv() [18:41:24.769] names <- names(envs) [18:41:24.769] common <- intersect(names, old_names) [18:41:24.769] added <- setdiff(names, old_names) [18:41:24.769] removed <- setdiff(old_names, names) [18:41:24.769] changed <- common[...future.oldEnvVars[common] != [18:41:24.769] envs[common]] [18:41:24.769] NAMES <- toupper(changed) [18:41:24.769] args <- list() [18:41:24.769] for (kk in seq_along(NAMES)) { [18:41:24.769] name <- changed[[kk]] [18:41:24.769] NAME <- NAMES[[kk]] [18:41:24.769] if (name != NAME && is.element(NAME, old_names)) [18:41:24.769] next [18:41:24.769] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:24.769] } [18:41:24.769] NAMES <- toupper(added) [18:41:24.769] for (kk in seq_along(NAMES)) { [18:41:24.769] name <- added[[kk]] [18:41:24.769] NAME <- NAMES[[kk]] [18:41:24.769] if (name != NAME && is.element(NAME, old_names)) [18:41:24.769] next [18:41:24.769] args[[name]] <- "" [18:41:24.769] } [18:41:24.769] NAMES <- toupper(removed) [18:41:24.769] for (kk in seq_along(NAMES)) { [18:41:24.769] name <- removed[[kk]] [18:41:24.769] NAME <- NAMES[[kk]] [18:41:24.769] if (name != NAME && is.element(NAME, old_names)) [18:41:24.769] next [18:41:24.769] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:24.769] } [18:41:24.769] if (length(args) > 0) [18:41:24.769] base::do.call(base::Sys.setenv, args = args) [18:41:24.769] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:24.769] } [18:41:24.769] else { [18:41:24.769] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:24.769] } [18:41:24.769] { [18:41:24.769] if (base::length(...future.futureOptionsAdded) > [18:41:24.769] 0L) { [18:41:24.769] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:24.769] base::names(opts) <- ...future.futureOptionsAdded [18:41:24.769] base::options(opts) [18:41:24.769] } [18:41:24.769] { [18:41:24.769] { [18:41:24.769] base::options(mc.cores = ...future.mc.cores.old) [18:41:24.769] NULL [18:41:24.769] } [18:41:24.769] options(future.plan = NULL) [18:41:24.769] if (is.na(NA_character_)) [18:41:24.769] Sys.unsetenv("R_FUTURE_PLAN") [18:41:24.769] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:24.769] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:24.769] .init = FALSE) [18:41:24.769] } [18:41:24.769] } [18:41:24.769] } [18:41:24.769] }) [18:41:24.769] if (TRUE) { [18:41:24.769] base::sink(type = "output", split = FALSE) [18:41:24.769] if (TRUE) { [18:41:24.769] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:24.769] } [18:41:24.769] else { [18:41:24.769] ...future.result["stdout"] <- base::list(NULL) [18:41:24.769] } [18:41:24.769] base::close(...future.stdout) [18:41:24.769] ...future.stdout <- NULL [18:41:24.769] } [18:41:24.769] ...future.result$conditions <- ...future.conditions [18:41:24.769] ...future.result$finished <- base::Sys.time() [18:41:24.769] ...future.result [18:41:24.769] } [18:41:24.775] Exporting 5 global objects (4.14 KiB) to cluster node #1 ... [18:41:24.775] Exporting '...future.FUN' (911 bytes) to cluster node #1 ... [18:41:24.776] Exporting '...future.FUN' (911 bytes) to cluster node #1 ... DONE [18:41:24.776] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:24.776] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:24.776] Exporting '...future.elements_ii' (2.67 KiB) to cluster node #1 ... [18:41:24.777] Exporting '...future.elements_ii' (2.67 KiB) to cluster node #1 ... DONE [18:41:24.777] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:24.777] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:24.778] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:24.778] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:24.778] Exporting 5 global objects (4.14 KiB) to cluster node #1 ... DONE [18:41:24.779] MultisessionFuture started [18:41:24.779] - Launch lazy future ... done [18:41:24.779] run() for 'MultisessionFuture' ... done [18:41:24.780] Created future: [18:41:24.797] receiveMessageFromWorker() for ClusterFuture ... [18:41:24.798] - Validating connection of MultisessionFuture [18:41:24.798] - received message: FutureResult [18:41:24.798] - Received FutureResult [18:41:24.798] - Erased future from FutureRegistry [18:41:24.798] result() for ClusterFuture ... [18:41:24.799] - result already collected: FutureResult [18:41:24.799] result() for ClusterFuture ... done [18:41:24.799] receiveMessageFromWorker() for ClusterFuture ... done [18:41:24.780] MultisessionFuture: [18:41:24.780] Label: 'future_lapply-2' [18:41:24.780] Expression: [18:41:24.780] { [18:41:24.780] do.call(function(...) { [18:41:24.780] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:24.780] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:24.780] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:24.780] on.exit(options(oopts), add = TRUE) [18:41:24.780] } [18:41:24.780] { [18:41:24.780] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:24.780] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:24.780] ...future.FUN(...future.X_jj, ...) [18:41:24.780] }) [18:41:24.780] } [18:41:24.780] }, args = future.call.arguments) [18:41:24.780] } [18:41:24.780] Lazy evaluation: FALSE [18:41:24.780] Asynchronous evaluation: TRUE [18:41:24.780] Local evaluation: TRUE [18:41:24.780] Environment: R_GlobalEnv [18:41:24.780] Capture standard output: TRUE [18:41:24.780] Capture condition classes: 'condition' (excluding 'nothing') [18:41:24.780] Globals: 5 objects totaling 3.71 KiB (function '...future.FUN' of 911 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 2.67 KiB, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:24.780] Packages: 1 packages ('listenv') [18:41:24.780] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:24.780] Resolved: TRUE [18:41:24.780] Value: [18:41:24.780] Conditions captured: [18:41:24.780] Early signaling: FALSE [18:41:24.780] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:24.780] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:24.799] Chunk #2 of 2 ... DONE [18:41:24.800] Launching 2 futures (chunks) ... DONE [18:41:24.800] Resolving 2 futures (chunks) ... [18:41:24.800] resolve() on list ... [18:41:24.800] recursive: 0 [18:41:24.800] length: 2 [18:41:24.800] [18:41:24.801] Future #1 [18:41:24.801] result() for ClusterFuture ... [18:41:24.801] - result already collected: FutureResult [18:41:24.801] result() for ClusterFuture ... done [18:41:24.801] result() for ClusterFuture ... [18:41:24.801] - result already collected: FutureResult [18:41:24.801] result() for ClusterFuture ... done [18:41:24.802] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:24.802] - nx: 2 [18:41:24.802] - relay: TRUE [18:41:24.802] - stdout: TRUE [18:41:24.802] - signal: TRUE [18:41:24.802] - resignal: FALSE [18:41:24.803] - force: TRUE [18:41:24.803] - relayed: [n=2] FALSE, FALSE [18:41:24.803] - queued futures: [n=2] FALSE, FALSE [18:41:24.803] - until=1 [18:41:24.803] - relaying element #1 [18:41:24.803] result() for ClusterFuture ... [18:41:24.803] - result already collected: FutureResult [18:41:24.804] result() for ClusterFuture ... done [18:41:24.804] result() for ClusterFuture ... [18:41:24.804] - result already collected: FutureResult [18:41:24.804] result() for ClusterFuture ... done [18:41:24.804] result() for ClusterFuture ... [18:41:24.804] - result already collected: FutureResult [18:41:24.805] result() for ClusterFuture ... done [18:41:24.805] result() for ClusterFuture ... [18:41:24.805] - result already collected: FutureResult [18:41:24.805] result() for ClusterFuture ... done [18:41:24.805] - relayed: [n=2] TRUE, FALSE [18:41:24.805] - queued futures: [n=2] TRUE, FALSE [18:41:24.806] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:24.806] length: 1 (resolved future 1) [18:41:24.806] Future #2 [18:41:24.806] result() for ClusterFuture ... [18:41:24.806] - result already collected: FutureResult [18:41:24.806] result() for ClusterFuture ... done [18:41:24.807] result() for ClusterFuture ... [18:41:24.807] - result already collected: FutureResult [18:41:24.807] result() for ClusterFuture ... done [18:41:24.807] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:24.807] - nx: 2 [18:41:24.807] - relay: TRUE [18:41:24.807] - stdout: TRUE [18:41:24.808] - signal: TRUE [18:41:24.808] - resignal: FALSE [18:41:24.808] - force: TRUE [18:41:24.808] - relayed: [n=2] TRUE, FALSE [18:41:24.808] - queued futures: [n=2] TRUE, FALSE [18:41:24.808] - until=2 [18:41:24.809] - relaying element #2 [18:41:24.809] result() for ClusterFuture ... [18:41:24.809] - result already collected: FutureResult [18:41:24.809] result() for ClusterFuture ... done [18:41:24.809] result() for ClusterFuture ... [18:41:24.809] - result already collected: FutureResult [18:41:24.809] result() for ClusterFuture ... done [18:41:24.810] result() for ClusterFuture ... [18:41:24.810] - result already collected: FutureResult [18:41:24.810] result() for ClusterFuture ... done [18:41:24.810] result() for ClusterFuture ... [18:41:24.810] - result already collected: FutureResult [18:41:24.810] result() for ClusterFuture ... done [18:41:24.811] - relayed: [n=2] TRUE, TRUE [18:41:24.811] - queued futures: [n=2] TRUE, TRUE [18:41:24.811] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:24.811] length: 0 (resolved future 2) [18:41:24.811] Relaying remaining futures [18:41:24.811] signalConditionsASAP(NULL, pos=0) ... [18:41:24.811] - nx: 2 [18:41:24.812] - relay: TRUE [18:41:24.812] - stdout: TRUE [18:41:24.812] - signal: TRUE [18:41:24.812] - resignal: FALSE [18:41:24.812] - force: TRUE [18:41:24.812] - relayed: [n=2] TRUE, TRUE [18:41:24.813] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:24.813] - relayed: [n=2] TRUE, TRUE [18:41:24.813] - queued futures: [n=2] TRUE, TRUE [18:41:24.813] signalConditionsASAP(NULL, pos=0) ... done [18:41:24.813] resolve() on list ... DONE [18:41:24.813] result() for ClusterFuture ... [18:41:24.814] - result already collected: FutureResult [18:41:24.814] result() for ClusterFuture ... done [18:41:24.814] result() for ClusterFuture ... [18:41:24.814] - result already collected: FutureResult [18:41:24.814] result() for ClusterFuture ... done [18:41:24.814] result() for ClusterFuture ... [18:41:24.815] - result already collected: FutureResult [18:41:24.815] result() for ClusterFuture ... done [18:41:24.815] result() for ClusterFuture ... [18:41:24.815] - result already collected: FutureResult [18:41:24.815] result() for ClusterFuture ... done [18:41:24.815] - Number of value chunks collected: 2 [18:41:24.816] Resolving 2 futures (chunks) ... DONE [18:41:24.816] Reducing values from 2 chunks ... [18:41:24.816] - Number of values collected after concatenation: 2 [18:41:24.816] - Number of values expected: 2 [18:41:24.816] Reducing values from 2 chunks ... DONE [18:41:24.816] future_lapply() ... DONE List of 1 $ y:List of 2 ..$ a: Named chr "A" .. ..- attr(*, "names")= chr "A" ..$ b: Named chr [1:2] "A" "B" .. ..- attr(*, "names")= chr [1:2] "A" "B" - future_lapply(x, FUN = vector, ...) ... [18:41:24.818] future_lapply() ... [18:41:24.821] Number of chunks: 2 [18:41:24.822] Index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [18:41:24.822] getGlobalsAndPackagesXApply() ... [18:41:24.822] - future.globals: TRUE [18:41:24.822] getGlobalsAndPackages() ... [18:41:24.822] Searching for globals... [18:41:24.824] - globals found: [2] 'FUN', '.Internal' [18:41:24.824] Searching for globals ... DONE [18:41:24.824] Resolving globals: FALSE [18:41:24.824] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:24.825] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:24.825] - globals: [1] 'FUN' [18:41:24.825] [18:41:24.825] getGlobalsAndPackages() ... DONE [18:41:24.826] - globals found/used: [n=1] 'FUN' [18:41:24.826] - needed namespaces: [n=0] [18:41:24.826] Finding globals ... DONE [18:41:24.826] - use_args: TRUE [18:41:24.826] - Getting '...' globals ... [18:41:24.827] resolve() on list ... [18:41:24.827] recursive: 0 [18:41:24.827] length: 1 [18:41:24.827] elements: '...' [18:41:24.827] length: 0 (resolved future 1) [18:41:24.828] resolve() on list ... DONE [18:41:24.828] - '...' content: [n=1] 'length' [18:41:24.828] List of 1 [18:41:24.828] $ ...:List of 1 [18:41:24.828] ..$ length: int 2 [18:41:24.828] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:24.828] - attr(*, "where")=List of 1 [18:41:24.828] ..$ ...: [18:41:24.828] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:24.828] - attr(*, "resolved")= logi TRUE [18:41:24.828] - attr(*, "total_size")= num NA [18:41:24.831] - Getting '...' globals ... DONE [18:41:24.831] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:24.832] List of 2 [18:41:24.832] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:24.832] $ ... :List of 1 [18:41:24.832] ..$ length: int 2 [18:41:24.832] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:24.832] - attr(*, "where")=List of 2 [18:41:24.832] ..$ ...future.FUN: [18:41:24.832] ..$ ... : [18:41:24.832] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:24.832] - attr(*, "resolved")= logi FALSE [18:41:24.832] - attr(*, "total_size")= int 4338 [18:41:24.835] Packages to be attached in all futures: [n=0] [18:41:24.836] getGlobalsAndPackagesXApply() ... DONE [18:41:24.836] Number of futures (= number of chunks): 2 [18:41:24.836] Launching 2 futures (chunks) ... [18:41:24.836] Chunk #1 of 2 ... [18:41:24.836] - Finding globals in 'X' for chunk #1 ... [18:41:24.837] getGlobalsAndPackages() ... [18:41:24.837] Searching for globals... [18:41:24.837] [18:41:24.837] Searching for globals ... DONE [18:41:24.837] - globals: [0] [18:41:24.837] getGlobalsAndPackages() ... DONE [18:41:24.838] + additional globals found: [n=0] [18:41:24.838] + additional namespaces needed: [n=0] [18:41:24.838] - Finding globals in 'X' for chunk #1 ... DONE [18:41:24.838] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:24.838] - seeds: [18:41:24.838] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:24.839] getGlobalsAndPackages() ... [18:41:24.839] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:24.839] Resolving globals: FALSE [18:41:24.839] Tweak future expression to call with '...' arguments ... [18:41:24.839] { [18:41:24.839] do.call(function(...) { [18:41:24.839] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:24.839] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:24.839] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:24.839] on.exit(options(oopts), add = TRUE) [18:41:24.839] } [18:41:24.839] { [18:41:24.839] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:24.839] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:24.839] ...future.FUN(...future.X_jj, ...) [18:41:24.839] }) [18:41:24.839] } [18:41:24.839] }, args = future.call.arguments) [18:41:24.839] } [18:41:24.840] Tweak future expression to call with '...' arguments ... DONE [18:41:24.840] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:24.840] [18:41:24.841] getGlobalsAndPackages() ... DONE [18:41:24.841] run() for 'Future' ... [18:41:24.841] - state: 'created' [18:41:24.841] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:24.856] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:24.857] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:24.857] - Field: 'node' [18:41:24.857] - Field: 'label' [18:41:24.857] - Field: 'local' [18:41:24.857] - Field: 'owner' [18:41:24.857] - Field: 'envir' [18:41:24.858] - Field: 'workers' [18:41:24.858] - Field: 'packages' [18:41:24.858] - Field: 'gc' [18:41:24.858] - Field: 'conditions' [18:41:24.858] - Field: 'persistent' [18:41:24.858] - Field: 'expr' [18:41:24.859] - Field: 'uuid' [18:41:24.859] - Field: 'seed' [18:41:24.859] - Field: 'version' [18:41:24.859] - Field: 'result' [18:41:24.859] - Field: 'asynchronous' [18:41:24.859] - Field: 'calls' [18:41:24.860] - Field: 'globals' [18:41:24.860] - Field: 'stdout' [18:41:24.860] - Field: 'earlySignal' [18:41:24.860] - Field: 'lazy' [18:41:24.860] - Field: 'state' [18:41:24.861] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:24.861] - Launch lazy future ... [18:41:24.861] Packages needed by the future expression (n = 0): [18:41:24.861] Packages needed by future strategies (n = 0): [18:41:24.862] { [18:41:24.862] { [18:41:24.862] { [18:41:24.862] ...future.startTime <- base::Sys.time() [18:41:24.862] { [18:41:24.862] { [18:41:24.862] { [18:41:24.862] { [18:41:24.862] base::local({ [18:41:24.862] has_future <- base::requireNamespace("future", [18:41:24.862] quietly = TRUE) [18:41:24.862] if (has_future) { [18:41:24.862] ns <- base::getNamespace("future") [18:41:24.862] version <- ns[[".package"]][["version"]] [18:41:24.862] if (is.null(version)) [18:41:24.862] version <- utils::packageVersion("future") [18:41:24.862] } [18:41:24.862] else { [18:41:24.862] version <- NULL [18:41:24.862] } [18:41:24.862] if (!has_future || version < "1.8.0") { [18:41:24.862] info <- base::c(r_version = base::gsub("R version ", [18:41:24.862] "", base::R.version$version.string), [18:41:24.862] platform = base::sprintf("%s (%s-bit)", [18:41:24.862] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:24.862] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:24.862] "release", "version")], collapse = " "), [18:41:24.862] hostname = base::Sys.info()[["nodename"]]) [18:41:24.862] info <- base::sprintf("%s: %s", base::names(info), [18:41:24.862] info) [18:41:24.862] info <- base::paste(info, collapse = "; ") [18:41:24.862] if (!has_future) { [18:41:24.862] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:24.862] info) [18:41:24.862] } [18:41:24.862] else { [18:41:24.862] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:24.862] info, version) [18:41:24.862] } [18:41:24.862] base::stop(msg) [18:41:24.862] } [18:41:24.862] }) [18:41:24.862] } [18:41:24.862] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:24.862] base::options(mc.cores = 1L) [18:41:24.862] } [18:41:24.862] ...future.strategy.old <- future::plan("list") [18:41:24.862] options(future.plan = NULL) [18:41:24.862] Sys.unsetenv("R_FUTURE_PLAN") [18:41:24.862] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:24.862] } [18:41:24.862] ...future.workdir <- getwd() [18:41:24.862] } [18:41:24.862] ...future.oldOptions <- base::as.list(base::.Options) [18:41:24.862] ...future.oldEnvVars <- base::Sys.getenv() [18:41:24.862] } [18:41:24.862] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:24.862] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:24.862] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:24.862] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:24.862] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:24.862] future.stdout.windows.reencode = NULL, width = 80L) [18:41:24.862] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:24.862] base::names(...future.oldOptions)) [18:41:24.862] } [18:41:24.862] if (FALSE) { [18:41:24.862] } [18:41:24.862] else { [18:41:24.862] if (TRUE) { [18:41:24.862] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:24.862] open = "w") [18:41:24.862] } [18:41:24.862] else { [18:41:24.862] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:24.862] windows = "NUL", "/dev/null"), open = "w") [18:41:24.862] } [18:41:24.862] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:24.862] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:24.862] base::sink(type = "output", split = FALSE) [18:41:24.862] base::close(...future.stdout) [18:41:24.862] }, add = TRUE) [18:41:24.862] } [18:41:24.862] ...future.frame <- base::sys.nframe() [18:41:24.862] ...future.conditions <- base::list() [18:41:24.862] ...future.rng <- base::globalenv()$.Random.seed [18:41:24.862] if (FALSE) { [18:41:24.862] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:24.862] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:24.862] } [18:41:24.862] ...future.result <- base::tryCatch({ [18:41:24.862] base::withCallingHandlers({ [18:41:24.862] ...future.value <- base::withVisible(base::local({ [18:41:24.862] ...future.makeSendCondition <- base::local({ [18:41:24.862] sendCondition <- NULL [18:41:24.862] function(frame = 1L) { [18:41:24.862] if (is.function(sendCondition)) [18:41:24.862] return(sendCondition) [18:41:24.862] ns <- getNamespace("parallel") [18:41:24.862] if (exists("sendData", mode = "function", [18:41:24.862] envir = ns)) { [18:41:24.862] parallel_sendData <- get("sendData", mode = "function", [18:41:24.862] envir = ns) [18:41:24.862] envir <- sys.frame(frame) [18:41:24.862] master <- NULL [18:41:24.862] while (!identical(envir, .GlobalEnv) && [18:41:24.862] !identical(envir, emptyenv())) { [18:41:24.862] if (exists("master", mode = "list", envir = envir, [18:41:24.862] inherits = FALSE)) { [18:41:24.862] master <- get("master", mode = "list", [18:41:24.862] envir = envir, inherits = FALSE) [18:41:24.862] if (inherits(master, c("SOCKnode", [18:41:24.862] "SOCK0node"))) { [18:41:24.862] sendCondition <<- function(cond) { [18:41:24.862] data <- list(type = "VALUE", value = cond, [18:41:24.862] success = TRUE) [18:41:24.862] parallel_sendData(master, data) [18:41:24.862] } [18:41:24.862] return(sendCondition) [18:41:24.862] } [18:41:24.862] } [18:41:24.862] frame <- frame + 1L [18:41:24.862] envir <- sys.frame(frame) [18:41:24.862] } [18:41:24.862] } [18:41:24.862] sendCondition <<- function(cond) NULL [18:41:24.862] } [18:41:24.862] }) [18:41:24.862] withCallingHandlers({ [18:41:24.862] { [18:41:24.862] do.call(function(...) { [18:41:24.862] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:24.862] if (!identical(...future.globals.maxSize.org, [18:41:24.862] ...future.globals.maxSize)) { [18:41:24.862] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:24.862] on.exit(options(oopts), add = TRUE) [18:41:24.862] } [18:41:24.862] { [18:41:24.862] lapply(seq_along(...future.elements_ii), [18:41:24.862] FUN = function(jj) { [18:41:24.862] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:24.862] ...future.FUN(...future.X_jj, ...) [18:41:24.862] }) [18:41:24.862] } [18:41:24.862] }, args = future.call.arguments) [18:41:24.862] } [18:41:24.862] }, immediateCondition = function(cond) { [18:41:24.862] sendCondition <- ...future.makeSendCondition() [18:41:24.862] sendCondition(cond) [18:41:24.862] muffleCondition <- function (cond, pattern = "^muffle") [18:41:24.862] { [18:41:24.862] inherits <- base::inherits [18:41:24.862] invokeRestart <- base::invokeRestart [18:41:24.862] is.null <- base::is.null [18:41:24.862] muffled <- FALSE [18:41:24.862] if (inherits(cond, "message")) { [18:41:24.862] muffled <- grepl(pattern, "muffleMessage") [18:41:24.862] if (muffled) [18:41:24.862] invokeRestart("muffleMessage") [18:41:24.862] } [18:41:24.862] else if (inherits(cond, "warning")) { [18:41:24.862] muffled <- grepl(pattern, "muffleWarning") [18:41:24.862] if (muffled) [18:41:24.862] invokeRestart("muffleWarning") [18:41:24.862] } [18:41:24.862] else if (inherits(cond, "condition")) { [18:41:24.862] if (!is.null(pattern)) { [18:41:24.862] computeRestarts <- base::computeRestarts [18:41:24.862] grepl <- base::grepl [18:41:24.862] restarts <- computeRestarts(cond) [18:41:24.862] for (restart in restarts) { [18:41:24.862] name <- restart$name [18:41:24.862] if (is.null(name)) [18:41:24.862] next [18:41:24.862] if (!grepl(pattern, name)) [18:41:24.862] next [18:41:24.862] invokeRestart(restart) [18:41:24.862] muffled <- TRUE [18:41:24.862] break [18:41:24.862] } [18:41:24.862] } [18:41:24.862] } [18:41:24.862] invisible(muffled) [18:41:24.862] } [18:41:24.862] muffleCondition(cond) [18:41:24.862] }) [18:41:24.862] })) [18:41:24.862] future::FutureResult(value = ...future.value$value, [18:41:24.862] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:24.862] ...future.rng), globalenv = if (FALSE) [18:41:24.862] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:24.862] ...future.globalenv.names)) [18:41:24.862] else NULL, started = ...future.startTime, version = "1.8") [18:41:24.862] }, condition = base::local({ [18:41:24.862] c <- base::c [18:41:24.862] inherits <- base::inherits [18:41:24.862] invokeRestart <- base::invokeRestart [18:41:24.862] length <- base::length [18:41:24.862] list <- base::list [18:41:24.862] seq.int <- base::seq.int [18:41:24.862] signalCondition <- base::signalCondition [18:41:24.862] sys.calls <- base::sys.calls [18:41:24.862] `[[` <- base::`[[` [18:41:24.862] `+` <- base::`+` [18:41:24.862] `<<-` <- base::`<<-` [18:41:24.862] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:24.862] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:24.862] 3L)] [18:41:24.862] } [18:41:24.862] function(cond) { [18:41:24.862] is_error <- inherits(cond, "error") [18:41:24.862] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:24.862] NULL) [18:41:24.862] if (is_error) { [18:41:24.862] sessionInformation <- function() { [18:41:24.862] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:24.862] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:24.862] search = base::search(), system = base::Sys.info()) [18:41:24.862] } [18:41:24.862] ...future.conditions[[length(...future.conditions) + [18:41:24.862] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:24.862] cond$call), session = sessionInformation(), [18:41:24.862] timestamp = base::Sys.time(), signaled = 0L) [18:41:24.862] signalCondition(cond) [18:41:24.862] } [18:41:24.862] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:24.862] "immediateCondition"))) { [18:41:24.862] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:24.862] ...future.conditions[[length(...future.conditions) + [18:41:24.862] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:24.862] if (TRUE && !signal) { [18:41:24.862] muffleCondition <- function (cond, pattern = "^muffle") [18:41:24.862] { [18:41:24.862] inherits <- base::inherits [18:41:24.862] invokeRestart <- base::invokeRestart [18:41:24.862] is.null <- base::is.null [18:41:24.862] muffled <- FALSE [18:41:24.862] if (inherits(cond, "message")) { [18:41:24.862] muffled <- grepl(pattern, "muffleMessage") [18:41:24.862] if (muffled) [18:41:24.862] invokeRestart("muffleMessage") [18:41:24.862] } [18:41:24.862] else if (inherits(cond, "warning")) { [18:41:24.862] muffled <- grepl(pattern, "muffleWarning") [18:41:24.862] if (muffled) [18:41:24.862] invokeRestart("muffleWarning") [18:41:24.862] } [18:41:24.862] else if (inherits(cond, "condition")) { [18:41:24.862] if (!is.null(pattern)) { [18:41:24.862] computeRestarts <- base::computeRestarts [18:41:24.862] grepl <- base::grepl [18:41:24.862] restarts <- computeRestarts(cond) [18:41:24.862] for (restart in restarts) { [18:41:24.862] name <- restart$name [18:41:24.862] if (is.null(name)) [18:41:24.862] next [18:41:24.862] if (!grepl(pattern, name)) [18:41:24.862] next [18:41:24.862] invokeRestart(restart) [18:41:24.862] muffled <- TRUE [18:41:24.862] break [18:41:24.862] } [18:41:24.862] } [18:41:24.862] } [18:41:24.862] invisible(muffled) [18:41:24.862] } [18:41:24.862] muffleCondition(cond, pattern = "^muffle") [18:41:24.862] } [18:41:24.862] } [18:41:24.862] else { [18:41:24.862] if (TRUE) { [18:41:24.862] muffleCondition <- function (cond, pattern = "^muffle") [18:41:24.862] { [18:41:24.862] inherits <- base::inherits [18:41:24.862] invokeRestart <- base::invokeRestart [18:41:24.862] is.null <- base::is.null [18:41:24.862] muffled <- FALSE [18:41:24.862] if (inherits(cond, "message")) { [18:41:24.862] muffled <- grepl(pattern, "muffleMessage") [18:41:24.862] if (muffled) [18:41:24.862] invokeRestart("muffleMessage") [18:41:24.862] } [18:41:24.862] else if (inherits(cond, "warning")) { [18:41:24.862] muffled <- grepl(pattern, "muffleWarning") [18:41:24.862] if (muffled) [18:41:24.862] invokeRestart("muffleWarning") [18:41:24.862] } [18:41:24.862] else if (inherits(cond, "condition")) { [18:41:24.862] if (!is.null(pattern)) { [18:41:24.862] computeRestarts <- base::computeRestarts [18:41:24.862] grepl <- base::grepl [18:41:24.862] restarts <- computeRestarts(cond) [18:41:24.862] for (restart in restarts) { [18:41:24.862] name <- restart$name [18:41:24.862] if (is.null(name)) [18:41:24.862] next [18:41:24.862] if (!grepl(pattern, name)) [18:41:24.862] next [18:41:24.862] invokeRestart(restart) [18:41:24.862] muffled <- TRUE [18:41:24.862] break [18:41:24.862] } [18:41:24.862] } [18:41:24.862] } [18:41:24.862] invisible(muffled) [18:41:24.862] } [18:41:24.862] muffleCondition(cond, pattern = "^muffle") [18:41:24.862] } [18:41:24.862] } [18:41:24.862] } [18:41:24.862] })) [18:41:24.862] }, error = function(ex) { [18:41:24.862] base::structure(base::list(value = NULL, visible = NULL, [18:41:24.862] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:24.862] ...future.rng), started = ...future.startTime, [18:41:24.862] finished = Sys.time(), session_uuid = NA_character_, [18:41:24.862] version = "1.8"), class = "FutureResult") [18:41:24.862] }, finally = { [18:41:24.862] if (!identical(...future.workdir, getwd())) [18:41:24.862] setwd(...future.workdir) [18:41:24.862] { [18:41:24.862] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:24.862] ...future.oldOptions$nwarnings <- NULL [18:41:24.862] } [18:41:24.862] base::options(...future.oldOptions) [18:41:24.862] if (.Platform$OS.type == "windows") { [18:41:24.862] old_names <- names(...future.oldEnvVars) [18:41:24.862] envs <- base::Sys.getenv() [18:41:24.862] names <- names(envs) [18:41:24.862] common <- intersect(names, old_names) [18:41:24.862] added <- setdiff(names, old_names) [18:41:24.862] removed <- setdiff(old_names, names) [18:41:24.862] changed <- common[...future.oldEnvVars[common] != [18:41:24.862] envs[common]] [18:41:24.862] NAMES <- toupper(changed) [18:41:24.862] args <- list() [18:41:24.862] for (kk in seq_along(NAMES)) { [18:41:24.862] name <- changed[[kk]] [18:41:24.862] NAME <- NAMES[[kk]] [18:41:24.862] if (name != NAME && is.element(NAME, old_names)) [18:41:24.862] next [18:41:24.862] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:24.862] } [18:41:24.862] NAMES <- toupper(added) [18:41:24.862] for (kk in seq_along(NAMES)) { [18:41:24.862] name <- added[[kk]] [18:41:24.862] NAME <- NAMES[[kk]] [18:41:24.862] if (name != NAME && is.element(NAME, old_names)) [18:41:24.862] next [18:41:24.862] args[[name]] <- "" [18:41:24.862] } [18:41:24.862] NAMES <- toupper(removed) [18:41:24.862] for (kk in seq_along(NAMES)) { [18:41:24.862] name <- removed[[kk]] [18:41:24.862] NAME <- NAMES[[kk]] [18:41:24.862] if (name != NAME && is.element(NAME, old_names)) [18:41:24.862] next [18:41:24.862] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:24.862] } [18:41:24.862] if (length(args) > 0) [18:41:24.862] base::do.call(base::Sys.setenv, args = args) [18:41:24.862] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:24.862] } [18:41:24.862] else { [18:41:24.862] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:24.862] } [18:41:24.862] { [18:41:24.862] if (base::length(...future.futureOptionsAdded) > [18:41:24.862] 0L) { [18:41:24.862] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:24.862] base::names(opts) <- ...future.futureOptionsAdded [18:41:24.862] base::options(opts) [18:41:24.862] } [18:41:24.862] { [18:41:24.862] { [18:41:24.862] base::options(mc.cores = ...future.mc.cores.old) [18:41:24.862] NULL [18:41:24.862] } [18:41:24.862] options(future.plan = NULL) [18:41:24.862] if (is.na(NA_character_)) [18:41:24.862] Sys.unsetenv("R_FUTURE_PLAN") [18:41:24.862] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:24.862] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:24.862] .init = FALSE) [18:41:24.862] } [18:41:24.862] } [18:41:24.862] } [18:41:24.862] }) [18:41:24.862] if (TRUE) { [18:41:24.862] base::sink(type = "output", split = FALSE) [18:41:24.862] if (TRUE) { [18:41:24.862] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:24.862] } [18:41:24.862] else { [18:41:24.862] ...future.result["stdout"] <- base::list(NULL) [18:41:24.862] } [18:41:24.862] base::close(...future.stdout) [18:41:24.862] ...future.stdout <- NULL [18:41:24.862] } [18:41:24.862] ...future.result$conditions <- ...future.conditions [18:41:24.862] ...future.result$finished <- base::Sys.time() [18:41:24.862] ...future.result [18:41:24.862] } [18:41:24.867] Exporting 5 global objects (1.20 KiB) to cluster node #1 ... [18:41:24.867] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... [18:41:24.868] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... DONE [18:41:24.868] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... [18:41:24.868] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... DONE [18:41:24.868] Exporting '...future.elements_ii' (127 bytes) to cluster node #1 ... [18:41:24.869] Exporting '...future.elements_ii' (127 bytes) to cluster node #1 ... DONE [18:41:24.869] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:24.869] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:24.870] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:24.870] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:24.870] Exporting 5 global objects (1.20 KiB) to cluster node #1 ... DONE [18:41:24.871] MultisessionFuture started [18:41:24.871] - Launch lazy future ... done [18:41:24.871] run() for 'MultisessionFuture' ... done [18:41:24.872] Created future: [18:41:24.913] receiveMessageFromWorker() for ClusterFuture ... [18:41:24.913] - Validating connection of MultisessionFuture [18:41:24.914] - received message: FutureResult [18:41:24.914] - Received FutureResult [18:41:24.914] - Erased future from FutureRegistry [18:41:24.914] result() for ClusterFuture ... [18:41:24.914] - result already collected: FutureResult [18:41:24.915] result() for ClusterFuture ... done [18:41:24.915] receiveMessageFromWorker() for ClusterFuture ... done [18:41:24.872] MultisessionFuture: [18:41:24.872] Label: 'future_lapply-1' [18:41:24.872] Expression: [18:41:24.872] { [18:41:24.872] do.call(function(...) { [18:41:24.872] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:24.872] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:24.872] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:24.872] on.exit(options(oopts), add = TRUE) [18:41:24.872] } [18:41:24.872] { [18:41:24.872] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:24.872] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:24.872] ...future.FUN(...future.X_jj, ...) [18:41:24.872] }) [18:41:24.872] } [18:41:24.872] }, args = future.call.arguments) [18:41:24.872] } [18:41:24.872] Lazy evaluation: FALSE [18:41:24.872] Asynchronous evaluation: TRUE [18:41:24.872] Local evaluation: TRUE [18:41:24.872] Environment: R_GlobalEnv [18:41:24.872] Capture standard output: TRUE [18:41:24.872] Capture condition classes: 'condition' (excluding 'nothing') [18:41:24.872] Globals: 5 objects totaling 789 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 127 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:24.872] Packages: [18:41:24.872] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:24.872] Resolved: TRUE [18:41:24.872] Value: [18:41:24.872] Conditions captured: [18:41:24.872] Early signaling: FALSE [18:41:24.872] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:24.872] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:24.915] Chunk #1 of 2 ... DONE [18:41:24.915] Chunk #2 of 2 ... [18:41:24.916] - Finding globals in 'X' for chunk #2 ... [18:41:24.916] getGlobalsAndPackages() ... [18:41:24.916] Searching for globals... [18:41:24.916] [18:41:24.916] Searching for globals ... DONE [18:41:24.917] - globals: [0] [18:41:24.917] getGlobalsAndPackages() ... DONE [18:41:24.917] + additional globals found: [n=0] [18:41:24.917] + additional namespaces needed: [n=0] [18:41:24.917] - Finding globals in 'X' for chunk #2 ... DONE [18:41:24.917] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:24.918] - seeds: [18:41:24.918] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:24.918] getGlobalsAndPackages() ... [18:41:24.918] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:24.918] Resolving globals: FALSE [18:41:24.918] Tweak future expression to call with '...' arguments ... [18:41:24.919] { [18:41:24.919] do.call(function(...) { [18:41:24.919] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:24.919] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:24.919] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:24.919] on.exit(options(oopts), add = TRUE) [18:41:24.919] } [18:41:24.919] { [18:41:24.919] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:24.919] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:24.919] ...future.FUN(...future.X_jj, ...) [18:41:24.919] }) [18:41:24.919] } [18:41:24.919] }, args = future.call.arguments) [18:41:24.919] } [18:41:24.919] Tweak future expression to call with '...' arguments ... DONE [18:41:24.920] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:24.920] [18:41:24.920] getGlobalsAndPackages() ... DONE [18:41:24.920] run() for 'Future' ... [18:41:24.921] - state: 'created' [18:41:24.921] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:24.936] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:24.937] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:24.937] - Field: 'node' [18:41:24.937] - Field: 'label' [18:41:24.937] - Field: 'local' [18:41:24.937] - Field: 'owner' [18:41:24.937] - Field: 'envir' [18:41:24.938] - Field: 'workers' [18:41:24.938] - Field: 'packages' [18:41:24.938] - Field: 'gc' [18:41:24.938] - Field: 'conditions' [18:41:24.938] - Field: 'persistent' [18:41:24.938] - Field: 'expr' [18:41:24.939] - Field: 'uuid' [18:41:24.939] - Field: 'seed' [18:41:24.939] - Field: 'version' [18:41:24.939] - Field: 'result' [18:41:24.939] - Field: 'asynchronous' [18:41:24.940] - Field: 'calls' [18:41:24.940] - Field: 'globals' [18:41:24.940] - Field: 'stdout' [18:41:24.940] - Field: 'earlySignal' [18:41:24.940] - Field: 'lazy' [18:41:24.940] - Field: 'state' [18:41:24.941] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:24.941] - Launch lazy future ... [18:41:24.941] Packages needed by the future expression (n = 0): [18:41:24.941] Packages needed by future strategies (n = 0): [18:41:24.942] { [18:41:24.942] { [18:41:24.942] { [18:41:24.942] ...future.startTime <- base::Sys.time() [18:41:24.942] { [18:41:24.942] { [18:41:24.942] { [18:41:24.942] { [18:41:24.942] base::local({ [18:41:24.942] has_future <- base::requireNamespace("future", [18:41:24.942] quietly = TRUE) [18:41:24.942] if (has_future) { [18:41:24.942] ns <- base::getNamespace("future") [18:41:24.942] version <- ns[[".package"]][["version"]] [18:41:24.942] if (is.null(version)) [18:41:24.942] version <- utils::packageVersion("future") [18:41:24.942] } [18:41:24.942] else { [18:41:24.942] version <- NULL [18:41:24.942] } [18:41:24.942] if (!has_future || version < "1.8.0") { [18:41:24.942] info <- base::c(r_version = base::gsub("R version ", [18:41:24.942] "", base::R.version$version.string), [18:41:24.942] platform = base::sprintf("%s (%s-bit)", [18:41:24.942] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:24.942] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:24.942] "release", "version")], collapse = " "), [18:41:24.942] hostname = base::Sys.info()[["nodename"]]) [18:41:24.942] info <- base::sprintf("%s: %s", base::names(info), [18:41:24.942] info) [18:41:24.942] info <- base::paste(info, collapse = "; ") [18:41:24.942] if (!has_future) { [18:41:24.942] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:24.942] info) [18:41:24.942] } [18:41:24.942] else { [18:41:24.942] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:24.942] info, version) [18:41:24.942] } [18:41:24.942] base::stop(msg) [18:41:24.942] } [18:41:24.942] }) [18:41:24.942] } [18:41:24.942] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:24.942] base::options(mc.cores = 1L) [18:41:24.942] } [18:41:24.942] ...future.strategy.old <- future::plan("list") [18:41:24.942] options(future.plan = NULL) [18:41:24.942] Sys.unsetenv("R_FUTURE_PLAN") [18:41:24.942] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:24.942] } [18:41:24.942] ...future.workdir <- getwd() [18:41:24.942] } [18:41:24.942] ...future.oldOptions <- base::as.list(base::.Options) [18:41:24.942] ...future.oldEnvVars <- base::Sys.getenv() [18:41:24.942] } [18:41:24.942] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:24.942] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:24.942] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:24.942] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:24.942] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:24.942] future.stdout.windows.reencode = NULL, width = 80L) [18:41:24.942] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:24.942] base::names(...future.oldOptions)) [18:41:24.942] } [18:41:24.942] if (FALSE) { [18:41:24.942] } [18:41:24.942] else { [18:41:24.942] if (TRUE) { [18:41:24.942] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:24.942] open = "w") [18:41:24.942] } [18:41:24.942] else { [18:41:24.942] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:24.942] windows = "NUL", "/dev/null"), open = "w") [18:41:24.942] } [18:41:24.942] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:24.942] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:24.942] base::sink(type = "output", split = FALSE) [18:41:24.942] base::close(...future.stdout) [18:41:24.942] }, add = TRUE) [18:41:24.942] } [18:41:24.942] ...future.frame <- base::sys.nframe() [18:41:24.942] ...future.conditions <- base::list() [18:41:24.942] ...future.rng <- base::globalenv()$.Random.seed [18:41:24.942] if (FALSE) { [18:41:24.942] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:24.942] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:24.942] } [18:41:24.942] ...future.result <- base::tryCatch({ [18:41:24.942] base::withCallingHandlers({ [18:41:24.942] ...future.value <- base::withVisible(base::local({ [18:41:24.942] ...future.makeSendCondition <- base::local({ [18:41:24.942] sendCondition <- NULL [18:41:24.942] function(frame = 1L) { [18:41:24.942] if (is.function(sendCondition)) [18:41:24.942] return(sendCondition) [18:41:24.942] ns <- getNamespace("parallel") [18:41:24.942] if (exists("sendData", mode = "function", [18:41:24.942] envir = ns)) { [18:41:24.942] parallel_sendData <- get("sendData", mode = "function", [18:41:24.942] envir = ns) [18:41:24.942] envir <- sys.frame(frame) [18:41:24.942] master <- NULL [18:41:24.942] while (!identical(envir, .GlobalEnv) && [18:41:24.942] !identical(envir, emptyenv())) { [18:41:24.942] if (exists("master", mode = "list", envir = envir, [18:41:24.942] inherits = FALSE)) { [18:41:24.942] master <- get("master", mode = "list", [18:41:24.942] envir = envir, inherits = FALSE) [18:41:24.942] if (inherits(master, c("SOCKnode", [18:41:24.942] "SOCK0node"))) { [18:41:24.942] sendCondition <<- function(cond) { [18:41:24.942] data <- list(type = "VALUE", value = cond, [18:41:24.942] success = TRUE) [18:41:24.942] parallel_sendData(master, data) [18:41:24.942] } [18:41:24.942] return(sendCondition) [18:41:24.942] } [18:41:24.942] } [18:41:24.942] frame <- frame + 1L [18:41:24.942] envir <- sys.frame(frame) [18:41:24.942] } [18:41:24.942] } [18:41:24.942] sendCondition <<- function(cond) NULL [18:41:24.942] } [18:41:24.942] }) [18:41:24.942] withCallingHandlers({ [18:41:24.942] { [18:41:24.942] do.call(function(...) { [18:41:24.942] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:24.942] if (!identical(...future.globals.maxSize.org, [18:41:24.942] ...future.globals.maxSize)) { [18:41:24.942] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:24.942] on.exit(options(oopts), add = TRUE) [18:41:24.942] } [18:41:24.942] { [18:41:24.942] lapply(seq_along(...future.elements_ii), [18:41:24.942] FUN = function(jj) { [18:41:24.942] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:24.942] ...future.FUN(...future.X_jj, ...) [18:41:24.942] }) [18:41:24.942] } [18:41:24.942] }, args = future.call.arguments) [18:41:24.942] } [18:41:24.942] }, immediateCondition = function(cond) { [18:41:24.942] sendCondition <- ...future.makeSendCondition() [18:41:24.942] sendCondition(cond) [18:41:24.942] muffleCondition <- function (cond, pattern = "^muffle") [18:41:24.942] { [18:41:24.942] inherits <- base::inherits [18:41:24.942] invokeRestart <- base::invokeRestart [18:41:24.942] is.null <- base::is.null [18:41:24.942] muffled <- FALSE [18:41:24.942] if (inherits(cond, "message")) { [18:41:24.942] muffled <- grepl(pattern, "muffleMessage") [18:41:24.942] if (muffled) [18:41:24.942] invokeRestart("muffleMessage") [18:41:24.942] } [18:41:24.942] else if (inherits(cond, "warning")) { [18:41:24.942] muffled <- grepl(pattern, "muffleWarning") [18:41:24.942] if (muffled) [18:41:24.942] invokeRestart("muffleWarning") [18:41:24.942] } [18:41:24.942] else if (inherits(cond, "condition")) { [18:41:24.942] if (!is.null(pattern)) { [18:41:24.942] computeRestarts <- base::computeRestarts [18:41:24.942] grepl <- base::grepl [18:41:24.942] restarts <- computeRestarts(cond) [18:41:24.942] for (restart in restarts) { [18:41:24.942] name <- restart$name [18:41:24.942] if (is.null(name)) [18:41:24.942] next [18:41:24.942] if (!grepl(pattern, name)) [18:41:24.942] next [18:41:24.942] invokeRestart(restart) [18:41:24.942] muffled <- TRUE [18:41:24.942] break [18:41:24.942] } [18:41:24.942] } [18:41:24.942] } [18:41:24.942] invisible(muffled) [18:41:24.942] } [18:41:24.942] muffleCondition(cond) [18:41:24.942] }) [18:41:24.942] })) [18:41:24.942] future::FutureResult(value = ...future.value$value, [18:41:24.942] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:24.942] ...future.rng), globalenv = if (FALSE) [18:41:24.942] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:24.942] ...future.globalenv.names)) [18:41:24.942] else NULL, started = ...future.startTime, version = "1.8") [18:41:24.942] }, condition = base::local({ [18:41:24.942] c <- base::c [18:41:24.942] inherits <- base::inherits [18:41:24.942] invokeRestart <- base::invokeRestart [18:41:24.942] length <- base::length [18:41:24.942] list <- base::list [18:41:24.942] seq.int <- base::seq.int [18:41:24.942] signalCondition <- base::signalCondition [18:41:24.942] sys.calls <- base::sys.calls [18:41:24.942] `[[` <- base::`[[` [18:41:24.942] `+` <- base::`+` [18:41:24.942] `<<-` <- base::`<<-` [18:41:24.942] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:24.942] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:24.942] 3L)] [18:41:24.942] } [18:41:24.942] function(cond) { [18:41:24.942] is_error <- inherits(cond, "error") [18:41:24.942] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:24.942] NULL) [18:41:24.942] if (is_error) { [18:41:24.942] sessionInformation <- function() { [18:41:24.942] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:24.942] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:24.942] search = base::search(), system = base::Sys.info()) [18:41:24.942] } [18:41:24.942] ...future.conditions[[length(...future.conditions) + [18:41:24.942] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:24.942] cond$call), session = sessionInformation(), [18:41:24.942] timestamp = base::Sys.time(), signaled = 0L) [18:41:24.942] signalCondition(cond) [18:41:24.942] } [18:41:24.942] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:24.942] "immediateCondition"))) { [18:41:24.942] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:24.942] ...future.conditions[[length(...future.conditions) + [18:41:24.942] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:24.942] if (TRUE && !signal) { [18:41:24.942] muffleCondition <- function (cond, pattern = "^muffle") [18:41:24.942] { [18:41:24.942] inherits <- base::inherits [18:41:24.942] invokeRestart <- base::invokeRestart [18:41:24.942] is.null <- base::is.null [18:41:24.942] muffled <- FALSE [18:41:24.942] if (inherits(cond, "message")) { [18:41:24.942] muffled <- grepl(pattern, "muffleMessage") [18:41:24.942] if (muffled) [18:41:24.942] invokeRestart("muffleMessage") [18:41:24.942] } [18:41:24.942] else if (inherits(cond, "warning")) { [18:41:24.942] muffled <- grepl(pattern, "muffleWarning") [18:41:24.942] if (muffled) [18:41:24.942] invokeRestart("muffleWarning") [18:41:24.942] } [18:41:24.942] else if (inherits(cond, "condition")) { [18:41:24.942] if (!is.null(pattern)) { [18:41:24.942] computeRestarts <- base::computeRestarts [18:41:24.942] grepl <- base::grepl [18:41:24.942] restarts <- computeRestarts(cond) [18:41:24.942] for (restart in restarts) { [18:41:24.942] name <- restart$name [18:41:24.942] if (is.null(name)) [18:41:24.942] next [18:41:24.942] if (!grepl(pattern, name)) [18:41:24.942] next [18:41:24.942] invokeRestart(restart) [18:41:24.942] muffled <- TRUE [18:41:24.942] break [18:41:24.942] } [18:41:24.942] } [18:41:24.942] } [18:41:24.942] invisible(muffled) [18:41:24.942] } [18:41:24.942] muffleCondition(cond, pattern = "^muffle") [18:41:24.942] } [18:41:24.942] } [18:41:24.942] else { [18:41:24.942] if (TRUE) { [18:41:24.942] muffleCondition <- function (cond, pattern = "^muffle") [18:41:24.942] { [18:41:24.942] inherits <- base::inherits [18:41:24.942] invokeRestart <- base::invokeRestart [18:41:24.942] is.null <- base::is.null [18:41:24.942] muffled <- FALSE [18:41:24.942] if (inherits(cond, "message")) { [18:41:24.942] muffled <- grepl(pattern, "muffleMessage") [18:41:24.942] if (muffled) [18:41:24.942] invokeRestart("muffleMessage") [18:41:24.942] } [18:41:24.942] else if (inherits(cond, "warning")) { [18:41:24.942] muffled <- grepl(pattern, "muffleWarning") [18:41:24.942] if (muffled) [18:41:24.942] invokeRestart("muffleWarning") [18:41:24.942] } [18:41:24.942] else if (inherits(cond, "condition")) { [18:41:24.942] if (!is.null(pattern)) { [18:41:24.942] computeRestarts <- base::computeRestarts [18:41:24.942] grepl <- base::grepl [18:41:24.942] restarts <- computeRestarts(cond) [18:41:24.942] for (restart in restarts) { [18:41:24.942] name <- restart$name [18:41:24.942] if (is.null(name)) [18:41:24.942] next [18:41:24.942] if (!grepl(pattern, name)) [18:41:24.942] next [18:41:24.942] invokeRestart(restart) [18:41:24.942] muffled <- TRUE [18:41:24.942] break [18:41:24.942] } [18:41:24.942] } [18:41:24.942] } [18:41:24.942] invisible(muffled) [18:41:24.942] } [18:41:24.942] muffleCondition(cond, pattern = "^muffle") [18:41:24.942] } [18:41:24.942] } [18:41:24.942] } [18:41:24.942] })) [18:41:24.942] }, error = function(ex) { [18:41:24.942] base::structure(base::list(value = NULL, visible = NULL, [18:41:24.942] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:24.942] ...future.rng), started = ...future.startTime, [18:41:24.942] finished = Sys.time(), session_uuid = NA_character_, [18:41:24.942] version = "1.8"), class = "FutureResult") [18:41:24.942] }, finally = { [18:41:24.942] if (!identical(...future.workdir, getwd())) [18:41:24.942] setwd(...future.workdir) [18:41:24.942] { [18:41:24.942] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:24.942] ...future.oldOptions$nwarnings <- NULL [18:41:24.942] } [18:41:24.942] base::options(...future.oldOptions) [18:41:24.942] if (.Platform$OS.type == "windows") { [18:41:24.942] old_names <- names(...future.oldEnvVars) [18:41:24.942] envs <- base::Sys.getenv() [18:41:24.942] names <- names(envs) [18:41:24.942] common <- intersect(names, old_names) [18:41:24.942] added <- setdiff(names, old_names) [18:41:24.942] removed <- setdiff(old_names, names) [18:41:24.942] changed <- common[...future.oldEnvVars[common] != [18:41:24.942] envs[common]] [18:41:24.942] NAMES <- toupper(changed) [18:41:24.942] args <- list() [18:41:24.942] for (kk in seq_along(NAMES)) { [18:41:24.942] name <- changed[[kk]] [18:41:24.942] NAME <- NAMES[[kk]] [18:41:24.942] if (name != NAME && is.element(NAME, old_names)) [18:41:24.942] next [18:41:24.942] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:24.942] } [18:41:24.942] NAMES <- toupper(added) [18:41:24.942] for (kk in seq_along(NAMES)) { [18:41:24.942] name <- added[[kk]] [18:41:24.942] NAME <- NAMES[[kk]] [18:41:24.942] if (name != NAME && is.element(NAME, old_names)) [18:41:24.942] next [18:41:24.942] args[[name]] <- "" [18:41:24.942] } [18:41:24.942] NAMES <- toupper(removed) [18:41:24.942] for (kk in seq_along(NAMES)) { [18:41:24.942] name <- removed[[kk]] [18:41:24.942] NAME <- NAMES[[kk]] [18:41:24.942] if (name != NAME && is.element(NAME, old_names)) [18:41:24.942] next [18:41:24.942] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:24.942] } [18:41:24.942] if (length(args) > 0) [18:41:24.942] base::do.call(base::Sys.setenv, args = args) [18:41:24.942] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:24.942] } [18:41:24.942] else { [18:41:24.942] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:24.942] } [18:41:24.942] { [18:41:24.942] if (base::length(...future.futureOptionsAdded) > [18:41:24.942] 0L) { [18:41:24.942] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:24.942] base::names(opts) <- ...future.futureOptionsAdded [18:41:24.942] base::options(opts) [18:41:24.942] } [18:41:24.942] { [18:41:24.942] { [18:41:24.942] base::options(mc.cores = ...future.mc.cores.old) [18:41:24.942] NULL [18:41:24.942] } [18:41:24.942] options(future.plan = NULL) [18:41:24.942] if (is.na(NA_character_)) [18:41:24.942] Sys.unsetenv("R_FUTURE_PLAN") [18:41:24.942] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:24.942] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:24.942] .init = FALSE) [18:41:24.942] } [18:41:24.942] } [18:41:24.942] } [18:41:24.942] }) [18:41:24.942] if (TRUE) { [18:41:24.942] base::sink(type = "output", split = FALSE) [18:41:24.942] if (TRUE) { [18:41:24.942] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:24.942] } [18:41:24.942] else { [18:41:24.942] ...future.result["stdout"] <- base::list(NULL) [18:41:24.942] } [18:41:24.942] base::close(...future.stdout) [18:41:24.942] ...future.stdout <- NULL [18:41:24.942] } [18:41:24.942] ...future.result$conditions <- ...future.conditions [18:41:24.942] ...future.result$finished <- base::Sys.time() [18:41:24.942] ...future.result [18:41:24.942] } [18:41:24.948] Exporting 5 global objects (1.20 KiB) to cluster node #1 ... [18:41:24.948] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... [18:41:24.948] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... DONE [18:41:24.948] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... [18:41:24.949] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... DONE [18:41:24.949] Exporting '...future.elements_ii' (128 bytes) to cluster node #1 ... [18:41:24.949] Exporting '...future.elements_ii' (128 bytes) to cluster node #1 ... DONE [18:41:24.950] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:24.950] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:24.950] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:24.951] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:24.951] Exporting 5 global objects (1.20 KiB) to cluster node #1 ... DONE [18:41:24.952] MultisessionFuture started [18:41:24.952] - Launch lazy future ... done [18:41:24.952] run() for 'MultisessionFuture' ... done [18:41:24.953] Created future: [18:41:24.968] receiveMessageFromWorker() for ClusterFuture ... [18:41:24.968] - Validating connection of MultisessionFuture [18:41:24.969] - received message: FutureResult [18:41:24.969] - Received FutureResult [18:41:24.969] - Erased future from FutureRegistry [18:41:24.969] result() for ClusterFuture ... [18:41:24.970] - result already collected: FutureResult [18:41:24.970] result() for ClusterFuture ... done [18:41:24.970] receiveMessageFromWorker() for ClusterFuture ... done [18:41:24.953] MultisessionFuture: [18:41:24.953] Label: 'future_lapply-2' [18:41:24.953] Expression: [18:41:24.953] { [18:41:24.953] do.call(function(...) { [18:41:24.953] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:24.953] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:24.953] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:24.953] on.exit(options(oopts), add = TRUE) [18:41:24.953] } [18:41:24.953] { [18:41:24.953] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:24.953] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:24.953] ...future.FUN(...future.X_jj, ...) [18:41:24.953] }) [18:41:24.953] } [18:41:24.953] }, args = future.call.arguments) [18:41:24.953] } [18:41:24.953] Lazy evaluation: FALSE [18:41:24.953] Asynchronous evaluation: TRUE [18:41:24.953] Local evaluation: TRUE [18:41:24.953] Environment: R_GlobalEnv [18:41:24.953] Capture standard output: TRUE [18:41:24.953] Capture condition classes: 'condition' (excluding 'nothing') [18:41:24.953] Globals: 5 objects totaling 790 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 128 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:24.953] Packages: [18:41:24.953] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:24.953] Resolved: TRUE [18:41:24.953] Value: [18:41:24.953] Conditions captured: [18:41:24.953] Early signaling: FALSE [18:41:24.953] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:24.953] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:24.970] Chunk #2 of 2 ... DONE [18:41:24.970] Launching 2 futures (chunks) ... DONE [18:41:24.971] Resolving 2 futures (chunks) ... [18:41:24.971] resolve() on list ... [18:41:24.971] recursive: 0 [18:41:24.971] length: 2 [18:41:24.971] [18:41:24.971] Future #1 [18:41:24.972] result() for ClusterFuture ... [18:41:24.972] - result already collected: FutureResult [18:41:24.972] result() for ClusterFuture ... done [18:41:24.972] result() for ClusterFuture ... [18:41:24.972] - result already collected: FutureResult [18:41:24.972] result() for ClusterFuture ... done [18:41:24.973] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:24.973] - nx: 2 [18:41:24.973] - relay: TRUE [18:41:24.973] - stdout: TRUE [18:41:24.973] - signal: TRUE [18:41:24.973] - resignal: FALSE [18:41:24.973] - force: TRUE [18:41:24.974] - relayed: [n=2] FALSE, FALSE [18:41:24.974] - queued futures: [n=2] FALSE, FALSE [18:41:24.974] - until=1 [18:41:24.974] - relaying element #1 [18:41:24.974] result() for ClusterFuture ... [18:41:24.974] - result already collected: FutureResult [18:41:24.975] result() for ClusterFuture ... done [18:41:24.977] result() for ClusterFuture ... [18:41:24.978] - result already collected: FutureResult [18:41:24.978] result() for ClusterFuture ... done [18:41:24.978] result() for ClusterFuture ... [18:41:24.978] - result already collected: FutureResult [18:41:24.978] result() for ClusterFuture ... done [18:41:24.978] result() for ClusterFuture ... [18:41:24.979] - result already collected: FutureResult [18:41:24.979] result() for ClusterFuture ... done [18:41:24.979] - relayed: [n=2] TRUE, FALSE [18:41:24.979] - queued futures: [n=2] TRUE, FALSE [18:41:24.979] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:24.979] length: 1 (resolved future 1) [18:41:24.980] Future #2 [18:41:24.980] result() for ClusterFuture ... [18:41:24.980] - result already collected: FutureResult [18:41:24.980] result() for ClusterFuture ... done [18:41:24.980] result() for ClusterFuture ... [18:41:24.980] - result already collected: FutureResult [18:41:24.980] result() for ClusterFuture ... done [18:41:24.981] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:24.981] - nx: 2 [18:41:24.981] - relay: TRUE [18:41:24.981] - stdout: TRUE [18:41:24.981] - signal: TRUE [18:41:24.981] - resignal: FALSE [18:41:24.981] - force: TRUE [18:41:24.982] - relayed: [n=2] TRUE, FALSE [18:41:24.982] - queued futures: [n=2] TRUE, FALSE [18:41:24.982] - until=2 [18:41:24.982] - relaying element #2 [18:41:24.982] result() for ClusterFuture ... [18:41:24.982] - result already collected: FutureResult [18:41:24.983] result() for ClusterFuture ... done [18:41:24.983] result() for ClusterFuture ... [18:41:24.983] - result already collected: FutureResult [18:41:24.983] result() for ClusterFuture ... done [18:41:24.983] result() for ClusterFuture ... [18:41:24.983] - result already collected: FutureResult [18:41:24.984] result() for ClusterFuture ... done [18:41:24.984] result() for ClusterFuture ... [18:41:24.984] - result already collected: FutureResult [18:41:24.984] result() for ClusterFuture ... done [18:41:24.984] - relayed: [n=2] TRUE, TRUE [18:41:24.984] - queued futures: [n=2] TRUE, TRUE [18:41:24.984] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:24.985] length: 0 (resolved future 2) [18:41:24.985] Relaying remaining futures [18:41:24.985] signalConditionsASAP(NULL, pos=0) ... [18:41:24.985] - nx: 2 [18:41:24.985] - relay: TRUE [18:41:24.985] - stdout: TRUE [18:41:24.986] - signal: TRUE [18:41:24.986] - resignal: FALSE [18:41:24.986] - force: TRUE [18:41:24.986] - relayed: [n=2] TRUE, TRUE [18:41:24.986] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:24.987] - relayed: [n=2] TRUE, TRUE [18:41:24.987] - queued futures: [n=2] TRUE, TRUE [18:41:24.987] signalConditionsASAP(NULL, pos=0) ... done [18:41:24.987] resolve() on list ... DONE [18:41:24.987] result() for ClusterFuture ... [18:41:24.987] - result already collected: FutureResult [18:41:24.987] result() for ClusterFuture ... done [18:41:24.988] result() for ClusterFuture ... [18:41:24.988] - result already collected: FutureResult [18:41:24.988] result() for ClusterFuture ... done [18:41:24.988] result() for ClusterFuture ... [18:41:24.988] - result already collected: FutureResult [18:41:24.988] result() for ClusterFuture ... done [18:41:24.989] result() for ClusterFuture ... [18:41:24.989] - result already collected: FutureResult [18:41:24.989] result() for ClusterFuture ... done [18:41:24.989] - Number of value chunks collected: 2 [18:41:24.989] Resolving 2 futures (chunks) ... DONE [18:41:24.989] Reducing values from 2 chunks ... [18:41:24.990] - Number of values collected after concatenation: 4 [18:41:24.990] - Number of values expected: 4 [18:41:24.990] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [18:41:24.990] Reducing values from 2 chunks ... DONE [18:41:24.990] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL [18:41:24.993] future_lapply() ... [18:41:24.996] Number of chunks: 2 [18:41:24.996] Index remapping (attribute 'ordering'): [n = 4] 2, 1, 3, 4 [18:41:24.996] getGlobalsAndPackagesXApply() ... [18:41:24.997] - future.globals: TRUE [18:41:24.997] getGlobalsAndPackages() ... [18:41:24.997] Searching for globals... [18:41:24.998] - globals found: [2] 'FUN', '.Internal' [18:41:24.999] Searching for globals ... DONE [18:41:24.999] Resolving globals: FALSE [18:41:24.999] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:25.000] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:25.000] - globals: [1] 'FUN' [18:41:25.000] [18:41:25.000] getGlobalsAndPackages() ... DONE [18:41:25.000] - globals found/used: [n=1] 'FUN' [18:41:25.001] - needed namespaces: [n=0] [18:41:25.001] Finding globals ... DONE [18:41:25.001] - use_args: TRUE [18:41:25.001] - Getting '...' globals ... [18:41:25.002] resolve() on list ... [18:41:25.002] recursive: 0 [18:41:25.002] length: 1 [18:41:25.002] elements: '...' [18:41:25.002] length: 0 (resolved future 1) [18:41:25.002] resolve() on list ... DONE [18:41:25.003] - '...' content: [n=1] 'length' [18:41:25.003] List of 1 [18:41:25.003] $ ...:List of 1 [18:41:25.003] ..$ length: int 2 [18:41:25.003] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:25.003] - attr(*, "where")=List of 1 [18:41:25.003] ..$ ...: [18:41:25.003] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:25.003] - attr(*, "resolved")= logi TRUE [18:41:25.003] - attr(*, "total_size")= num NA [18:41:25.006] - Getting '...' globals ... DONE [18:41:25.006] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:25.007] List of 2 [18:41:25.007] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:25.007] $ ... :List of 1 [18:41:25.007] ..$ length: int 2 [18:41:25.007] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:25.007] - attr(*, "where")=List of 2 [18:41:25.007] ..$ ...future.FUN: [18:41:25.007] ..$ ... : [18:41:25.007] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:25.007] - attr(*, "resolved")= logi FALSE [18:41:25.007] - attr(*, "total_size")= int 4374 [18:41:25.010] Packages to be attached in all futures: [n=0] [18:41:25.011] getGlobalsAndPackagesXApply() ... DONE [18:41:25.011] Number of futures (= number of chunks): 2 [18:41:25.011] Launching 2 futures (chunks) ... [18:41:25.011] Chunk #1 of 2 ... [18:41:25.011] - Finding globals in 'X' for chunk #1 ... [18:41:25.012] getGlobalsAndPackages() ... [18:41:25.012] Searching for globals... [18:41:25.012] [18:41:25.012] Searching for globals ... DONE [18:41:25.012] - globals: [0] [18:41:25.013] getGlobalsAndPackages() ... DONE [18:41:25.013] + additional globals found: [n=0] [18:41:25.013] + additional namespaces needed: [n=0] [18:41:25.013] - Finding globals in 'X' for chunk #1 ... DONE [18:41:25.013] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:25.013] - seeds: [18:41:25.014] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:25.014] getGlobalsAndPackages() ... [18:41:25.014] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:25.014] Resolving globals: FALSE [18:41:25.014] Tweak future expression to call with '...' arguments ... [18:41:25.014] { [18:41:25.014] do.call(function(...) { [18:41:25.014] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:25.014] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:25.014] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:25.014] on.exit(options(oopts), add = TRUE) [18:41:25.014] } [18:41:25.014] { [18:41:25.014] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:25.014] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:25.014] ...future.FUN(...future.X_jj, ...) [18:41:25.014] }) [18:41:25.014] } [18:41:25.014] }, args = future.call.arguments) [18:41:25.014] } [18:41:25.015] Tweak future expression to call with '...' arguments ... DONE [18:41:25.015] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:25.016] [18:41:25.016] getGlobalsAndPackages() ... DONE [18:41:25.016] run() for 'Future' ... [18:41:25.016] - state: 'created' [18:41:25.017] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:25.032] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:25.032] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:25.032] - Field: 'node' [18:41:25.033] - Field: 'label' [18:41:25.033] - Field: 'local' [18:41:25.033] - Field: 'owner' [18:41:25.033] - Field: 'envir' [18:41:25.033] - Field: 'workers' [18:41:25.033] - Field: 'packages' [18:41:25.034] - Field: 'gc' [18:41:25.034] - Field: 'conditions' [18:41:25.034] - Field: 'persistent' [18:41:25.034] - Field: 'expr' [18:41:25.034] - Field: 'uuid' [18:41:25.034] - Field: 'seed' [18:41:25.035] - Field: 'version' [18:41:25.035] - Field: 'result' [18:41:25.035] - Field: 'asynchronous' [18:41:25.035] - Field: 'calls' [18:41:25.035] - Field: 'globals' [18:41:25.036] - Field: 'stdout' [18:41:25.036] - Field: 'earlySignal' [18:41:25.036] - Field: 'lazy' [18:41:25.036] - Field: 'state' [18:41:25.036] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:25.036] - Launch lazy future ... [18:41:25.037] Packages needed by the future expression (n = 0): [18:41:25.037] Packages needed by future strategies (n = 0): [18:41:25.037] { [18:41:25.037] { [18:41:25.037] { [18:41:25.037] ...future.startTime <- base::Sys.time() [18:41:25.037] { [18:41:25.037] { [18:41:25.037] { [18:41:25.037] { [18:41:25.037] base::local({ [18:41:25.037] has_future <- base::requireNamespace("future", [18:41:25.037] quietly = TRUE) [18:41:25.037] if (has_future) { [18:41:25.037] ns <- base::getNamespace("future") [18:41:25.037] version <- ns[[".package"]][["version"]] [18:41:25.037] if (is.null(version)) [18:41:25.037] version <- utils::packageVersion("future") [18:41:25.037] } [18:41:25.037] else { [18:41:25.037] version <- NULL [18:41:25.037] } [18:41:25.037] if (!has_future || version < "1.8.0") { [18:41:25.037] info <- base::c(r_version = base::gsub("R version ", [18:41:25.037] "", base::R.version$version.string), [18:41:25.037] platform = base::sprintf("%s (%s-bit)", [18:41:25.037] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:25.037] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:25.037] "release", "version")], collapse = " "), [18:41:25.037] hostname = base::Sys.info()[["nodename"]]) [18:41:25.037] info <- base::sprintf("%s: %s", base::names(info), [18:41:25.037] info) [18:41:25.037] info <- base::paste(info, collapse = "; ") [18:41:25.037] if (!has_future) { [18:41:25.037] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:25.037] info) [18:41:25.037] } [18:41:25.037] else { [18:41:25.037] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:25.037] info, version) [18:41:25.037] } [18:41:25.037] base::stop(msg) [18:41:25.037] } [18:41:25.037] }) [18:41:25.037] } [18:41:25.037] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:25.037] base::options(mc.cores = 1L) [18:41:25.037] } [18:41:25.037] ...future.strategy.old <- future::plan("list") [18:41:25.037] options(future.plan = NULL) [18:41:25.037] Sys.unsetenv("R_FUTURE_PLAN") [18:41:25.037] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:25.037] } [18:41:25.037] ...future.workdir <- getwd() [18:41:25.037] } [18:41:25.037] ...future.oldOptions <- base::as.list(base::.Options) [18:41:25.037] ...future.oldEnvVars <- base::Sys.getenv() [18:41:25.037] } [18:41:25.037] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:25.037] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:25.037] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:25.037] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:25.037] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:25.037] future.stdout.windows.reencode = NULL, width = 80L) [18:41:25.037] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:25.037] base::names(...future.oldOptions)) [18:41:25.037] } [18:41:25.037] if (FALSE) { [18:41:25.037] } [18:41:25.037] else { [18:41:25.037] if (TRUE) { [18:41:25.037] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:25.037] open = "w") [18:41:25.037] } [18:41:25.037] else { [18:41:25.037] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:25.037] windows = "NUL", "/dev/null"), open = "w") [18:41:25.037] } [18:41:25.037] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:25.037] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:25.037] base::sink(type = "output", split = FALSE) [18:41:25.037] base::close(...future.stdout) [18:41:25.037] }, add = TRUE) [18:41:25.037] } [18:41:25.037] ...future.frame <- base::sys.nframe() [18:41:25.037] ...future.conditions <- base::list() [18:41:25.037] ...future.rng <- base::globalenv()$.Random.seed [18:41:25.037] if (FALSE) { [18:41:25.037] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:25.037] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:25.037] } [18:41:25.037] ...future.result <- base::tryCatch({ [18:41:25.037] base::withCallingHandlers({ [18:41:25.037] ...future.value <- base::withVisible(base::local({ [18:41:25.037] ...future.makeSendCondition <- base::local({ [18:41:25.037] sendCondition <- NULL [18:41:25.037] function(frame = 1L) { [18:41:25.037] if (is.function(sendCondition)) [18:41:25.037] return(sendCondition) [18:41:25.037] ns <- getNamespace("parallel") [18:41:25.037] if (exists("sendData", mode = "function", [18:41:25.037] envir = ns)) { [18:41:25.037] parallel_sendData <- get("sendData", mode = "function", [18:41:25.037] envir = ns) [18:41:25.037] envir <- sys.frame(frame) [18:41:25.037] master <- NULL [18:41:25.037] while (!identical(envir, .GlobalEnv) && [18:41:25.037] !identical(envir, emptyenv())) { [18:41:25.037] if (exists("master", mode = "list", envir = envir, [18:41:25.037] inherits = FALSE)) { [18:41:25.037] master <- get("master", mode = "list", [18:41:25.037] envir = envir, inherits = FALSE) [18:41:25.037] if (inherits(master, c("SOCKnode", [18:41:25.037] "SOCK0node"))) { [18:41:25.037] sendCondition <<- function(cond) { [18:41:25.037] data <- list(type = "VALUE", value = cond, [18:41:25.037] success = TRUE) [18:41:25.037] parallel_sendData(master, data) [18:41:25.037] } [18:41:25.037] return(sendCondition) [18:41:25.037] } [18:41:25.037] } [18:41:25.037] frame <- frame + 1L [18:41:25.037] envir <- sys.frame(frame) [18:41:25.037] } [18:41:25.037] } [18:41:25.037] sendCondition <<- function(cond) NULL [18:41:25.037] } [18:41:25.037] }) [18:41:25.037] withCallingHandlers({ [18:41:25.037] { [18:41:25.037] do.call(function(...) { [18:41:25.037] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:25.037] if (!identical(...future.globals.maxSize.org, [18:41:25.037] ...future.globals.maxSize)) { [18:41:25.037] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:25.037] on.exit(options(oopts), add = TRUE) [18:41:25.037] } [18:41:25.037] { [18:41:25.037] lapply(seq_along(...future.elements_ii), [18:41:25.037] FUN = function(jj) { [18:41:25.037] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:25.037] ...future.FUN(...future.X_jj, ...) [18:41:25.037] }) [18:41:25.037] } [18:41:25.037] }, args = future.call.arguments) [18:41:25.037] } [18:41:25.037] }, immediateCondition = function(cond) { [18:41:25.037] sendCondition <- ...future.makeSendCondition() [18:41:25.037] sendCondition(cond) [18:41:25.037] muffleCondition <- function (cond, pattern = "^muffle") [18:41:25.037] { [18:41:25.037] inherits <- base::inherits [18:41:25.037] invokeRestart <- base::invokeRestart [18:41:25.037] is.null <- base::is.null [18:41:25.037] muffled <- FALSE [18:41:25.037] if (inherits(cond, "message")) { [18:41:25.037] muffled <- grepl(pattern, "muffleMessage") [18:41:25.037] if (muffled) [18:41:25.037] invokeRestart("muffleMessage") [18:41:25.037] } [18:41:25.037] else if (inherits(cond, "warning")) { [18:41:25.037] muffled <- grepl(pattern, "muffleWarning") [18:41:25.037] if (muffled) [18:41:25.037] invokeRestart("muffleWarning") [18:41:25.037] } [18:41:25.037] else if (inherits(cond, "condition")) { [18:41:25.037] if (!is.null(pattern)) { [18:41:25.037] computeRestarts <- base::computeRestarts [18:41:25.037] grepl <- base::grepl [18:41:25.037] restarts <- computeRestarts(cond) [18:41:25.037] for (restart in restarts) { [18:41:25.037] name <- restart$name [18:41:25.037] if (is.null(name)) [18:41:25.037] next [18:41:25.037] if (!grepl(pattern, name)) [18:41:25.037] next [18:41:25.037] invokeRestart(restart) [18:41:25.037] muffled <- TRUE [18:41:25.037] break [18:41:25.037] } [18:41:25.037] } [18:41:25.037] } [18:41:25.037] invisible(muffled) [18:41:25.037] } [18:41:25.037] muffleCondition(cond) [18:41:25.037] }) [18:41:25.037] })) [18:41:25.037] future::FutureResult(value = ...future.value$value, [18:41:25.037] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:25.037] ...future.rng), globalenv = if (FALSE) [18:41:25.037] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:25.037] ...future.globalenv.names)) [18:41:25.037] else NULL, started = ...future.startTime, version = "1.8") [18:41:25.037] }, condition = base::local({ [18:41:25.037] c <- base::c [18:41:25.037] inherits <- base::inherits [18:41:25.037] invokeRestart <- base::invokeRestart [18:41:25.037] length <- base::length [18:41:25.037] list <- base::list [18:41:25.037] seq.int <- base::seq.int [18:41:25.037] signalCondition <- base::signalCondition [18:41:25.037] sys.calls <- base::sys.calls [18:41:25.037] `[[` <- base::`[[` [18:41:25.037] `+` <- base::`+` [18:41:25.037] `<<-` <- base::`<<-` [18:41:25.037] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:25.037] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:25.037] 3L)] [18:41:25.037] } [18:41:25.037] function(cond) { [18:41:25.037] is_error <- inherits(cond, "error") [18:41:25.037] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:25.037] NULL) [18:41:25.037] if (is_error) { [18:41:25.037] sessionInformation <- function() { [18:41:25.037] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:25.037] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:25.037] search = base::search(), system = base::Sys.info()) [18:41:25.037] } [18:41:25.037] ...future.conditions[[length(...future.conditions) + [18:41:25.037] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:25.037] cond$call), session = sessionInformation(), [18:41:25.037] timestamp = base::Sys.time(), signaled = 0L) [18:41:25.037] signalCondition(cond) [18:41:25.037] } [18:41:25.037] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:25.037] "immediateCondition"))) { [18:41:25.037] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:25.037] ...future.conditions[[length(...future.conditions) + [18:41:25.037] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:25.037] if (TRUE && !signal) { [18:41:25.037] muffleCondition <- function (cond, pattern = "^muffle") [18:41:25.037] { [18:41:25.037] inherits <- base::inherits [18:41:25.037] invokeRestart <- base::invokeRestart [18:41:25.037] is.null <- base::is.null [18:41:25.037] muffled <- FALSE [18:41:25.037] if (inherits(cond, "message")) { [18:41:25.037] muffled <- grepl(pattern, "muffleMessage") [18:41:25.037] if (muffled) [18:41:25.037] invokeRestart("muffleMessage") [18:41:25.037] } [18:41:25.037] else if (inherits(cond, "warning")) { [18:41:25.037] muffled <- grepl(pattern, "muffleWarning") [18:41:25.037] if (muffled) [18:41:25.037] invokeRestart("muffleWarning") [18:41:25.037] } [18:41:25.037] else if (inherits(cond, "condition")) { [18:41:25.037] if (!is.null(pattern)) { [18:41:25.037] computeRestarts <- base::computeRestarts [18:41:25.037] grepl <- base::grepl [18:41:25.037] restarts <- computeRestarts(cond) [18:41:25.037] for (restart in restarts) { [18:41:25.037] name <- restart$name [18:41:25.037] if (is.null(name)) [18:41:25.037] next [18:41:25.037] if (!grepl(pattern, name)) [18:41:25.037] next [18:41:25.037] invokeRestart(restart) [18:41:25.037] muffled <- TRUE [18:41:25.037] break [18:41:25.037] } [18:41:25.037] } [18:41:25.037] } [18:41:25.037] invisible(muffled) [18:41:25.037] } [18:41:25.037] muffleCondition(cond, pattern = "^muffle") [18:41:25.037] } [18:41:25.037] } [18:41:25.037] else { [18:41:25.037] if (TRUE) { [18:41:25.037] muffleCondition <- function (cond, pattern = "^muffle") [18:41:25.037] { [18:41:25.037] inherits <- base::inherits [18:41:25.037] invokeRestart <- base::invokeRestart [18:41:25.037] is.null <- base::is.null [18:41:25.037] muffled <- FALSE [18:41:25.037] if (inherits(cond, "message")) { [18:41:25.037] muffled <- grepl(pattern, "muffleMessage") [18:41:25.037] if (muffled) [18:41:25.037] invokeRestart("muffleMessage") [18:41:25.037] } [18:41:25.037] else if (inherits(cond, "warning")) { [18:41:25.037] muffled <- grepl(pattern, "muffleWarning") [18:41:25.037] if (muffled) [18:41:25.037] invokeRestart("muffleWarning") [18:41:25.037] } [18:41:25.037] else if (inherits(cond, "condition")) { [18:41:25.037] if (!is.null(pattern)) { [18:41:25.037] computeRestarts <- base::computeRestarts [18:41:25.037] grepl <- base::grepl [18:41:25.037] restarts <- computeRestarts(cond) [18:41:25.037] for (restart in restarts) { [18:41:25.037] name <- restart$name [18:41:25.037] if (is.null(name)) [18:41:25.037] next [18:41:25.037] if (!grepl(pattern, name)) [18:41:25.037] next [18:41:25.037] invokeRestart(restart) [18:41:25.037] muffled <- TRUE [18:41:25.037] break [18:41:25.037] } [18:41:25.037] } [18:41:25.037] } [18:41:25.037] invisible(muffled) [18:41:25.037] } [18:41:25.037] muffleCondition(cond, pattern = "^muffle") [18:41:25.037] } [18:41:25.037] } [18:41:25.037] } [18:41:25.037] })) [18:41:25.037] }, error = function(ex) { [18:41:25.037] base::structure(base::list(value = NULL, visible = NULL, [18:41:25.037] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:25.037] ...future.rng), started = ...future.startTime, [18:41:25.037] finished = Sys.time(), session_uuid = NA_character_, [18:41:25.037] version = "1.8"), class = "FutureResult") [18:41:25.037] }, finally = { [18:41:25.037] if (!identical(...future.workdir, getwd())) [18:41:25.037] setwd(...future.workdir) [18:41:25.037] { [18:41:25.037] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:25.037] ...future.oldOptions$nwarnings <- NULL [18:41:25.037] } [18:41:25.037] base::options(...future.oldOptions) [18:41:25.037] if (.Platform$OS.type == "windows") { [18:41:25.037] old_names <- names(...future.oldEnvVars) [18:41:25.037] envs <- base::Sys.getenv() [18:41:25.037] names <- names(envs) [18:41:25.037] common <- intersect(names, old_names) [18:41:25.037] added <- setdiff(names, old_names) [18:41:25.037] removed <- setdiff(old_names, names) [18:41:25.037] changed <- common[...future.oldEnvVars[common] != [18:41:25.037] envs[common]] [18:41:25.037] NAMES <- toupper(changed) [18:41:25.037] args <- list() [18:41:25.037] for (kk in seq_along(NAMES)) { [18:41:25.037] name <- changed[[kk]] [18:41:25.037] NAME <- NAMES[[kk]] [18:41:25.037] if (name != NAME && is.element(NAME, old_names)) [18:41:25.037] next [18:41:25.037] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:25.037] } [18:41:25.037] NAMES <- toupper(added) [18:41:25.037] for (kk in seq_along(NAMES)) { [18:41:25.037] name <- added[[kk]] [18:41:25.037] NAME <- NAMES[[kk]] [18:41:25.037] if (name != NAME && is.element(NAME, old_names)) [18:41:25.037] next [18:41:25.037] args[[name]] <- "" [18:41:25.037] } [18:41:25.037] NAMES <- toupper(removed) [18:41:25.037] for (kk in seq_along(NAMES)) { [18:41:25.037] name <- removed[[kk]] [18:41:25.037] NAME <- NAMES[[kk]] [18:41:25.037] if (name != NAME && is.element(NAME, old_names)) [18:41:25.037] next [18:41:25.037] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:25.037] } [18:41:25.037] if (length(args) > 0) [18:41:25.037] base::do.call(base::Sys.setenv, args = args) [18:41:25.037] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:25.037] } [18:41:25.037] else { [18:41:25.037] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:25.037] } [18:41:25.037] { [18:41:25.037] if (base::length(...future.futureOptionsAdded) > [18:41:25.037] 0L) { [18:41:25.037] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:25.037] base::names(opts) <- ...future.futureOptionsAdded [18:41:25.037] base::options(opts) [18:41:25.037] } [18:41:25.037] { [18:41:25.037] { [18:41:25.037] base::options(mc.cores = ...future.mc.cores.old) [18:41:25.037] NULL [18:41:25.037] } [18:41:25.037] options(future.plan = NULL) [18:41:25.037] if (is.na(NA_character_)) [18:41:25.037] Sys.unsetenv("R_FUTURE_PLAN") [18:41:25.037] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:25.037] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:25.037] .init = FALSE) [18:41:25.037] } [18:41:25.037] } [18:41:25.037] } [18:41:25.037] }) [18:41:25.037] if (TRUE) { [18:41:25.037] base::sink(type = "output", split = FALSE) [18:41:25.037] if (TRUE) { [18:41:25.037] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:25.037] } [18:41:25.037] else { [18:41:25.037] ...future.result["stdout"] <- base::list(NULL) [18:41:25.037] } [18:41:25.037] base::close(...future.stdout) [18:41:25.037] ...future.stdout <- NULL [18:41:25.037] } [18:41:25.037] ...future.result$conditions <- ...future.conditions [18:41:25.037] ...future.result$finished <- base::Sys.time() [18:41:25.037] ...future.result [18:41:25.037] } [18:41:25.043] Exporting 5 global objects (1.20 KiB) to cluster node #1 ... [18:41:25.043] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... [18:41:25.043] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... DONE [18:41:25.044] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... [18:41:25.044] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... DONE [18:41:25.044] Exporting '...future.elements_ii' (128 bytes) to cluster node #1 ... [18:41:25.044] Exporting '...future.elements_ii' (128 bytes) to cluster node #1 ... DONE [18:41:25.045] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:25.045] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:25.045] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:25.046] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:25.046] Exporting 5 global objects (1.20 KiB) to cluster node #1 ... DONE [18:41:25.046] MultisessionFuture started [18:41:25.046] - Launch lazy future ... done [18:41:25.047] run() for 'MultisessionFuture' ... done [18:41:25.047] Created future: [18:41:25.061] receiveMessageFromWorker() for ClusterFuture ... [18:41:25.061] - Validating connection of MultisessionFuture [18:41:25.061] - received message: FutureResult [18:41:25.062] - Received FutureResult [18:41:25.062] - Erased future from FutureRegistry [18:41:25.062] result() for ClusterFuture ... [18:41:25.062] - result already collected: FutureResult [18:41:25.062] result() for ClusterFuture ... done [18:41:25.063] receiveMessageFromWorker() for ClusterFuture ... done [18:41:25.047] MultisessionFuture: [18:41:25.047] Label: 'future_lapply-1' [18:41:25.047] Expression: [18:41:25.047] { [18:41:25.047] do.call(function(...) { [18:41:25.047] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:25.047] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:25.047] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:25.047] on.exit(options(oopts), add = TRUE) [18:41:25.047] } [18:41:25.047] { [18:41:25.047] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:25.047] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:25.047] ...future.FUN(...future.X_jj, ...) [18:41:25.047] }) [18:41:25.047] } [18:41:25.047] }, args = future.call.arguments) [18:41:25.047] } [18:41:25.047] Lazy evaluation: FALSE [18:41:25.047] Asynchronous evaluation: TRUE [18:41:25.047] Local evaluation: TRUE [18:41:25.047] Environment: R_GlobalEnv [18:41:25.047] Capture standard output: TRUE [18:41:25.047] Capture condition classes: 'condition' (excluding 'nothing') [18:41:25.047] Globals: 5 objects totaling 790 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 128 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:25.047] Packages: [18:41:25.047] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:25.047] Resolved: TRUE [18:41:25.047] Value: [18:41:25.047] Conditions captured: [18:41:25.047] Early signaling: FALSE [18:41:25.047] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:25.047] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:25.063] Chunk #1 of 2 ... DONE [18:41:25.063] Chunk #2 of 2 ... [18:41:25.063] - Finding globals in 'X' for chunk #2 ... [18:41:25.063] getGlobalsAndPackages() ... [18:41:25.064] Searching for globals... [18:41:25.064] [18:41:25.064] Searching for globals ... DONE [18:41:25.064] - globals: [0] [18:41:25.064] getGlobalsAndPackages() ... DONE [18:41:25.065] + additional globals found: [n=0] [18:41:25.065] + additional namespaces needed: [n=0] [18:41:25.065] - Finding globals in 'X' for chunk #2 ... DONE [18:41:25.065] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:25.065] - seeds: [18:41:25.065] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:25.066] getGlobalsAndPackages() ... [18:41:25.066] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:25.066] Resolving globals: FALSE [18:41:25.066] Tweak future expression to call with '...' arguments ... [18:41:25.066] { [18:41:25.066] do.call(function(...) { [18:41:25.066] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:25.066] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:25.066] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:25.066] on.exit(options(oopts), add = TRUE) [18:41:25.066] } [18:41:25.066] { [18:41:25.066] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:25.066] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:25.066] ...future.FUN(...future.X_jj, ...) [18:41:25.066] }) [18:41:25.066] } [18:41:25.066] }, args = future.call.arguments) [18:41:25.066] } [18:41:25.067] Tweak future expression to call with '...' arguments ... DONE [18:41:25.067] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:25.067] [18:41:25.068] getGlobalsAndPackages() ... DONE [18:41:25.068] run() for 'Future' ... [18:41:25.068] - state: 'created' [18:41:25.068] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:25.084] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:25.084] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:25.084] - Field: 'node' [18:41:25.084] - Field: 'label' [18:41:25.084] - Field: 'local' [18:41:25.085] - Field: 'owner' [18:41:25.085] - Field: 'envir' [18:41:25.085] - Field: 'workers' [18:41:25.085] - Field: 'packages' [18:41:25.085] - Field: 'gc' [18:41:25.085] - Field: 'conditions' [18:41:25.086] - Field: 'persistent' [18:41:25.086] - Field: 'expr' [18:41:25.086] - Field: 'uuid' [18:41:25.086] - Field: 'seed' [18:41:25.086] - Field: 'version' [18:41:25.086] - Field: 'result' [18:41:25.087] - Field: 'asynchronous' [18:41:25.087] - Field: 'calls' [18:41:25.087] - Field: 'globals' [18:41:25.087] - Field: 'stdout' [18:41:25.087] - Field: 'earlySignal' [18:41:25.088] - Field: 'lazy' [18:41:25.088] - Field: 'state' [18:41:25.088] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:25.088] - Launch lazy future ... [18:41:25.088] Packages needed by the future expression (n = 0): [18:41:25.089] Packages needed by future strategies (n = 0): [18:41:25.089] { [18:41:25.089] { [18:41:25.089] { [18:41:25.089] ...future.startTime <- base::Sys.time() [18:41:25.089] { [18:41:25.089] { [18:41:25.089] { [18:41:25.089] { [18:41:25.089] base::local({ [18:41:25.089] has_future <- base::requireNamespace("future", [18:41:25.089] quietly = TRUE) [18:41:25.089] if (has_future) { [18:41:25.089] ns <- base::getNamespace("future") [18:41:25.089] version <- ns[[".package"]][["version"]] [18:41:25.089] if (is.null(version)) [18:41:25.089] version <- utils::packageVersion("future") [18:41:25.089] } [18:41:25.089] else { [18:41:25.089] version <- NULL [18:41:25.089] } [18:41:25.089] if (!has_future || version < "1.8.0") { [18:41:25.089] info <- base::c(r_version = base::gsub("R version ", [18:41:25.089] "", base::R.version$version.string), [18:41:25.089] platform = base::sprintf("%s (%s-bit)", [18:41:25.089] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:25.089] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:25.089] "release", "version")], collapse = " "), [18:41:25.089] hostname = base::Sys.info()[["nodename"]]) [18:41:25.089] info <- base::sprintf("%s: %s", base::names(info), [18:41:25.089] info) [18:41:25.089] info <- base::paste(info, collapse = "; ") [18:41:25.089] if (!has_future) { [18:41:25.089] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:25.089] info) [18:41:25.089] } [18:41:25.089] else { [18:41:25.089] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:25.089] info, version) [18:41:25.089] } [18:41:25.089] base::stop(msg) [18:41:25.089] } [18:41:25.089] }) [18:41:25.089] } [18:41:25.089] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:25.089] base::options(mc.cores = 1L) [18:41:25.089] } [18:41:25.089] ...future.strategy.old <- future::plan("list") [18:41:25.089] options(future.plan = NULL) [18:41:25.089] Sys.unsetenv("R_FUTURE_PLAN") [18:41:25.089] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:25.089] } [18:41:25.089] ...future.workdir <- getwd() [18:41:25.089] } [18:41:25.089] ...future.oldOptions <- base::as.list(base::.Options) [18:41:25.089] ...future.oldEnvVars <- base::Sys.getenv() [18:41:25.089] } [18:41:25.089] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:25.089] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:25.089] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:25.089] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:25.089] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:25.089] future.stdout.windows.reencode = NULL, width = 80L) [18:41:25.089] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:25.089] base::names(...future.oldOptions)) [18:41:25.089] } [18:41:25.089] if (FALSE) { [18:41:25.089] } [18:41:25.089] else { [18:41:25.089] if (TRUE) { [18:41:25.089] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:25.089] open = "w") [18:41:25.089] } [18:41:25.089] else { [18:41:25.089] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:25.089] windows = "NUL", "/dev/null"), open = "w") [18:41:25.089] } [18:41:25.089] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:25.089] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:25.089] base::sink(type = "output", split = FALSE) [18:41:25.089] base::close(...future.stdout) [18:41:25.089] }, add = TRUE) [18:41:25.089] } [18:41:25.089] ...future.frame <- base::sys.nframe() [18:41:25.089] ...future.conditions <- base::list() [18:41:25.089] ...future.rng <- base::globalenv()$.Random.seed [18:41:25.089] if (FALSE) { [18:41:25.089] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:25.089] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:25.089] } [18:41:25.089] ...future.result <- base::tryCatch({ [18:41:25.089] base::withCallingHandlers({ [18:41:25.089] ...future.value <- base::withVisible(base::local({ [18:41:25.089] ...future.makeSendCondition <- base::local({ [18:41:25.089] sendCondition <- NULL [18:41:25.089] function(frame = 1L) { [18:41:25.089] if (is.function(sendCondition)) [18:41:25.089] return(sendCondition) [18:41:25.089] ns <- getNamespace("parallel") [18:41:25.089] if (exists("sendData", mode = "function", [18:41:25.089] envir = ns)) { [18:41:25.089] parallel_sendData <- get("sendData", mode = "function", [18:41:25.089] envir = ns) [18:41:25.089] envir <- sys.frame(frame) [18:41:25.089] master <- NULL [18:41:25.089] while (!identical(envir, .GlobalEnv) && [18:41:25.089] !identical(envir, emptyenv())) { [18:41:25.089] if (exists("master", mode = "list", envir = envir, [18:41:25.089] inherits = FALSE)) { [18:41:25.089] master <- get("master", mode = "list", [18:41:25.089] envir = envir, inherits = FALSE) [18:41:25.089] if (inherits(master, c("SOCKnode", [18:41:25.089] "SOCK0node"))) { [18:41:25.089] sendCondition <<- function(cond) { [18:41:25.089] data <- list(type = "VALUE", value = cond, [18:41:25.089] success = TRUE) [18:41:25.089] parallel_sendData(master, data) [18:41:25.089] } [18:41:25.089] return(sendCondition) [18:41:25.089] } [18:41:25.089] } [18:41:25.089] frame <- frame + 1L [18:41:25.089] envir <- sys.frame(frame) [18:41:25.089] } [18:41:25.089] } [18:41:25.089] sendCondition <<- function(cond) NULL [18:41:25.089] } [18:41:25.089] }) [18:41:25.089] withCallingHandlers({ [18:41:25.089] { [18:41:25.089] do.call(function(...) { [18:41:25.089] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:25.089] if (!identical(...future.globals.maxSize.org, [18:41:25.089] ...future.globals.maxSize)) { [18:41:25.089] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:25.089] on.exit(options(oopts), add = TRUE) [18:41:25.089] } [18:41:25.089] { [18:41:25.089] lapply(seq_along(...future.elements_ii), [18:41:25.089] FUN = function(jj) { [18:41:25.089] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:25.089] ...future.FUN(...future.X_jj, ...) [18:41:25.089] }) [18:41:25.089] } [18:41:25.089] }, args = future.call.arguments) [18:41:25.089] } [18:41:25.089] }, immediateCondition = function(cond) { [18:41:25.089] sendCondition <- ...future.makeSendCondition() [18:41:25.089] sendCondition(cond) [18:41:25.089] muffleCondition <- function (cond, pattern = "^muffle") [18:41:25.089] { [18:41:25.089] inherits <- base::inherits [18:41:25.089] invokeRestart <- base::invokeRestart [18:41:25.089] is.null <- base::is.null [18:41:25.089] muffled <- FALSE [18:41:25.089] if (inherits(cond, "message")) { [18:41:25.089] muffled <- grepl(pattern, "muffleMessage") [18:41:25.089] if (muffled) [18:41:25.089] invokeRestart("muffleMessage") [18:41:25.089] } [18:41:25.089] else if (inherits(cond, "warning")) { [18:41:25.089] muffled <- grepl(pattern, "muffleWarning") [18:41:25.089] if (muffled) [18:41:25.089] invokeRestart("muffleWarning") [18:41:25.089] } [18:41:25.089] else if (inherits(cond, "condition")) { [18:41:25.089] if (!is.null(pattern)) { [18:41:25.089] computeRestarts <- base::computeRestarts [18:41:25.089] grepl <- base::grepl [18:41:25.089] restarts <- computeRestarts(cond) [18:41:25.089] for (restart in restarts) { [18:41:25.089] name <- restart$name [18:41:25.089] if (is.null(name)) [18:41:25.089] next [18:41:25.089] if (!grepl(pattern, name)) [18:41:25.089] next [18:41:25.089] invokeRestart(restart) [18:41:25.089] muffled <- TRUE [18:41:25.089] break [18:41:25.089] } [18:41:25.089] } [18:41:25.089] } [18:41:25.089] invisible(muffled) [18:41:25.089] } [18:41:25.089] muffleCondition(cond) [18:41:25.089] }) [18:41:25.089] })) [18:41:25.089] future::FutureResult(value = ...future.value$value, [18:41:25.089] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:25.089] ...future.rng), globalenv = if (FALSE) [18:41:25.089] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:25.089] ...future.globalenv.names)) [18:41:25.089] else NULL, started = ...future.startTime, version = "1.8") [18:41:25.089] }, condition = base::local({ [18:41:25.089] c <- base::c [18:41:25.089] inherits <- base::inherits [18:41:25.089] invokeRestart <- base::invokeRestart [18:41:25.089] length <- base::length [18:41:25.089] list <- base::list [18:41:25.089] seq.int <- base::seq.int [18:41:25.089] signalCondition <- base::signalCondition [18:41:25.089] sys.calls <- base::sys.calls [18:41:25.089] `[[` <- base::`[[` [18:41:25.089] `+` <- base::`+` [18:41:25.089] `<<-` <- base::`<<-` [18:41:25.089] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:25.089] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:25.089] 3L)] [18:41:25.089] } [18:41:25.089] function(cond) { [18:41:25.089] is_error <- inherits(cond, "error") [18:41:25.089] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:25.089] NULL) [18:41:25.089] if (is_error) { [18:41:25.089] sessionInformation <- function() { [18:41:25.089] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:25.089] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:25.089] search = base::search(), system = base::Sys.info()) [18:41:25.089] } [18:41:25.089] ...future.conditions[[length(...future.conditions) + [18:41:25.089] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:25.089] cond$call), session = sessionInformation(), [18:41:25.089] timestamp = base::Sys.time(), signaled = 0L) [18:41:25.089] signalCondition(cond) [18:41:25.089] } [18:41:25.089] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:25.089] "immediateCondition"))) { [18:41:25.089] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:25.089] ...future.conditions[[length(...future.conditions) + [18:41:25.089] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:25.089] if (TRUE && !signal) { [18:41:25.089] muffleCondition <- function (cond, pattern = "^muffle") [18:41:25.089] { [18:41:25.089] inherits <- base::inherits [18:41:25.089] invokeRestart <- base::invokeRestart [18:41:25.089] is.null <- base::is.null [18:41:25.089] muffled <- FALSE [18:41:25.089] if (inherits(cond, "message")) { [18:41:25.089] muffled <- grepl(pattern, "muffleMessage") [18:41:25.089] if (muffled) [18:41:25.089] invokeRestart("muffleMessage") [18:41:25.089] } [18:41:25.089] else if (inherits(cond, "warning")) { [18:41:25.089] muffled <- grepl(pattern, "muffleWarning") [18:41:25.089] if (muffled) [18:41:25.089] invokeRestart("muffleWarning") [18:41:25.089] } [18:41:25.089] else if (inherits(cond, "condition")) { [18:41:25.089] if (!is.null(pattern)) { [18:41:25.089] computeRestarts <- base::computeRestarts [18:41:25.089] grepl <- base::grepl [18:41:25.089] restarts <- computeRestarts(cond) [18:41:25.089] for (restart in restarts) { [18:41:25.089] name <- restart$name [18:41:25.089] if (is.null(name)) [18:41:25.089] next [18:41:25.089] if (!grepl(pattern, name)) [18:41:25.089] next [18:41:25.089] invokeRestart(restart) [18:41:25.089] muffled <- TRUE [18:41:25.089] break [18:41:25.089] } [18:41:25.089] } [18:41:25.089] } [18:41:25.089] invisible(muffled) [18:41:25.089] } [18:41:25.089] muffleCondition(cond, pattern = "^muffle") [18:41:25.089] } [18:41:25.089] } [18:41:25.089] else { [18:41:25.089] if (TRUE) { [18:41:25.089] muffleCondition <- function (cond, pattern = "^muffle") [18:41:25.089] { [18:41:25.089] inherits <- base::inherits [18:41:25.089] invokeRestart <- base::invokeRestart [18:41:25.089] is.null <- base::is.null [18:41:25.089] muffled <- FALSE [18:41:25.089] if (inherits(cond, "message")) { [18:41:25.089] muffled <- grepl(pattern, "muffleMessage") [18:41:25.089] if (muffled) [18:41:25.089] invokeRestart("muffleMessage") [18:41:25.089] } [18:41:25.089] else if (inherits(cond, "warning")) { [18:41:25.089] muffled <- grepl(pattern, "muffleWarning") [18:41:25.089] if (muffled) [18:41:25.089] invokeRestart("muffleWarning") [18:41:25.089] } [18:41:25.089] else if (inherits(cond, "condition")) { [18:41:25.089] if (!is.null(pattern)) { [18:41:25.089] computeRestarts <- base::computeRestarts [18:41:25.089] grepl <- base::grepl [18:41:25.089] restarts <- computeRestarts(cond) [18:41:25.089] for (restart in restarts) { [18:41:25.089] name <- restart$name [18:41:25.089] if (is.null(name)) [18:41:25.089] next [18:41:25.089] if (!grepl(pattern, name)) [18:41:25.089] next [18:41:25.089] invokeRestart(restart) [18:41:25.089] muffled <- TRUE [18:41:25.089] break [18:41:25.089] } [18:41:25.089] } [18:41:25.089] } [18:41:25.089] invisible(muffled) [18:41:25.089] } [18:41:25.089] muffleCondition(cond, pattern = "^muffle") [18:41:25.089] } [18:41:25.089] } [18:41:25.089] } [18:41:25.089] })) [18:41:25.089] }, error = function(ex) { [18:41:25.089] base::structure(base::list(value = NULL, visible = NULL, [18:41:25.089] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:25.089] ...future.rng), started = ...future.startTime, [18:41:25.089] finished = Sys.time(), session_uuid = NA_character_, [18:41:25.089] version = "1.8"), class = "FutureResult") [18:41:25.089] }, finally = { [18:41:25.089] if (!identical(...future.workdir, getwd())) [18:41:25.089] setwd(...future.workdir) [18:41:25.089] { [18:41:25.089] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:25.089] ...future.oldOptions$nwarnings <- NULL [18:41:25.089] } [18:41:25.089] base::options(...future.oldOptions) [18:41:25.089] if (.Platform$OS.type == "windows") { [18:41:25.089] old_names <- names(...future.oldEnvVars) [18:41:25.089] envs <- base::Sys.getenv() [18:41:25.089] names <- names(envs) [18:41:25.089] common <- intersect(names, old_names) [18:41:25.089] added <- setdiff(names, old_names) [18:41:25.089] removed <- setdiff(old_names, names) [18:41:25.089] changed <- common[...future.oldEnvVars[common] != [18:41:25.089] envs[common]] [18:41:25.089] NAMES <- toupper(changed) [18:41:25.089] args <- list() [18:41:25.089] for (kk in seq_along(NAMES)) { [18:41:25.089] name <- changed[[kk]] [18:41:25.089] NAME <- NAMES[[kk]] [18:41:25.089] if (name != NAME && is.element(NAME, old_names)) [18:41:25.089] next [18:41:25.089] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:25.089] } [18:41:25.089] NAMES <- toupper(added) [18:41:25.089] for (kk in seq_along(NAMES)) { [18:41:25.089] name <- added[[kk]] [18:41:25.089] NAME <- NAMES[[kk]] [18:41:25.089] if (name != NAME && is.element(NAME, old_names)) [18:41:25.089] next [18:41:25.089] args[[name]] <- "" [18:41:25.089] } [18:41:25.089] NAMES <- toupper(removed) [18:41:25.089] for (kk in seq_along(NAMES)) { [18:41:25.089] name <- removed[[kk]] [18:41:25.089] NAME <- NAMES[[kk]] [18:41:25.089] if (name != NAME && is.element(NAME, old_names)) [18:41:25.089] next [18:41:25.089] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:25.089] } [18:41:25.089] if (length(args) > 0) [18:41:25.089] base::do.call(base::Sys.setenv, args = args) [18:41:25.089] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:25.089] } [18:41:25.089] else { [18:41:25.089] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:25.089] } [18:41:25.089] { [18:41:25.089] if (base::length(...future.futureOptionsAdded) > [18:41:25.089] 0L) { [18:41:25.089] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:25.089] base::names(opts) <- ...future.futureOptionsAdded [18:41:25.089] base::options(opts) [18:41:25.089] } [18:41:25.089] { [18:41:25.089] { [18:41:25.089] base::options(mc.cores = ...future.mc.cores.old) [18:41:25.089] NULL [18:41:25.089] } [18:41:25.089] options(future.plan = NULL) [18:41:25.089] if (is.na(NA_character_)) [18:41:25.089] Sys.unsetenv("R_FUTURE_PLAN") [18:41:25.089] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:25.089] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:25.089] .init = FALSE) [18:41:25.089] } [18:41:25.089] } [18:41:25.089] } [18:41:25.089] }) [18:41:25.089] if (TRUE) { [18:41:25.089] base::sink(type = "output", split = FALSE) [18:41:25.089] if (TRUE) { [18:41:25.089] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:25.089] } [18:41:25.089] else { [18:41:25.089] ...future.result["stdout"] <- base::list(NULL) [18:41:25.089] } [18:41:25.089] base::close(...future.stdout) [18:41:25.089] ...future.stdout <- NULL [18:41:25.089] } [18:41:25.089] ...future.result$conditions <- ...future.conditions [18:41:25.089] ...future.result$finished <- base::Sys.time() [18:41:25.089] ...future.result [18:41:25.089] } [18:41:25.094] Exporting 5 global objects (1.20 KiB) to cluster node #1 ... [18:41:25.095] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... [18:41:25.095] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... DONE [18:41:25.095] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... [18:41:25.096] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... DONE [18:41:25.096] Exporting '...future.elements_ii' (127 bytes) to cluster node #1 ... [18:41:25.096] Exporting '...future.elements_ii' (127 bytes) to cluster node #1 ... DONE [18:41:25.096] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:25.097] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:25.097] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:25.097] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:25.098] Exporting 5 global objects (1.20 KiB) to cluster node #1 ... DONE [18:41:25.098] MultisessionFuture started [18:41:25.098] - Launch lazy future ... done [18:41:25.099] run() for 'MultisessionFuture' ... done [18:41:25.099] Created future: [18:41:25.115] receiveMessageFromWorker() for ClusterFuture ... [18:41:25.115] - Validating connection of MultisessionFuture [18:41:25.115] - received message: FutureResult [18:41:25.115] - Received FutureResult [18:41:25.116] - Erased future from FutureRegistry [18:41:25.116] result() for ClusterFuture ... [18:41:25.116] - result already collected: FutureResult [18:41:25.116] result() for ClusterFuture ... done [18:41:25.116] receiveMessageFromWorker() for ClusterFuture ... done [18:41:25.099] MultisessionFuture: [18:41:25.099] Label: 'future_lapply-2' [18:41:25.099] Expression: [18:41:25.099] { [18:41:25.099] do.call(function(...) { [18:41:25.099] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:25.099] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:25.099] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:25.099] on.exit(options(oopts), add = TRUE) [18:41:25.099] } [18:41:25.099] { [18:41:25.099] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:25.099] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:25.099] ...future.FUN(...future.X_jj, ...) [18:41:25.099] }) [18:41:25.099] } [18:41:25.099] }, args = future.call.arguments) [18:41:25.099] } [18:41:25.099] Lazy evaluation: FALSE [18:41:25.099] Asynchronous evaluation: TRUE [18:41:25.099] Local evaluation: TRUE [18:41:25.099] Environment: R_GlobalEnv [18:41:25.099] Capture standard output: TRUE [18:41:25.099] Capture condition classes: 'condition' (excluding 'nothing') [18:41:25.099] Globals: 5 objects totaling 789 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 127 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:25.099] Packages: [18:41:25.099] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:25.099] Resolved: TRUE [18:41:25.099] Value: [18:41:25.099] Conditions captured: [18:41:25.099] Early signaling: FALSE [18:41:25.099] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:25.099] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:25.117] Chunk #2 of 2 ... DONE [18:41:25.117] Launching 2 futures (chunks) ... DONE [18:41:25.117] Resolving 2 futures (chunks) ... [18:41:25.117] resolve() on list ... [18:41:25.117] recursive: 0 [18:41:25.117] length: 2 [18:41:25.118] [18:41:25.118] Future #1 [18:41:25.118] result() for ClusterFuture ... [18:41:25.118] - result already collected: FutureResult [18:41:25.118] result() for ClusterFuture ... done [18:41:25.118] result() for ClusterFuture ... [18:41:25.119] - result already collected: FutureResult [18:41:25.119] result() for ClusterFuture ... done [18:41:25.119] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:25.119] - nx: 2 [18:41:25.119] - relay: TRUE [18:41:25.119] - stdout: TRUE [18:41:25.119] - signal: TRUE [18:41:25.120] - resignal: FALSE [18:41:25.120] - force: TRUE [18:41:25.120] - relayed: [n=2] FALSE, FALSE [18:41:25.120] - queued futures: [n=2] FALSE, FALSE [18:41:25.120] - until=1 [18:41:25.120] - relaying element #1 [18:41:25.121] result() for ClusterFuture ... [18:41:25.121] - result already collected: FutureResult [18:41:25.121] result() for ClusterFuture ... done [18:41:25.121] result() for ClusterFuture ... [18:41:25.121] - result already collected: FutureResult [18:41:25.122] result() for ClusterFuture ... done [18:41:25.122] result() for ClusterFuture ... [18:41:25.122] - result already collected: FutureResult [18:41:25.122] result() for ClusterFuture ... done [18:41:25.122] result() for ClusterFuture ... [18:41:25.123] - result already collected: FutureResult [18:41:25.123] result() for ClusterFuture ... done [18:41:25.123] - relayed: [n=2] TRUE, FALSE [18:41:25.123] - queued futures: [n=2] TRUE, FALSE [18:41:25.123] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:25.123] length: 1 (resolved future 1) [18:41:25.124] Future #2 [18:41:25.124] result() for ClusterFuture ... [18:41:25.124] - result already collected: FutureResult [18:41:25.124] result() for ClusterFuture ... done [18:41:25.124] result() for ClusterFuture ... [18:41:25.124] - result already collected: FutureResult [18:41:25.124] result() for ClusterFuture ... done [18:41:25.125] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:25.125] - nx: 2 [18:41:25.125] - relay: TRUE [18:41:25.125] - stdout: TRUE [18:41:25.125] - signal: TRUE [18:41:25.125] - resignal: FALSE [18:41:25.126] - force: TRUE [18:41:25.126] - relayed: [n=2] TRUE, FALSE [18:41:25.126] - queued futures: [n=2] TRUE, FALSE [18:41:25.126] - until=2 [18:41:25.126] - relaying element #2 [18:41:25.126] result() for ClusterFuture ... [18:41:25.126] - result already collected: FutureResult [18:41:25.127] result() for ClusterFuture ... done [18:41:25.127] result() for ClusterFuture ... [18:41:25.127] - result already collected: FutureResult [18:41:25.127] result() for ClusterFuture ... done [18:41:25.127] result() for ClusterFuture ... [18:41:25.127] - result already collected: FutureResult [18:41:25.128] result() for ClusterFuture ... done [18:41:25.128] result() for ClusterFuture ... [18:41:25.128] - result already collected: FutureResult [18:41:25.128] result() for ClusterFuture ... done [18:41:25.128] - relayed: [n=2] TRUE, TRUE [18:41:25.128] - queued futures: [n=2] TRUE, TRUE [18:41:25.129] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:25.129] length: 0 (resolved future 2) [18:41:25.129] Relaying remaining futures [18:41:25.129] signalConditionsASAP(NULL, pos=0) ... [18:41:25.129] - nx: 2 [18:41:25.129] - relay: TRUE [18:41:25.129] - stdout: TRUE [18:41:25.130] - signal: TRUE [18:41:25.130] - resignal: FALSE [18:41:25.130] - force: TRUE [18:41:25.130] - relayed: [n=2] TRUE, TRUE [18:41:25.130] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:25.130] - relayed: [n=2] TRUE, TRUE [18:41:25.131] - queued futures: [n=2] TRUE, TRUE [18:41:25.131] signalConditionsASAP(NULL, pos=0) ... done [18:41:25.131] resolve() on list ... DONE [18:41:25.131] result() for ClusterFuture ... [18:41:25.131] - result already collected: FutureResult [18:41:25.131] result() for ClusterFuture ... done [18:41:25.132] result() for ClusterFuture ... [18:41:25.132] - result already collected: FutureResult [18:41:25.132] result() for ClusterFuture ... done [18:41:25.132] result() for ClusterFuture ... [18:41:25.132] - result already collected: FutureResult [18:41:25.132] result() for ClusterFuture ... done [18:41:25.133] result() for ClusterFuture ... [18:41:25.133] - result already collected: FutureResult [18:41:25.133] result() for ClusterFuture ... done [18:41:25.133] - Number of value chunks collected: 2 [18:41:25.133] Resolving 2 futures (chunks) ... DONE [18:41:25.133] Reducing values from 2 chunks ... [18:41:25.133] - Number of values collected after concatenation: 4 [18:41:25.134] - Number of values expected: 4 [18:41:25.134] Reverse index remapping (attribute 'ordering'): [n = 4] 2, 1, 3, 4 [18:41:25.134] Reducing values from 2 chunks ... DONE [18:41:25.134] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL - future_lapply(x, FUN = base::vector, ...) ... [18:41:25.137] future_lapply() ... [18:41:25.140] Number of chunks: 2 [18:41:25.140] Index remapping (attribute 'ordering'): [n = 4] 2, 1, 3, 4 [18:41:25.140] getGlobalsAndPackagesXApply() ... [18:41:25.141] - future.globals: TRUE [18:41:25.141] getGlobalsAndPackages() ... [18:41:25.141] Searching for globals... [18:41:25.143] - globals found: [2] 'FUN', '.Internal' [18:41:25.143] Searching for globals ... DONE [18:41:25.143] Resolving globals: FALSE [18:41:25.144] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:25.144] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:25.144] - globals: [1] 'FUN' [18:41:25.145] [18:41:25.145] getGlobalsAndPackages() ... DONE [18:41:25.145] - globals found/used: [n=1] 'FUN' [18:41:25.145] - needed namespaces: [n=0] [18:41:25.145] Finding globals ... DONE [18:41:25.145] - use_args: TRUE [18:41:25.146] - Getting '...' globals ... [18:41:25.146] resolve() on list ... [18:41:25.146] recursive: 0 [18:41:25.146] length: 1 [18:41:25.147] elements: '...' [18:41:25.153] length: 0 (resolved future 1) [18:41:25.153] resolve() on list ... DONE [18:41:25.154] - '...' content: [n=1] 'length' [18:41:25.154] List of 1 [18:41:25.154] $ ...:List of 1 [18:41:25.154] ..$ length: int 2 [18:41:25.154] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:25.154] - attr(*, "where")=List of 1 [18:41:25.154] ..$ ...: [18:41:25.154] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:25.154] - attr(*, "resolved")= logi TRUE [18:41:25.154] - attr(*, "total_size")= num NA [18:41:25.157] - Getting '...' globals ... DONE [18:41:25.158] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:25.158] List of 2 [18:41:25.158] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:25.158] $ ... :List of 1 [18:41:25.158] ..$ length: int 2 [18:41:25.158] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:25.158] - attr(*, "where")=List of 2 [18:41:25.158] ..$ ...future.FUN: [18:41:25.158] ..$ ... : [18:41:25.158] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:25.158] - attr(*, "resolved")= logi FALSE [18:41:25.158] - attr(*, "total_size")= int 4456 [18:41:25.162] Packages to be attached in all futures: [n=0] [18:41:25.162] getGlobalsAndPackagesXApply() ... DONE [18:41:25.162] Number of futures (= number of chunks): 2 [18:41:25.162] Launching 2 futures (chunks) ... [18:41:25.162] Chunk #1 of 2 ... [18:41:25.163] - Finding globals in 'X' for chunk #1 ... [18:41:25.163] getGlobalsAndPackages() ... [18:41:25.163] Searching for globals... [18:41:25.163] [18:41:25.163] Searching for globals ... DONE [18:41:25.164] - globals: [0] [18:41:25.164] getGlobalsAndPackages() ... DONE [18:41:25.164] + additional globals found: [n=0] [18:41:25.164] + additional namespaces needed: [n=0] [18:41:25.164] - Finding globals in 'X' for chunk #1 ... DONE [18:41:25.164] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:25.164] - seeds: [18:41:25.165] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:25.165] getGlobalsAndPackages() ... [18:41:25.165] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:25.165] Resolving globals: FALSE [18:41:25.165] Tweak future expression to call with '...' arguments ... [18:41:25.165] { [18:41:25.165] do.call(function(...) { [18:41:25.165] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:25.165] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:25.165] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:25.165] on.exit(options(oopts), add = TRUE) [18:41:25.165] } [18:41:25.165] { [18:41:25.165] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:25.165] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:25.165] ...future.FUN(...future.X_jj, ...) [18:41:25.165] }) [18:41:25.165] } [18:41:25.165] }, args = future.call.arguments) [18:41:25.165] } [18:41:25.166] Tweak future expression to call with '...' arguments ... DONE [18:41:25.166] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:25.167] [18:41:25.167] getGlobalsAndPackages() ... DONE [18:41:25.167] run() for 'Future' ... [18:41:25.167] - state: 'created' [18:41:25.168] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:25.183] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:25.183] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:25.183] - Field: 'node' [18:41:25.184] - Field: 'label' [18:41:25.184] - Field: 'local' [18:41:25.184] - Field: 'owner' [18:41:25.184] - Field: 'envir' [18:41:25.184] - Field: 'workers' [18:41:25.184] - Field: 'packages' [18:41:25.185] - Field: 'gc' [18:41:25.185] - Field: 'conditions' [18:41:25.185] - Field: 'persistent' [18:41:25.185] - Field: 'expr' [18:41:25.185] - Field: 'uuid' [18:41:25.185] - Field: 'seed' [18:41:25.186] - Field: 'version' [18:41:25.186] - Field: 'result' [18:41:25.186] - Field: 'asynchronous' [18:41:25.186] - Field: 'calls' [18:41:25.186] - Field: 'globals' [18:41:25.187] - Field: 'stdout' [18:41:25.187] - Field: 'earlySignal' [18:41:25.187] - Field: 'lazy' [18:41:25.187] - Field: 'state' [18:41:25.187] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:25.187] - Launch lazy future ... [18:41:25.188] Packages needed by the future expression (n = 0): [18:41:25.188] Packages needed by future strategies (n = 0): [18:41:25.188] { [18:41:25.188] { [18:41:25.188] { [18:41:25.188] ...future.startTime <- base::Sys.time() [18:41:25.188] { [18:41:25.188] { [18:41:25.188] { [18:41:25.188] { [18:41:25.188] base::local({ [18:41:25.188] has_future <- base::requireNamespace("future", [18:41:25.188] quietly = TRUE) [18:41:25.188] if (has_future) { [18:41:25.188] ns <- base::getNamespace("future") [18:41:25.188] version <- ns[[".package"]][["version"]] [18:41:25.188] if (is.null(version)) [18:41:25.188] version <- utils::packageVersion("future") [18:41:25.188] } [18:41:25.188] else { [18:41:25.188] version <- NULL [18:41:25.188] } [18:41:25.188] if (!has_future || version < "1.8.0") { [18:41:25.188] info <- base::c(r_version = base::gsub("R version ", [18:41:25.188] "", base::R.version$version.string), [18:41:25.188] platform = base::sprintf("%s (%s-bit)", [18:41:25.188] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:25.188] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:25.188] "release", "version")], collapse = " "), [18:41:25.188] hostname = base::Sys.info()[["nodename"]]) [18:41:25.188] info <- base::sprintf("%s: %s", base::names(info), [18:41:25.188] info) [18:41:25.188] info <- base::paste(info, collapse = "; ") [18:41:25.188] if (!has_future) { [18:41:25.188] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:25.188] info) [18:41:25.188] } [18:41:25.188] else { [18:41:25.188] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:25.188] info, version) [18:41:25.188] } [18:41:25.188] base::stop(msg) [18:41:25.188] } [18:41:25.188] }) [18:41:25.188] } [18:41:25.188] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:25.188] base::options(mc.cores = 1L) [18:41:25.188] } [18:41:25.188] ...future.strategy.old <- future::plan("list") [18:41:25.188] options(future.plan = NULL) [18:41:25.188] Sys.unsetenv("R_FUTURE_PLAN") [18:41:25.188] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:25.188] } [18:41:25.188] ...future.workdir <- getwd() [18:41:25.188] } [18:41:25.188] ...future.oldOptions <- base::as.list(base::.Options) [18:41:25.188] ...future.oldEnvVars <- base::Sys.getenv() [18:41:25.188] } [18:41:25.188] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:25.188] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:25.188] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:25.188] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:25.188] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:25.188] future.stdout.windows.reencode = NULL, width = 80L) [18:41:25.188] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:25.188] base::names(...future.oldOptions)) [18:41:25.188] } [18:41:25.188] if (FALSE) { [18:41:25.188] } [18:41:25.188] else { [18:41:25.188] if (TRUE) { [18:41:25.188] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:25.188] open = "w") [18:41:25.188] } [18:41:25.188] else { [18:41:25.188] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:25.188] windows = "NUL", "/dev/null"), open = "w") [18:41:25.188] } [18:41:25.188] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:25.188] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:25.188] base::sink(type = "output", split = FALSE) [18:41:25.188] base::close(...future.stdout) [18:41:25.188] }, add = TRUE) [18:41:25.188] } [18:41:25.188] ...future.frame <- base::sys.nframe() [18:41:25.188] ...future.conditions <- base::list() [18:41:25.188] ...future.rng <- base::globalenv()$.Random.seed [18:41:25.188] if (FALSE) { [18:41:25.188] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:25.188] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:25.188] } [18:41:25.188] ...future.result <- base::tryCatch({ [18:41:25.188] base::withCallingHandlers({ [18:41:25.188] ...future.value <- base::withVisible(base::local({ [18:41:25.188] ...future.makeSendCondition <- base::local({ [18:41:25.188] sendCondition <- NULL [18:41:25.188] function(frame = 1L) { [18:41:25.188] if (is.function(sendCondition)) [18:41:25.188] return(sendCondition) [18:41:25.188] ns <- getNamespace("parallel") [18:41:25.188] if (exists("sendData", mode = "function", [18:41:25.188] envir = ns)) { [18:41:25.188] parallel_sendData <- get("sendData", mode = "function", [18:41:25.188] envir = ns) [18:41:25.188] envir <- sys.frame(frame) [18:41:25.188] master <- NULL [18:41:25.188] while (!identical(envir, .GlobalEnv) && [18:41:25.188] !identical(envir, emptyenv())) { [18:41:25.188] if (exists("master", mode = "list", envir = envir, [18:41:25.188] inherits = FALSE)) { [18:41:25.188] master <- get("master", mode = "list", [18:41:25.188] envir = envir, inherits = FALSE) [18:41:25.188] if (inherits(master, c("SOCKnode", [18:41:25.188] "SOCK0node"))) { [18:41:25.188] sendCondition <<- function(cond) { [18:41:25.188] data <- list(type = "VALUE", value = cond, [18:41:25.188] success = TRUE) [18:41:25.188] parallel_sendData(master, data) [18:41:25.188] } [18:41:25.188] return(sendCondition) [18:41:25.188] } [18:41:25.188] } [18:41:25.188] frame <- frame + 1L [18:41:25.188] envir <- sys.frame(frame) [18:41:25.188] } [18:41:25.188] } [18:41:25.188] sendCondition <<- function(cond) NULL [18:41:25.188] } [18:41:25.188] }) [18:41:25.188] withCallingHandlers({ [18:41:25.188] { [18:41:25.188] do.call(function(...) { [18:41:25.188] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:25.188] if (!identical(...future.globals.maxSize.org, [18:41:25.188] ...future.globals.maxSize)) { [18:41:25.188] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:25.188] on.exit(options(oopts), add = TRUE) [18:41:25.188] } [18:41:25.188] { [18:41:25.188] lapply(seq_along(...future.elements_ii), [18:41:25.188] FUN = function(jj) { [18:41:25.188] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:25.188] ...future.FUN(...future.X_jj, ...) [18:41:25.188] }) [18:41:25.188] } [18:41:25.188] }, args = future.call.arguments) [18:41:25.188] } [18:41:25.188] }, immediateCondition = function(cond) { [18:41:25.188] sendCondition <- ...future.makeSendCondition() [18:41:25.188] sendCondition(cond) [18:41:25.188] muffleCondition <- function (cond, pattern = "^muffle") [18:41:25.188] { [18:41:25.188] inherits <- base::inherits [18:41:25.188] invokeRestart <- base::invokeRestart [18:41:25.188] is.null <- base::is.null [18:41:25.188] muffled <- FALSE [18:41:25.188] if (inherits(cond, "message")) { [18:41:25.188] muffled <- grepl(pattern, "muffleMessage") [18:41:25.188] if (muffled) [18:41:25.188] invokeRestart("muffleMessage") [18:41:25.188] } [18:41:25.188] else if (inherits(cond, "warning")) { [18:41:25.188] muffled <- grepl(pattern, "muffleWarning") [18:41:25.188] if (muffled) [18:41:25.188] invokeRestart("muffleWarning") [18:41:25.188] } [18:41:25.188] else if (inherits(cond, "condition")) { [18:41:25.188] if (!is.null(pattern)) { [18:41:25.188] computeRestarts <- base::computeRestarts [18:41:25.188] grepl <- base::grepl [18:41:25.188] restarts <- computeRestarts(cond) [18:41:25.188] for (restart in restarts) { [18:41:25.188] name <- restart$name [18:41:25.188] if (is.null(name)) [18:41:25.188] next [18:41:25.188] if (!grepl(pattern, name)) [18:41:25.188] next [18:41:25.188] invokeRestart(restart) [18:41:25.188] muffled <- TRUE [18:41:25.188] break [18:41:25.188] } [18:41:25.188] } [18:41:25.188] } [18:41:25.188] invisible(muffled) [18:41:25.188] } [18:41:25.188] muffleCondition(cond) [18:41:25.188] }) [18:41:25.188] })) [18:41:25.188] future::FutureResult(value = ...future.value$value, [18:41:25.188] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:25.188] ...future.rng), globalenv = if (FALSE) [18:41:25.188] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:25.188] ...future.globalenv.names)) [18:41:25.188] else NULL, started = ...future.startTime, version = "1.8") [18:41:25.188] }, condition = base::local({ [18:41:25.188] c <- base::c [18:41:25.188] inherits <- base::inherits [18:41:25.188] invokeRestart <- base::invokeRestart [18:41:25.188] length <- base::length [18:41:25.188] list <- base::list [18:41:25.188] seq.int <- base::seq.int [18:41:25.188] signalCondition <- base::signalCondition [18:41:25.188] sys.calls <- base::sys.calls [18:41:25.188] `[[` <- base::`[[` [18:41:25.188] `+` <- base::`+` [18:41:25.188] `<<-` <- base::`<<-` [18:41:25.188] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:25.188] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:25.188] 3L)] [18:41:25.188] } [18:41:25.188] function(cond) { [18:41:25.188] is_error <- inherits(cond, "error") [18:41:25.188] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:25.188] NULL) [18:41:25.188] if (is_error) { [18:41:25.188] sessionInformation <- function() { [18:41:25.188] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:25.188] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:25.188] search = base::search(), system = base::Sys.info()) [18:41:25.188] } [18:41:25.188] ...future.conditions[[length(...future.conditions) + [18:41:25.188] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:25.188] cond$call), session = sessionInformation(), [18:41:25.188] timestamp = base::Sys.time(), signaled = 0L) [18:41:25.188] signalCondition(cond) [18:41:25.188] } [18:41:25.188] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:25.188] "immediateCondition"))) { [18:41:25.188] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:25.188] ...future.conditions[[length(...future.conditions) + [18:41:25.188] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:25.188] if (TRUE && !signal) { [18:41:25.188] muffleCondition <- function (cond, pattern = "^muffle") [18:41:25.188] { [18:41:25.188] inherits <- base::inherits [18:41:25.188] invokeRestart <- base::invokeRestart [18:41:25.188] is.null <- base::is.null [18:41:25.188] muffled <- FALSE [18:41:25.188] if (inherits(cond, "message")) { [18:41:25.188] muffled <- grepl(pattern, "muffleMessage") [18:41:25.188] if (muffled) [18:41:25.188] invokeRestart("muffleMessage") [18:41:25.188] } [18:41:25.188] else if (inherits(cond, "warning")) { [18:41:25.188] muffled <- grepl(pattern, "muffleWarning") [18:41:25.188] if (muffled) [18:41:25.188] invokeRestart("muffleWarning") [18:41:25.188] } [18:41:25.188] else if (inherits(cond, "condition")) { [18:41:25.188] if (!is.null(pattern)) { [18:41:25.188] computeRestarts <- base::computeRestarts [18:41:25.188] grepl <- base::grepl [18:41:25.188] restarts <- computeRestarts(cond) [18:41:25.188] for (restart in restarts) { [18:41:25.188] name <- restart$name [18:41:25.188] if (is.null(name)) [18:41:25.188] next [18:41:25.188] if (!grepl(pattern, name)) [18:41:25.188] next [18:41:25.188] invokeRestart(restart) [18:41:25.188] muffled <- TRUE [18:41:25.188] break [18:41:25.188] } [18:41:25.188] } [18:41:25.188] } [18:41:25.188] invisible(muffled) [18:41:25.188] } [18:41:25.188] muffleCondition(cond, pattern = "^muffle") [18:41:25.188] } [18:41:25.188] } [18:41:25.188] else { [18:41:25.188] if (TRUE) { [18:41:25.188] muffleCondition <- function (cond, pattern = "^muffle") [18:41:25.188] { [18:41:25.188] inherits <- base::inherits [18:41:25.188] invokeRestart <- base::invokeRestart [18:41:25.188] is.null <- base::is.null [18:41:25.188] muffled <- FALSE [18:41:25.188] if (inherits(cond, "message")) { [18:41:25.188] muffled <- grepl(pattern, "muffleMessage") [18:41:25.188] if (muffled) [18:41:25.188] invokeRestart("muffleMessage") [18:41:25.188] } [18:41:25.188] else if (inherits(cond, "warning")) { [18:41:25.188] muffled <- grepl(pattern, "muffleWarning") [18:41:25.188] if (muffled) [18:41:25.188] invokeRestart("muffleWarning") [18:41:25.188] } [18:41:25.188] else if (inherits(cond, "condition")) { [18:41:25.188] if (!is.null(pattern)) { [18:41:25.188] computeRestarts <- base::computeRestarts [18:41:25.188] grepl <- base::grepl [18:41:25.188] restarts <- computeRestarts(cond) [18:41:25.188] for (restart in restarts) { [18:41:25.188] name <- restart$name [18:41:25.188] if (is.null(name)) [18:41:25.188] next [18:41:25.188] if (!grepl(pattern, name)) [18:41:25.188] next [18:41:25.188] invokeRestart(restart) [18:41:25.188] muffled <- TRUE [18:41:25.188] break [18:41:25.188] } [18:41:25.188] } [18:41:25.188] } [18:41:25.188] invisible(muffled) [18:41:25.188] } [18:41:25.188] muffleCondition(cond, pattern = "^muffle") [18:41:25.188] } [18:41:25.188] } [18:41:25.188] } [18:41:25.188] })) [18:41:25.188] }, error = function(ex) { [18:41:25.188] base::structure(base::list(value = NULL, visible = NULL, [18:41:25.188] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:25.188] ...future.rng), started = ...future.startTime, [18:41:25.188] finished = Sys.time(), session_uuid = NA_character_, [18:41:25.188] version = "1.8"), class = "FutureResult") [18:41:25.188] }, finally = { [18:41:25.188] if (!identical(...future.workdir, getwd())) [18:41:25.188] setwd(...future.workdir) [18:41:25.188] { [18:41:25.188] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:25.188] ...future.oldOptions$nwarnings <- NULL [18:41:25.188] } [18:41:25.188] base::options(...future.oldOptions) [18:41:25.188] if (.Platform$OS.type == "windows") { [18:41:25.188] old_names <- names(...future.oldEnvVars) [18:41:25.188] envs <- base::Sys.getenv() [18:41:25.188] names <- names(envs) [18:41:25.188] common <- intersect(names, old_names) [18:41:25.188] added <- setdiff(names, old_names) [18:41:25.188] removed <- setdiff(old_names, names) [18:41:25.188] changed <- common[...future.oldEnvVars[common] != [18:41:25.188] envs[common]] [18:41:25.188] NAMES <- toupper(changed) [18:41:25.188] args <- list() [18:41:25.188] for (kk in seq_along(NAMES)) { [18:41:25.188] name <- changed[[kk]] [18:41:25.188] NAME <- NAMES[[kk]] [18:41:25.188] if (name != NAME && is.element(NAME, old_names)) [18:41:25.188] next [18:41:25.188] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:25.188] } [18:41:25.188] NAMES <- toupper(added) [18:41:25.188] for (kk in seq_along(NAMES)) { [18:41:25.188] name <- added[[kk]] [18:41:25.188] NAME <- NAMES[[kk]] [18:41:25.188] if (name != NAME && is.element(NAME, old_names)) [18:41:25.188] next [18:41:25.188] args[[name]] <- "" [18:41:25.188] } [18:41:25.188] NAMES <- toupper(removed) [18:41:25.188] for (kk in seq_along(NAMES)) { [18:41:25.188] name <- removed[[kk]] [18:41:25.188] NAME <- NAMES[[kk]] [18:41:25.188] if (name != NAME && is.element(NAME, old_names)) [18:41:25.188] next [18:41:25.188] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:25.188] } [18:41:25.188] if (length(args) > 0) [18:41:25.188] base::do.call(base::Sys.setenv, args = args) [18:41:25.188] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:25.188] } [18:41:25.188] else { [18:41:25.188] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:25.188] } [18:41:25.188] { [18:41:25.188] if (base::length(...future.futureOptionsAdded) > [18:41:25.188] 0L) { [18:41:25.188] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:25.188] base::names(opts) <- ...future.futureOptionsAdded [18:41:25.188] base::options(opts) [18:41:25.188] } [18:41:25.188] { [18:41:25.188] { [18:41:25.188] base::options(mc.cores = ...future.mc.cores.old) [18:41:25.188] NULL [18:41:25.188] } [18:41:25.188] options(future.plan = NULL) [18:41:25.188] if (is.na(NA_character_)) [18:41:25.188] Sys.unsetenv("R_FUTURE_PLAN") [18:41:25.188] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:25.188] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:25.188] .init = FALSE) [18:41:25.188] } [18:41:25.188] } [18:41:25.188] } [18:41:25.188] }) [18:41:25.188] if (TRUE) { [18:41:25.188] base::sink(type = "output", split = FALSE) [18:41:25.188] if (TRUE) { [18:41:25.188] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:25.188] } [18:41:25.188] else { [18:41:25.188] ...future.result["stdout"] <- base::list(NULL) [18:41:25.188] } [18:41:25.188] base::close(...future.stdout) [18:41:25.188] ...future.stdout <- NULL [18:41:25.188] } [18:41:25.188] ...future.result$conditions <- ...future.conditions [18:41:25.188] ...future.result$finished <- base::Sys.time() [18:41:25.188] ...future.result [18:41:25.188] } [18:41:25.194] Exporting 5 global objects (1.20 KiB) to cluster node #1 ... [18:41:25.194] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... [18:41:25.194] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... DONE [18:41:25.194] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... [18:41:25.195] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... DONE [18:41:25.195] Exporting '...future.elements_ii' (128 bytes) to cluster node #1 ... [18:41:25.195] Exporting '...future.elements_ii' (128 bytes) to cluster node #1 ... DONE [18:41:25.196] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:25.196] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:25.196] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:25.196] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:25.197] Exporting 5 global objects (1.20 KiB) to cluster node #1 ... DONE [18:41:25.197] MultisessionFuture started [18:41:25.197] - Launch lazy future ... done [18:41:25.198] run() for 'MultisessionFuture' ... done [18:41:25.198] Created future: [18:41:25.213] receiveMessageFromWorker() for ClusterFuture ... [18:41:25.214] - Validating connection of MultisessionFuture [18:41:25.214] - received message: FutureResult [18:41:25.214] - Received FutureResult [18:41:25.214] - Erased future from FutureRegistry [18:41:25.215] result() for ClusterFuture ... [18:41:25.215] - result already collected: FutureResult [18:41:25.215] result() for ClusterFuture ... done [18:41:25.215] receiveMessageFromWorker() for ClusterFuture ... done [18:41:25.198] MultisessionFuture: [18:41:25.198] Label: 'future_lapply-1' [18:41:25.198] Expression: [18:41:25.198] { [18:41:25.198] do.call(function(...) { [18:41:25.198] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:25.198] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:25.198] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:25.198] on.exit(options(oopts), add = TRUE) [18:41:25.198] } [18:41:25.198] { [18:41:25.198] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:25.198] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:25.198] ...future.FUN(...future.X_jj, ...) [18:41:25.198] }) [18:41:25.198] } [18:41:25.198] }, args = future.call.arguments) [18:41:25.198] } [18:41:25.198] Lazy evaluation: FALSE [18:41:25.198] Asynchronous evaluation: TRUE [18:41:25.198] Local evaluation: TRUE [18:41:25.198] Environment: R_GlobalEnv [18:41:25.198] Capture standard output: TRUE [18:41:25.198] Capture condition classes: 'condition' (excluding 'nothing') [18:41:25.198] Globals: 5 objects totaling 790 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 128 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:25.198] Packages: [18:41:25.198] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:25.198] Resolved: TRUE [18:41:25.198] Value: [18:41:25.198] Conditions captured: [18:41:25.198] Early signaling: FALSE [18:41:25.198] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:25.198] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:25.215] Chunk #1 of 2 ... DONE [18:41:25.216] Chunk #2 of 2 ... [18:41:25.216] - Finding globals in 'X' for chunk #2 ... [18:41:25.216] getGlobalsAndPackages() ... [18:41:25.216] Searching for globals... [18:41:25.216] [18:41:25.217] Searching for globals ... DONE [18:41:25.217] - globals: [0] [18:41:25.217] getGlobalsAndPackages() ... DONE [18:41:25.217] + additional globals found: [n=0] [18:41:25.217] + additional namespaces needed: [n=0] [18:41:25.217] - Finding globals in 'X' for chunk #2 ... DONE [18:41:25.218] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:25.218] - seeds: [18:41:25.218] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:25.218] getGlobalsAndPackages() ... [18:41:25.218] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:25.218] Resolving globals: FALSE [18:41:25.219] Tweak future expression to call with '...' arguments ... [18:41:25.219] { [18:41:25.219] do.call(function(...) { [18:41:25.219] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:25.219] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:25.219] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:25.219] on.exit(options(oopts), add = TRUE) [18:41:25.219] } [18:41:25.219] { [18:41:25.219] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:25.219] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:25.219] ...future.FUN(...future.X_jj, ...) [18:41:25.219] }) [18:41:25.219] } [18:41:25.219] }, args = future.call.arguments) [18:41:25.219] } [18:41:25.219] Tweak future expression to call with '...' arguments ... DONE [18:41:25.220] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:25.220] [18:41:25.220] getGlobalsAndPackages() ... DONE [18:41:25.220] run() for 'Future' ... [18:41:25.221] - state: 'created' [18:41:25.221] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:25.238] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:25.238] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:25.238] - Field: 'node' [18:41:25.238] - Field: 'label' [18:41:25.238] - Field: 'local' [18:41:25.239] - Field: 'owner' [18:41:25.239] - Field: 'envir' [18:41:25.239] - Field: 'workers' [18:41:25.239] - Field: 'packages' [18:41:25.239] - Field: 'gc' [18:41:25.240] - Field: 'conditions' [18:41:25.240] - Field: 'persistent' [18:41:25.240] - Field: 'expr' [18:41:25.240] - Field: 'uuid' [18:41:25.240] - Field: 'seed' [18:41:25.240] - Field: 'version' [18:41:25.241] - Field: 'result' [18:41:25.241] - Field: 'asynchronous' [18:41:25.241] - Field: 'calls' [18:41:25.241] - Field: 'globals' [18:41:25.241] - Field: 'stdout' [18:41:25.241] - Field: 'earlySignal' [18:41:25.242] - Field: 'lazy' [18:41:25.242] - Field: 'state' [18:41:25.242] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:25.242] - Launch lazy future ... [18:41:25.242] Packages needed by the future expression (n = 0): [18:41:25.243] Packages needed by future strategies (n = 0): [18:41:25.243] { [18:41:25.243] { [18:41:25.243] { [18:41:25.243] ...future.startTime <- base::Sys.time() [18:41:25.243] { [18:41:25.243] { [18:41:25.243] { [18:41:25.243] { [18:41:25.243] base::local({ [18:41:25.243] has_future <- base::requireNamespace("future", [18:41:25.243] quietly = TRUE) [18:41:25.243] if (has_future) { [18:41:25.243] ns <- base::getNamespace("future") [18:41:25.243] version <- ns[[".package"]][["version"]] [18:41:25.243] if (is.null(version)) [18:41:25.243] version <- utils::packageVersion("future") [18:41:25.243] } [18:41:25.243] else { [18:41:25.243] version <- NULL [18:41:25.243] } [18:41:25.243] if (!has_future || version < "1.8.0") { [18:41:25.243] info <- base::c(r_version = base::gsub("R version ", [18:41:25.243] "", base::R.version$version.string), [18:41:25.243] platform = base::sprintf("%s (%s-bit)", [18:41:25.243] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:25.243] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:25.243] "release", "version")], collapse = " "), [18:41:25.243] hostname = base::Sys.info()[["nodename"]]) [18:41:25.243] info <- base::sprintf("%s: %s", base::names(info), [18:41:25.243] info) [18:41:25.243] info <- base::paste(info, collapse = "; ") [18:41:25.243] if (!has_future) { [18:41:25.243] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:25.243] info) [18:41:25.243] } [18:41:25.243] else { [18:41:25.243] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:25.243] info, version) [18:41:25.243] } [18:41:25.243] base::stop(msg) [18:41:25.243] } [18:41:25.243] }) [18:41:25.243] } [18:41:25.243] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:25.243] base::options(mc.cores = 1L) [18:41:25.243] } [18:41:25.243] ...future.strategy.old <- future::plan("list") [18:41:25.243] options(future.plan = NULL) [18:41:25.243] Sys.unsetenv("R_FUTURE_PLAN") [18:41:25.243] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:25.243] } [18:41:25.243] ...future.workdir <- getwd() [18:41:25.243] } [18:41:25.243] ...future.oldOptions <- base::as.list(base::.Options) [18:41:25.243] ...future.oldEnvVars <- base::Sys.getenv() [18:41:25.243] } [18:41:25.243] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:25.243] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:25.243] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:25.243] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:25.243] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:25.243] future.stdout.windows.reencode = NULL, width = 80L) [18:41:25.243] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:25.243] base::names(...future.oldOptions)) [18:41:25.243] } [18:41:25.243] if (FALSE) { [18:41:25.243] } [18:41:25.243] else { [18:41:25.243] if (TRUE) { [18:41:25.243] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:25.243] open = "w") [18:41:25.243] } [18:41:25.243] else { [18:41:25.243] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:25.243] windows = "NUL", "/dev/null"), open = "w") [18:41:25.243] } [18:41:25.243] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:25.243] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:25.243] base::sink(type = "output", split = FALSE) [18:41:25.243] base::close(...future.stdout) [18:41:25.243] }, add = TRUE) [18:41:25.243] } [18:41:25.243] ...future.frame <- base::sys.nframe() [18:41:25.243] ...future.conditions <- base::list() [18:41:25.243] ...future.rng <- base::globalenv()$.Random.seed [18:41:25.243] if (FALSE) { [18:41:25.243] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:25.243] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:25.243] } [18:41:25.243] ...future.result <- base::tryCatch({ [18:41:25.243] base::withCallingHandlers({ [18:41:25.243] ...future.value <- base::withVisible(base::local({ [18:41:25.243] ...future.makeSendCondition <- base::local({ [18:41:25.243] sendCondition <- NULL [18:41:25.243] function(frame = 1L) { [18:41:25.243] if (is.function(sendCondition)) [18:41:25.243] return(sendCondition) [18:41:25.243] ns <- getNamespace("parallel") [18:41:25.243] if (exists("sendData", mode = "function", [18:41:25.243] envir = ns)) { [18:41:25.243] parallel_sendData <- get("sendData", mode = "function", [18:41:25.243] envir = ns) [18:41:25.243] envir <- sys.frame(frame) [18:41:25.243] master <- NULL [18:41:25.243] while (!identical(envir, .GlobalEnv) && [18:41:25.243] !identical(envir, emptyenv())) { [18:41:25.243] if (exists("master", mode = "list", envir = envir, [18:41:25.243] inherits = FALSE)) { [18:41:25.243] master <- get("master", mode = "list", [18:41:25.243] envir = envir, inherits = FALSE) [18:41:25.243] if (inherits(master, c("SOCKnode", [18:41:25.243] "SOCK0node"))) { [18:41:25.243] sendCondition <<- function(cond) { [18:41:25.243] data <- list(type = "VALUE", value = cond, [18:41:25.243] success = TRUE) [18:41:25.243] parallel_sendData(master, data) [18:41:25.243] } [18:41:25.243] return(sendCondition) [18:41:25.243] } [18:41:25.243] } [18:41:25.243] frame <- frame + 1L [18:41:25.243] envir <- sys.frame(frame) [18:41:25.243] } [18:41:25.243] } [18:41:25.243] sendCondition <<- function(cond) NULL [18:41:25.243] } [18:41:25.243] }) [18:41:25.243] withCallingHandlers({ [18:41:25.243] { [18:41:25.243] do.call(function(...) { [18:41:25.243] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:25.243] if (!identical(...future.globals.maxSize.org, [18:41:25.243] ...future.globals.maxSize)) { [18:41:25.243] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:25.243] on.exit(options(oopts), add = TRUE) [18:41:25.243] } [18:41:25.243] { [18:41:25.243] lapply(seq_along(...future.elements_ii), [18:41:25.243] FUN = function(jj) { [18:41:25.243] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:25.243] ...future.FUN(...future.X_jj, ...) [18:41:25.243] }) [18:41:25.243] } [18:41:25.243] }, args = future.call.arguments) [18:41:25.243] } [18:41:25.243] }, immediateCondition = function(cond) { [18:41:25.243] sendCondition <- ...future.makeSendCondition() [18:41:25.243] sendCondition(cond) [18:41:25.243] muffleCondition <- function (cond, pattern = "^muffle") [18:41:25.243] { [18:41:25.243] inherits <- base::inherits [18:41:25.243] invokeRestart <- base::invokeRestart [18:41:25.243] is.null <- base::is.null [18:41:25.243] muffled <- FALSE [18:41:25.243] if (inherits(cond, "message")) { [18:41:25.243] muffled <- grepl(pattern, "muffleMessage") [18:41:25.243] if (muffled) [18:41:25.243] invokeRestart("muffleMessage") [18:41:25.243] } [18:41:25.243] else if (inherits(cond, "warning")) { [18:41:25.243] muffled <- grepl(pattern, "muffleWarning") [18:41:25.243] if (muffled) [18:41:25.243] invokeRestart("muffleWarning") [18:41:25.243] } [18:41:25.243] else if (inherits(cond, "condition")) { [18:41:25.243] if (!is.null(pattern)) { [18:41:25.243] computeRestarts <- base::computeRestarts [18:41:25.243] grepl <- base::grepl [18:41:25.243] restarts <- computeRestarts(cond) [18:41:25.243] for (restart in restarts) { [18:41:25.243] name <- restart$name [18:41:25.243] if (is.null(name)) [18:41:25.243] next [18:41:25.243] if (!grepl(pattern, name)) [18:41:25.243] next [18:41:25.243] invokeRestart(restart) [18:41:25.243] muffled <- TRUE [18:41:25.243] break [18:41:25.243] } [18:41:25.243] } [18:41:25.243] } [18:41:25.243] invisible(muffled) [18:41:25.243] } [18:41:25.243] muffleCondition(cond) [18:41:25.243] }) [18:41:25.243] })) [18:41:25.243] future::FutureResult(value = ...future.value$value, [18:41:25.243] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:25.243] ...future.rng), globalenv = if (FALSE) [18:41:25.243] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:25.243] ...future.globalenv.names)) [18:41:25.243] else NULL, started = ...future.startTime, version = "1.8") [18:41:25.243] }, condition = base::local({ [18:41:25.243] c <- base::c [18:41:25.243] inherits <- base::inherits [18:41:25.243] invokeRestart <- base::invokeRestart [18:41:25.243] length <- base::length [18:41:25.243] list <- base::list [18:41:25.243] seq.int <- base::seq.int [18:41:25.243] signalCondition <- base::signalCondition [18:41:25.243] sys.calls <- base::sys.calls [18:41:25.243] `[[` <- base::`[[` [18:41:25.243] `+` <- base::`+` [18:41:25.243] `<<-` <- base::`<<-` [18:41:25.243] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:25.243] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:25.243] 3L)] [18:41:25.243] } [18:41:25.243] function(cond) { [18:41:25.243] is_error <- inherits(cond, "error") [18:41:25.243] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:25.243] NULL) [18:41:25.243] if (is_error) { [18:41:25.243] sessionInformation <- function() { [18:41:25.243] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:25.243] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:25.243] search = base::search(), system = base::Sys.info()) [18:41:25.243] } [18:41:25.243] ...future.conditions[[length(...future.conditions) + [18:41:25.243] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:25.243] cond$call), session = sessionInformation(), [18:41:25.243] timestamp = base::Sys.time(), signaled = 0L) [18:41:25.243] signalCondition(cond) [18:41:25.243] } [18:41:25.243] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:25.243] "immediateCondition"))) { [18:41:25.243] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:25.243] ...future.conditions[[length(...future.conditions) + [18:41:25.243] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:25.243] if (TRUE && !signal) { [18:41:25.243] muffleCondition <- function (cond, pattern = "^muffle") [18:41:25.243] { [18:41:25.243] inherits <- base::inherits [18:41:25.243] invokeRestart <- base::invokeRestart [18:41:25.243] is.null <- base::is.null [18:41:25.243] muffled <- FALSE [18:41:25.243] if (inherits(cond, "message")) { [18:41:25.243] muffled <- grepl(pattern, "muffleMessage") [18:41:25.243] if (muffled) [18:41:25.243] invokeRestart("muffleMessage") [18:41:25.243] } [18:41:25.243] else if (inherits(cond, "warning")) { [18:41:25.243] muffled <- grepl(pattern, "muffleWarning") [18:41:25.243] if (muffled) [18:41:25.243] invokeRestart("muffleWarning") [18:41:25.243] } [18:41:25.243] else if (inherits(cond, "condition")) { [18:41:25.243] if (!is.null(pattern)) { [18:41:25.243] computeRestarts <- base::computeRestarts [18:41:25.243] grepl <- base::grepl [18:41:25.243] restarts <- computeRestarts(cond) [18:41:25.243] for (restart in restarts) { [18:41:25.243] name <- restart$name [18:41:25.243] if (is.null(name)) [18:41:25.243] next [18:41:25.243] if (!grepl(pattern, name)) [18:41:25.243] next [18:41:25.243] invokeRestart(restart) [18:41:25.243] muffled <- TRUE [18:41:25.243] break [18:41:25.243] } [18:41:25.243] } [18:41:25.243] } [18:41:25.243] invisible(muffled) [18:41:25.243] } [18:41:25.243] muffleCondition(cond, pattern = "^muffle") [18:41:25.243] } [18:41:25.243] } [18:41:25.243] else { [18:41:25.243] if (TRUE) { [18:41:25.243] muffleCondition <- function (cond, pattern = "^muffle") [18:41:25.243] { [18:41:25.243] inherits <- base::inherits [18:41:25.243] invokeRestart <- base::invokeRestart [18:41:25.243] is.null <- base::is.null [18:41:25.243] muffled <- FALSE [18:41:25.243] if (inherits(cond, "message")) { [18:41:25.243] muffled <- grepl(pattern, "muffleMessage") [18:41:25.243] if (muffled) [18:41:25.243] invokeRestart("muffleMessage") [18:41:25.243] } [18:41:25.243] else if (inherits(cond, "warning")) { [18:41:25.243] muffled <- grepl(pattern, "muffleWarning") [18:41:25.243] if (muffled) [18:41:25.243] invokeRestart("muffleWarning") [18:41:25.243] } [18:41:25.243] else if (inherits(cond, "condition")) { [18:41:25.243] if (!is.null(pattern)) { [18:41:25.243] computeRestarts <- base::computeRestarts [18:41:25.243] grepl <- base::grepl [18:41:25.243] restarts <- computeRestarts(cond) [18:41:25.243] for (restart in restarts) { [18:41:25.243] name <- restart$name [18:41:25.243] if (is.null(name)) [18:41:25.243] next [18:41:25.243] if (!grepl(pattern, name)) [18:41:25.243] next [18:41:25.243] invokeRestart(restart) [18:41:25.243] muffled <- TRUE [18:41:25.243] break [18:41:25.243] } [18:41:25.243] } [18:41:25.243] } [18:41:25.243] invisible(muffled) [18:41:25.243] } [18:41:25.243] muffleCondition(cond, pattern = "^muffle") [18:41:25.243] } [18:41:25.243] } [18:41:25.243] } [18:41:25.243] })) [18:41:25.243] }, error = function(ex) { [18:41:25.243] base::structure(base::list(value = NULL, visible = NULL, [18:41:25.243] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:25.243] ...future.rng), started = ...future.startTime, [18:41:25.243] finished = Sys.time(), session_uuid = NA_character_, [18:41:25.243] version = "1.8"), class = "FutureResult") [18:41:25.243] }, finally = { [18:41:25.243] if (!identical(...future.workdir, getwd())) [18:41:25.243] setwd(...future.workdir) [18:41:25.243] { [18:41:25.243] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:25.243] ...future.oldOptions$nwarnings <- NULL [18:41:25.243] } [18:41:25.243] base::options(...future.oldOptions) [18:41:25.243] if (.Platform$OS.type == "windows") { [18:41:25.243] old_names <- names(...future.oldEnvVars) [18:41:25.243] envs <- base::Sys.getenv() [18:41:25.243] names <- names(envs) [18:41:25.243] common <- intersect(names, old_names) [18:41:25.243] added <- setdiff(names, old_names) [18:41:25.243] removed <- setdiff(old_names, names) [18:41:25.243] changed <- common[...future.oldEnvVars[common] != [18:41:25.243] envs[common]] [18:41:25.243] NAMES <- toupper(changed) [18:41:25.243] args <- list() [18:41:25.243] for (kk in seq_along(NAMES)) { [18:41:25.243] name <- changed[[kk]] [18:41:25.243] NAME <- NAMES[[kk]] [18:41:25.243] if (name != NAME && is.element(NAME, old_names)) [18:41:25.243] next [18:41:25.243] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:25.243] } [18:41:25.243] NAMES <- toupper(added) [18:41:25.243] for (kk in seq_along(NAMES)) { [18:41:25.243] name <- added[[kk]] [18:41:25.243] NAME <- NAMES[[kk]] [18:41:25.243] if (name != NAME && is.element(NAME, old_names)) [18:41:25.243] next [18:41:25.243] args[[name]] <- "" [18:41:25.243] } [18:41:25.243] NAMES <- toupper(removed) [18:41:25.243] for (kk in seq_along(NAMES)) { [18:41:25.243] name <- removed[[kk]] [18:41:25.243] NAME <- NAMES[[kk]] [18:41:25.243] if (name != NAME && is.element(NAME, old_names)) [18:41:25.243] next [18:41:25.243] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:25.243] } [18:41:25.243] if (length(args) > 0) [18:41:25.243] base::do.call(base::Sys.setenv, args = args) [18:41:25.243] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:25.243] } [18:41:25.243] else { [18:41:25.243] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:25.243] } [18:41:25.243] { [18:41:25.243] if (base::length(...future.futureOptionsAdded) > [18:41:25.243] 0L) { [18:41:25.243] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:25.243] base::names(opts) <- ...future.futureOptionsAdded [18:41:25.243] base::options(opts) [18:41:25.243] } [18:41:25.243] { [18:41:25.243] { [18:41:25.243] base::options(mc.cores = ...future.mc.cores.old) [18:41:25.243] NULL [18:41:25.243] } [18:41:25.243] options(future.plan = NULL) [18:41:25.243] if (is.na(NA_character_)) [18:41:25.243] Sys.unsetenv("R_FUTURE_PLAN") [18:41:25.243] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:25.243] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:25.243] .init = FALSE) [18:41:25.243] } [18:41:25.243] } [18:41:25.243] } [18:41:25.243] }) [18:41:25.243] if (TRUE) { [18:41:25.243] base::sink(type = "output", split = FALSE) [18:41:25.243] if (TRUE) { [18:41:25.243] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:25.243] } [18:41:25.243] else { [18:41:25.243] ...future.result["stdout"] <- base::list(NULL) [18:41:25.243] } [18:41:25.243] base::close(...future.stdout) [18:41:25.243] ...future.stdout <- NULL [18:41:25.243] } [18:41:25.243] ...future.result$conditions <- ...future.conditions [18:41:25.243] ...future.result$finished <- base::Sys.time() [18:41:25.243] ...future.result [18:41:25.243] } [18:41:25.248] Exporting 5 global objects (1.20 KiB) to cluster node #1 ... [18:41:25.249] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... [18:41:25.249] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... DONE [18:41:25.249] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... [18:41:25.250] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... DONE [18:41:25.250] Exporting '...future.elements_ii' (127 bytes) to cluster node #1 ... [18:41:25.250] Exporting '...future.elements_ii' (127 bytes) to cluster node #1 ... DONE [18:41:25.250] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:25.251] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:25.251] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:25.251] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:25.251] Exporting 5 global objects (1.20 KiB) to cluster node #1 ... DONE [18:41:25.252] MultisessionFuture started [18:41:25.252] - Launch lazy future ... done [18:41:25.252] run() for 'MultisessionFuture' ... done [18:41:25.253] Created future: [18:41:25.267] receiveMessageFromWorker() for ClusterFuture ... [18:41:25.267] - Validating connection of MultisessionFuture [18:41:25.267] - received message: FutureResult [18:41:25.268] - Received FutureResult [18:41:25.268] - Erased future from FutureRegistry [18:41:25.268] result() for ClusterFuture ... [18:41:25.268] - result already collected: FutureResult [18:41:25.268] result() for ClusterFuture ... done [18:41:25.268] receiveMessageFromWorker() for ClusterFuture ... done [18:41:25.253] MultisessionFuture: [18:41:25.253] Label: 'future_lapply-2' [18:41:25.253] Expression: [18:41:25.253] { [18:41:25.253] do.call(function(...) { [18:41:25.253] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:25.253] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:25.253] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:25.253] on.exit(options(oopts), add = TRUE) [18:41:25.253] } [18:41:25.253] { [18:41:25.253] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:25.253] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:25.253] ...future.FUN(...future.X_jj, ...) [18:41:25.253] }) [18:41:25.253] } [18:41:25.253] }, args = future.call.arguments) [18:41:25.253] } [18:41:25.253] Lazy evaluation: FALSE [18:41:25.253] Asynchronous evaluation: TRUE [18:41:25.253] Local evaluation: TRUE [18:41:25.253] Environment: R_GlobalEnv [18:41:25.253] Capture standard output: TRUE [18:41:25.253] Capture condition classes: 'condition' (excluding 'nothing') [18:41:25.253] Globals: 5 objects totaling 789 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 127 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:25.253] Packages: [18:41:25.253] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:25.253] Resolved: TRUE [18:41:25.253] Value: [18:41:25.253] Conditions captured: [18:41:25.253] Early signaling: FALSE [18:41:25.253] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:25.253] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:25.269] Chunk #2 of 2 ... DONE [18:41:25.269] Launching 2 futures (chunks) ... DONE [18:41:25.269] Resolving 2 futures (chunks) ... [18:41:25.269] resolve() on list ... [18:41:25.269] recursive: 0 [18:41:25.270] length: 2 [18:41:25.270] [18:41:25.270] Future #1 [18:41:25.270] result() for ClusterFuture ... [18:41:25.270] - result already collected: FutureResult [18:41:25.270] result() for ClusterFuture ... done [18:41:25.271] result() for ClusterFuture ... [18:41:25.271] - result already collected: FutureResult [18:41:25.271] result() for ClusterFuture ... done [18:41:25.271] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:25.271] - nx: 2 [18:41:25.271] - relay: TRUE [18:41:25.271] - stdout: TRUE [18:41:25.272] - signal: TRUE [18:41:25.272] - resignal: FALSE [18:41:25.272] - force: TRUE [18:41:25.272] - relayed: [n=2] FALSE, FALSE [18:41:25.272] - queued futures: [n=2] FALSE, FALSE [18:41:25.272] - until=1 [18:41:25.273] - relaying element #1 [18:41:25.273] result() for ClusterFuture ... [18:41:25.273] - result already collected: FutureResult [18:41:25.273] result() for ClusterFuture ... done [18:41:25.273] result() for ClusterFuture ... [18:41:25.273] - result already collected: FutureResult [18:41:25.273] result() for ClusterFuture ... done [18:41:25.274] result() for ClusterFuture ... [18:41:25.274] - result already collected: FutureResult [18:41:25.274] result() for ClusterFuture ... done [18:41:25.274] result() for ClusterFuture ... [18:41:25.274] - result already collected: FutureResult [18:41:25.274] result() for ClusterFuture ... done [18:41:25.275] - relayed: [n=2] TRUE, FALSE [18:41:25.275] - queued futures: [n=2] TRUE, FALSE [18:41:25.275] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:25.275] length: 1 (resolved future 1) [18:41:25.275] Future #2 [18:41:25.276] result() for ClusterFuture ... [18:41:25.276] - result already collected: FutureResult [18:41:25.276] result() for ClusterFuture ... done [18:41:25.276] result() for ClusterFuture ... [18:41:25.276] - result already collected: FutureResult [18:41:25.276] result() for ClusterFuture ... done [18:41:25.276] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:25.277] - nx: 2 [18:41:25.277] - relay: TRUE [18:41:25.277] - stdout: TRUE [18:41:25.277] - signal: TRUE [18:41:25.277] - resignal: FALSE [18:41:25.277] - force: TRUE [18:41:25.277] - relayed: [n=2] TRUE, FALSE [18:41:25.278] - queued futures: [n=2] TRUE, FALSE [18:41:25.278] - until=2 [18:41:25.278] - relaying element #2 [18:41:25.278] result() for ClusterFuture ... [18:41:25.278] - result already collected: FutureResult [18:41:25.278] result() for ClusterFuture ... done [18:41:25.279] result() for ClusterFuture ... [18:41:25.279] - result already collected: FutureResult [18:41:25.279] result() for ClusterFuture ... done [18:41:25.279] result() for ClusterFuture ... [18:41:25.279] - result already collected: FutureResult [18:41:25.279] result() for ClusterFuture ... done [18:41:25.280] result() for ClusterFuture ... [18:41:25.280] - result already collected: FutureResult [18:41:25.280] result() for ClusterFuture ... done [18:41:25.280] - relayed: [n=2] TRUE, TRUE [18:41:25.280] - queued futures: [n=2] TRUE, TRUE [18:41:25.280] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:25.281] length: 0 (resolved future 2) [18:41:25.281] Relaying remaining futures [18:41:25.281] signalConditionsASAP(NULL, pos=0) ... [18:41:25.281] - nx: 2 [18:41:25.281] - relay: TRUE [18:41:25.281] - stdout: TRUE [18:41:25.281] - signal: TRUE [18:41:25.282] - resignal: FALSE [18:41:25.282] - force: TRUE [18:41:25.282] - relayed: [n=2] TRUE, TRUE [18:41:25.282] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:25.282] - relayed: [n=2] TRUE, TRUE [18:41:25.282] - queued futures: [n=2] TRUE, TRUE [18:41:25.283] signalConditionsASAP(NULL, pos=0) ... done [18:41:25.283] resolve() on list ... DONE [18:41:25.283] result() for ClusterFuture ... [18:41:25.283] - result already collected: FutureResult [18:41:25.283] result() for ClusterFuture ... done [18:41:25.283] result() for ClusterFuture ... [18:41:25.284] - result already collected: FutureResult [18:41:25.284] result() for ClusterFuture ... done [18:41:25.284] result() for ClusterFuture ... [18:41:25.284] - result already collected: FutureResult [18:41:25.284] result() for ClusterFuture ... done [18:41:25.284] result() for ClusterFuture ... [18:41:25.285] - result already collected: FutureResult [18:41:25.285] result() for ClusterFuture ... done [18:41:25.285] - Number of value chunks collected: 2 [18:41:25.285] Resolving 2 futures (chunks) ... DONE [18:41:25.285] Reducing values from 2 chunks ... [18:41:25.285] - Number of values collected after concatenation: 4 [18:41:25.285] - Number of values expected: 4 [18:41:25.286] Reverse index remapping (attribute 'ordering'): [n = 4] 2, 1, 3, 4 [18:41:25.286] Reducing values from 2 chunks ... DONE [18:41:25.286] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL - future_lapply(x, FUN = future:::hpaste, ...) ... [18:41:25.289] future_lapply() ... [18:41:25.299] Number of chunks: 1 [18:41:25.300] getGlobalsAndPackagesXApply() ... [18:41:25.300] - future.globals: TRUE [18:41:25.300] getGlobalsAndPackages() ... [18:41:25.300] Searching for globals... [18:41:25.310] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [18:41:25.310] Searching for globals ... DONE [18:41:25.310] Resolving globals: FALSE [18:41:25.311] The total size of the 1 globals is 7.17 KiB (7342 bytes) [18:41:25.312] The total size of the 1 globals exported for future expression ('FUN(collapse = "; ", maxHead = 3L)') is 7.17 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (7.17 KiB of class 'function') [18:41:25.312] - globals: [1] 'FUN' [18:41:25.312] - packages: [1] 'future' [18:41:25.312] getGlobalsAndPackages() ... DONE [18:41:25.313] - globals found/used: [n=1] 'FUN' [18:41:25.313] - needed namespaces: [n=1] 'future' [18:41:25.313] Finding globals ... DONE [18:41:25.313] - use_args: TRUE [18:41:25.313] - Getting '...' globals ... [18:41:25.314] resolve() on list ... [18:41:25.314] recursive: 0 [18:41:25.314] length: 1 [18:41:25.314] elements: '...' [18:41:25.314] length: 0 (resolved future 1) [18:41:25.315] resolve() on list ... DONE [18:41:25.315] - '...' content: [n=2] 'collapse', 'maxHead' [18:41:25.315] List of 1 [18:41:25.315] $ ...:List of 2 [18:41:25.315] ..$ collapse: chr "; " [18:41:25.315] ..$ maxHead : int 3 [18:41:25.315] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:25.315] - attr(*, "where")=List of 1 [18:41:25.315] ..$ ...: [18:41:25.315] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:25.315] - attr(*, "resolved")= logi TRUE [18:41:25.315] - attr(*, "total_size")= num NA [18:41:25.322] - Getting '...' globals ... DONE [18:41:25.322] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:25.322] List of 2 [18:41:25.322] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [18:41:25.322] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [18:41:25.322] $ ... :List of 2 [18:41:25.322] ..$ collapse: chr "; " [18:41:25.322] ..$ maxHead : int 3 [18:41:25.322] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:25.322] - attr(*, "where")=List of 2 [18:41:25.322] ..$ ...future.FUN: [18:41:25.322] ..$ ... : [18:41:25.322] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:25.322] - attr(*, "resolved")= logi FALSE [18:41:25.322] - attr(*, "total_size")= int 20351 [18:41:25.326] Packages to be attached in all futures: [n=1] 'future' [18:41:25.327] getGlobalsAndPackagesXApply() ... DONE [18:41:25.327] Number of futures (= number of chunks): 1 [18:41:25.327] Launching 1 futures (chunks) ... [18:41:25.327] Chunk #1 of 1 ... [18:41:25.327] - Finding globals in 'X' for chunk #1 ... [18:41:25.328] getGlobalsAndPackages() ... [18:41:25.328] Searching for globals... [18:41:25.328] [18:41:25.328] Searching for globals ... DONE [18:41:25.328] - globals: [0] [18:41:25.329] getGlobalsAndPackages() ... DONE [18:41:25.329] + additional globals found: [n=0] [18:41:25.329] + additional namespaces needed: [n=0] [18:41:25.329] - Finding globals in 'X' for chunk #1 ... DONE [18:41:25.329] - seeds: [18:41:25.329] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:25.330] getGlobalsAndPackages() ... [18:41:25.330] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:25.330] Resolving globals: FALSE [18:41:25.330] Tweak future expression to call with '...' arguments ... [18:41:25.330] { [18:41:25.330] do.call(function(...) { [18:41:25.330] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:25.330] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:25.330] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:25.330] on.exit(options(oopts), add = TRUE) [18:41:25.330] } [18:41:25.330] { [18:41:25.330] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:25.330] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:25.330] ...future.FUN(...future.X_jj, ...) [18:41:25.330] }) [18:41:25.330] } [18:41:25.330] }, args = future.call.arguments) [18:41:25.330] } [18:41:25.331] Tweak future expression to call with '...' arguments ... DONE [18:41:25.331] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:25.331] - packages: [1] 'future' [18:41:25.332] getGlobalsAndPackages() ... DONE [18:41:25.332] run() for 'Future' ... [18:41:25.332] - state: 'created' [18:41:25.332] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:25.348] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:25.348] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:25.348] - Field: 'node' [18:41:25.349] - Field: 'label' [18:41:25.349] - Field: 'local' [18:41:25.349] - Field: 'owner' [18:41:25.349] - Field: 'envir' [18:41:25.349] - Field: 'workers' [18:41:25.349] - Field: 'packages' [18:41:25.350] - Field: 'gc' [18:41:25.350] - Field: 'conditions' [18:41:25.350] - Field: 'persistent' [18:41:25.350] - Field: 'expr' [18:41:25.350] - Field: 'uuid' [18:41:25.350] - Field: 'seed' [18:41:25.351] - Field: 'version' [18:41:25.351] - Field: 'result' [18:41:25.351] - Field: 'asynchronous' [18:41:25.351] - Field: 'calls' [18:41:25.351] - Field: 'globals' [18:41:25.351] - Field: 'stdout' [18:41:25.352] - Field: 'earlySignal' [18:41:25.352] - Field: 'lazy' [18:41:25.352] - Field: 'state' [18:41:25.352] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:25.352] - Launch lazy future ... [18:41:25.353] Packages needed by the future expression (n = 1): 'future' [18:41:25.353] Packages needed by future strategies (n = 0): [18:41:25.354] { [18:41:25.354] { [18:41:25.354] { [18:41:25.354] ...future.startTime <- base::Sys.time() [18:41:25.354] { [18:41:25.354] { [18:41:25.354] { [18:41:25.354] { [18:41:25.354] { [18:41:25.354] base::local({ [18:41:25.354] has_future <- base::requireNamespace("future", [18:41:25.354] quietly = TRUE) [18:41:25.354] if (has_future) { [18:41:25.354] ns <- base::getNamespace("future") [18:41:25.354] version <- ns[[".package"]][["version"]] [18:41:25.354] if (is.null(version)) [18:41:25.354] version <- utils::packageVersion("future") [18:41:25.354] } [18:41:25.354] else { [18:41:25.354] version <- NULL [18:41:25.354] } [18:41:25.354] if (!has_future || version < "1.8.0") { [18:41:25.354] info <- base::c(r_version = base::gsub("R version ", [18:41:25.354] "", base::R.version$version.string), [18:41:25.354] platform = base::sprintf("%s (%s-bit)", [18:41:25.354] base::R.version$platform, 8 * [18:41:25.354] base::.Machine$sizeof.pointer), [18:41:25.354] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:25.354] "release", "version")], collapse = " "), [18:41:25.354] hostname = base::Sys.info()[["nodename"]]) [18:41:25.354] info <- base::sprintf("%s: %s", base::names(info), [18:41:25.354] info) [18:41:25.354] info <- base::paste(info, collapse = "; ") [18:41:25.354] if (!has_future) { [18:41:25.354] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:25.354] info) [18:41:25.354] } [18:41:25.354] else { [18:41:25.354] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:25.354] info, version) [18:41:25.354] } [18:41:25.354] base::stop(msg) [18:41:25.354] } [18:41:25.354] }) [18:41:25.354] } [18:41:25.354] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:25.354] base::options(mc.cores = 1L) [18:41:25.354] } [18:41:25.354] base::local({ [18:41:25.354] for (pkg in "future") { [18:41:25.354] base::loadNamespace(pkg) [18:41:25.354] base::library(pkg, character.only = TRUE) [18:41:25.354] } [18:41:25.354] }) [18:41:25.354] } [18:41:25.354] ...future.strategy.old <- future::plan("list") [18:41:25.354] options(future.plan = NULL) [18:41:25.354] Sys.unsetenv("R_FUTURE_PLAN") [18:41:25.354] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:25.354] } [18:41:25.354] ...future.workdir <- getwd() [18:41:25.354] } [18:41:25.354] ...future.oldOptions <- base::as.list(base::.Options) [18:41:25.354] ...future.oldEnvVars <- base::Sys.getenv() [18:41:25.354] } [18:41:25.354] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:25.354] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:25.354] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:25.354] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:25.354] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:25.354] future.stdout.windows.reencode = NULL, width = 80L) [18:41:25.354] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:25.354] base::names(...future.oldOptions)) [18:41:25.354] } [18:41:25.354] if (FALSE) { [18:41:25.354] } [18:41:25.354] else { [18:41:25.354] if (TRUE) { [18:41:25.354] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:25.354] open = "w") [18:41:25.354] } [18:41:25.354] else { [18:41:25.354] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:25.354] windows = "NUL", "/dev/null"), open = "w") [18:41:25.354] } [18:41:25.354] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:25.354] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:25.354] base::sink(type = "output", split = FALSE) [18:41:25.354] base::close(...future.stdout) [18:41:25.354] }, add = TRUE) [18:41:25.354] } [18:41:25.354] ...future.frame <- base::sys.nframe() [18:41:25.354] ...future.conditions <- base::list() [18:41:25.354] ...future.rng <- base::globalenv()$.Random.seed [18:41:25.354] if (FALSE) { [18:41:25.354] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:25.354] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:25.354] } [18:41:25.354] ...future.result <- base::tryCatch({ [18:41:25.354] base::withCallingHandlers({ [18:41:25.354] ...future.value <- base::withVisible(base::local({ [18:41:25.354] ...future.makeSendCondition <- base::local({ [18:41:25.354] sendCondition <- NULL [18:41:25.354] function(frame = 1L) { [18:41:25.354] if (is.function(sendCondition)) [18:41:25.354] return(sendCondition) [18:41:25.354] ns <- getNamespace("parallel") [18:41:25.354] if (exists("sendData", mode = "function", [18:41:25.354] envir = ns)) { [18:41:25.354] parallel_sendData <- get("sendData", mode = "function", [18:41:25.354] envir = ns) [18:41:25.354] envir <- sys.frame(frame) [18:41:25.354] master <- NULL [18:41:25.354] while (!identical(envir, .GlobalEnv) && [18:41:25.354] !identical(envir, emptyenv())) { [18:41:25.354] if (exists("master", mode = "list", envir = envir, [18:41:25.354] inherits = FALSE)) { [18:41:25.354] master <- get("master", mode = "list", [18:41:25.354] envir = envir, inherits = FALSE) [18:41:25.354] if (inherits(master, c("SOCKnode", [18:41:25.354] "SOCK0node"))) { [18:41:25.354] sendCondition <<- function(cond) { [18:41:25.354] data <- list(type = "VALUE", value = cond, [18:41:25.354] success = TRUE) [18:41:25.354] parallel_sendData(master, data) [18:41:25.354] } [18:41:25.354] return(sendCondition) [18:41:25.354] } [18:41:25.354] } [18:41:25.354] frame <- frame + 1L [18:41:25.354] envir <- sys.frame(frame) [18:41:25.354] } [18:41:25.354] } [18:41:25.354] sendCondition <<- function(cond) NULL [18:41:25.354] } [18:41:25.354] }) [18:41:25.354] withCallingHandlers({ [18:41:25.354] { [18:41:25.354] do.call(function(...) { [18:41:25.354] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:25.354] if (!identical(...future.globals.maxSize.org, [18:41:25.354] ...future.globals.maxSize)) { [18:41:25.354] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:25.354] on.exit(options(oopts), add = TRUE) [18:41:25.354] } [18:41:25.354] { [18:41:25.354] lapply(seq_along(...future.elements_ii), [18:41:25.354] FUN = function(jj) { [18:41:25.354] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:25.354] ...future.FUN(...future.X_jj, ...) [18:41:25.354] }) [18:41:25.354] } [18:41:25.354] }, args = future.call.arguments) [18:41:25.354] } [18:41:25.354] }, immediateCondition = function(cond) { [18:41:25.354] sendCondition <- ...future.makeSendCondition() [18:41:25.354] sendCondition(cond) [18:41:25.354] muffleCondition <- function (cond, pattern = "^muffle") [18:41:25.354] { [18:41:25.354] inherits <- base::inherits [18:41:25.354] invokeRestart <- base::invokeRestart [18:41:25.354] is.null <- base::is.null [18:41:25.354] muffled <- FALSE [18:41:25.354] if (inherits(cond, "message")) { [18:41:25.354] muffled <- grepl(pattern, "muffleMessage") [18:41:25.354] if (muffled) [18:41:25.354] invokeRestart("muffleMessage") [18:41:25.354] } [18:41:25.354] else if (inherits(cond, "warning")) { [18:41:25.354] muffled <- grepl(pattern, "muffleWarning") [18:41:25.354] if (muffled) [18:41:25.354] invokeRestart("muffleWarning") [18:41:25.354] } [18:41:25.354] else if (inherits(cond, "condition")) { [18:41:25.354] if (!is.null(pattern)) { [18:41:25.354] computeRestarts <- base::computeRestarts [18:41:25.354] grepl <- base::grepl [18:41:25.354] restarts <- computeRestarts(cond) [18:41:25.354] for (restart in restarts) { [18:41:25.354] name <- restart$name [18:41:25.354] if (is.null(name)) [18:41:25.354] next [18:41:25.354] if (!grepl(pattern, name)) [18:41:25.354] next [18:41:25.354] invokeRestart(restart) [18:41:25.354] muffled <- TRUE [18:41:25.354] break [18:41:25.354] } [18:41:25.354] } [18:41:25.354] } [18:41:25.354] invisible(muffled) [18:41:25.354] } [18:41:25.354] muffleCondition(cond) [18:41:25.354] }) [18:41:25.354] })) [18:41:25.354] future::FutureResult(value = ...future.value$value, [18:41:25.354] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:25.354] ...future.rng), globalenv = if (FALSE) [18:41:25.354] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:25.354] ...future.globalenv.names)) [18:41:25.354] else NULL, started = ...future.startTime, version = "1.8") [18:41:25.354] }, condition = base::local({ [18:41:25.354] c <- base::c [18:41:25.354] inherits <- base::inherits [18:41:25.354] invokeRestart <- base::invokeRestart [18:41:25.354] length <- base::length [18:41:25.354] list <- base::list [18:41:25.354] seq.int <- base::seq.int [18:41:25.354] signalCondition <- base::signalCondition [18:41:25.354] sys.calls <- base::sys.calls [18:41:25.354] `[[` <- base::`[[` [18:41:25.354] `+` <- base::`+` [18:41:25.354] `<<-` <- base::`<<-` [18:41:25.354] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:25.354] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:25.354] 3L)] [18:41:25.354] } [18:41:25.354] function(cond) { [18:41:25.354] is_error <- inherits(cond, "error") [18:41:25.354] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:25.354] NULL) [18:41:25.354] if (is_error) { [18:41:25.354] sessionInformation <- function() { [18:41:25.354] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:25.354] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:25.354] search = base::search(), system = base::Sys.info()) [18:41:25.354] } [18:41:25.354] ...future.conditions[[length(...future.conditions) + [18:41:25.354] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:25.354] cond$call), session = sessionInformation(), [18:41:25.354] timestamp = base::Sys.time(), signaled = 0L) [18:41:25.354] signalCondition(cond) [18:41:25.354] } [18:41:25.354] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:25.354] "immediateCondition"))) { [18:41:25.354] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:25.354] ...future.conditions[[length(...future.conditions) + [18:41:25.354] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:25.354] if (TRUE && !signal) { [18:41:25.354] muffleCondition <- function (cond, pattern = "^muffle") [18:41:25.354] { [18:41:25.354] inherits <- base::inherits [18:41:25.354] invokeRestart <- base::invokeRestart [18:41:25.354] is.null <- base::is.null [18:41:25.354] muffled <- FALSE [18:41:25.354] if (inherits(cond, "message")) { [18:41:25.354] muffled <- grepl(pattern, "muffleMessage") [18:41:25.354] if (muffled) [18:41:25.354] invokeRestart("muffleMessage") [18:41:25.354] } [18:41:25.354] else if (inherits(cond, "warning")) { [18:41:25.354] muffled <- grepl(pattern, "muffleWarning") [18:41:25.354] if (muffled) [18:41:25.354] invokeRestart("muffleWarning") [18:41:25.354] } [18:41:25.354] else if (inherits(cond, "condition")) { [18:41:25.354] if (!is.null(pattern)) { [18:41:25.354] computeRestarts <- base::computeRestarts [18:41:25.354] grepl <- base::grepl [18:41:25.354] restarts <- computeRestarts(cond) [18:41:25.354] for (restart in restarts) { [18:41:25.354] name <- restart$name [18:41:25.354] if (is.null(name)) [18:41:25.354] next [18:41:25.354] if (!grepl(pattern, name)) [18:41:25.354] next [18:41:25.354] invokeRestart(restart) [18:41:25.354] muffled <- TRUE [18:41:25.354] break [18:41:25.354] } [18:41:25.354] } [18:41:25.354] } [18:41:25.354] invisible(muffled) [18:41:25.354] } [18:41:25.354] muffleCondition(cond, pattern = "^muffle") [18:41:25.354] } [18:41:25.354] } [18:41:25.354] else { [18:41:25.354] if (TRUE) { [18:41:25.354] muffleCondition <- function (cond, pattern = "^muffle") [18:41:25.354] { [18:41:25.354] inherits <- base::inherits [18:41:25.354] invokeRestart <- base::invokeRestart [18:41:25.354] is.null <- base::is.null [18:41:25.354] muffled <- FALSE [18:41:25.354] if (inherits(cond, "message")) { [18:41:25.354] muffled <- grepl(pattern, "muffleMessage") [18:41:25.354] if (muffled) [18:41:25.354] invokeRestart("muffleMessage") [18:41:25.354] } [18:41:25.354] else if (inherits(cond, "warning")) { [18:41:25.354] muffled <- grepl(pattern, "muffleWarning") [18:41:25.354] if (muffled) [18:41:25.354] invokeRestart("muffleWarning") [18:41:25.354] } [18:41:25.354] else if (inherits(cond, "condition")) { [18:41:25.354] if (!is.null(pattern)) { [18:41:25.354] computeRestarts <- base::computeRestarts [18:41:25.354] grepl <- base::grepl [18:41:25.354] restarts <- computeRestarts(cond) [18:41:25.354] for (restart in restarts) { [18:41:25.354] name <- restart$name [18:41:25.354] if (is.null(name)) [18:41:25.354] next [18:41:25.354] if (!grepl(pattern, name)) [18:41:25.354] next [18:41:25.354] invokeRestart(restart) [18:41:25.354] muffled <- TRUE [18:41:25.354] break [18:41:25.354] } [18:41:25.354] } [18:41:25.354] } [18:41:25.354] invisible(muffled) [18:41:25.354] } [18:41:25.354] muffleCondition(cond, pattern = "^muffle") [18:41:25.354] } [18:41:25.354] } [18:41:25.354] } [18:41:25.354] })) [18:41:25.354] }, error = function(ex) { [18:41:25.354] base::structure(base::list(value = NULL, visible = NULL, [18:41:25.354] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:25.354] ...future.rng), started = ...future.startTime, [18:41:25.354] finished = Sys.time(), session_uuid = NA_character_, [18:41:25.354] version = "1.8"), class = "FutureResult") [18:41:25.354] }, finally = { [18:41:25.354] if (!identical(...future.workdir, getwd())) [18:41:25.354] setwd(...future.workdir) [18:41:25.354] { [18:41:25.354] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:25.354] ...future.oldOptions$nwarnings <- NULL [18:41:25.354] } [18:41:25.354] base::options(...future.oldOptions) [18:41:25.354] if (.Platform$OS.type == "windows") { [18:41:25.354] old_names <- names(...future.oldEnvVars) [18:41:25.354] envs <- base::Sys.getenv() [18:41:25.354] names <- names(envs) [18:41:25.354] common <- intersect(names, old_names) [18:41:25.354] added <- setdiff(names, old_names) [18:41:25.354] removed <- setdiff(old_names, names) [18:41:25.354] changed <- common[...future.oldEnvVars[common] != [18:41:25.354] envs[common]] [18:41:25.354] NAMES <- toupper(changed) [18:41:25.354] args <- list() [18:41:25.354] for (kk in seq_along(NAMES)) { [18:41:25.354] name <- changed[[kk]] [18:41:25.354] NAME <- NAMES[[kk]] [18:41:25.354] if (name != NAME && is.element(NAME, old_names)) [18:41:25.354] next [18:41:25.354] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:25.354] } [18:41:25.354] NAMES <- toupper(added) [18:41:25.354] for (kk in seq_along(NAMES)) { [18:41:25.354] name <- added[[kk]] [18:41:25.354] NAME <- NAMES[[kk]] [18:41:25.354] if (name != NAME && is.element(NAME, old_names)) [18:41:25.354] next [18:41:25.354] args[[name]] <- "" [18:41:25.354] } [18:41:25.354] NAMES <- toupper(removed) [18:41:25.354] for (kk in seq_along(NAMES)) { [18:41:25.354] name <- removed[[kk]] [18:41:25.354] NAME <- NAMES[[kk]] [18:41:25.354] if (name != NAME && is.element(NAME, old_names)) [18:41:25.354] next [18:41:25.354] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:25.354] } [18:41:25.354] if (length(args) > 0) [18:41:25.354] base::do.call(base::Sys.setenv, args = args) [18:41:25.354] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:25.354] } [18:41:25.354] else { [18:41:25.354] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:25.354] } [18:41:25.354] { [18:41:25.354] if (base::length(...future.futureOptionsAdded) > [18:41:25.354] 0L) { [18:41:25.354] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:25.354] base::names(opts) <- ...future.futureOptionsAdded [18:41:25.354] base::options(opts) [18:41:25.354] } [18:41:25.354] { [18:41:25.354] { [18:41:25.354] base::options(mc.cores = ...future.mc.cores.old) [18:41:25.354] NULL [18:41:25.354] } [18:41:25.354] options(future.plan = NULL) [18:41:25.354] if (is.na(NA_character_)) [18:41:25.354] Sys.unsetenv("R_FUTURE_PLAN") [18:41:25.354] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:25.354] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:25.354] .init = FALSE) [18:41:25.354] } [18:41:25.354] } [18:41:25.354] } [18:41:25.354] }) [18:41:25.354] if (TRUE) { [18:41:25.354] base::sink(type = "output", split = FALSE) [18:41:25.354] if (TRUE) { [18:41:25.354] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:25.354] } [18:41:25.354] else { [18:41:25.354] ...future.result["stdout"] <- base::list(NULL) [18:41:25.354] } [18:41:25.354] base::close(...future.stdout) [18:41:25.354] ...future.stdout <- NULL [18:41:25.354] } [18:41:25.354] ...future.result$conditions <- ...future.conditions [18:41:25.354] ...future.result$finished <- base::Sys.time() [18:41:25.354] ...future.result [18:41:25.354] } [18:41:25.359] Exporting 5 global objects (9.99 KiB) to cluster node #1 ... [18:41:25.359] Exporting '...future.FUN' (7.17 KiB) to cluster node #1 ... [18:41:25.360] Exporting '...future.FUN' (7.17 KiB) to cluster node #1 ... DONE [18:41:25.360] Exporting 'future.call.arguments' (187 bytes) to cluster node #1 ... [18:41:25.361] Exporting 'future.call.arguments' (187 bytes) to cluster node #1 ... DONE [18:41:25.361] Exporting '...future.elements_ii' (2.15 KiB) to cluster node #1 ... [18:41:25.361] Exporting '...future.elements_ii' (2.15 KiB) to cluster node #1 ... DONE [18:41:25.362] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:25.362] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:25.363] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:25.363] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:25.363] Exporting 5 global objects (9.99 KiB) to cluster node #1 ... DONE [18:41:25.364] MultisessionFuture started [18:41:25.364] - Launch lazy future ... done [18:41:25.364] run() for 'MultisessionFuture' ... done [18:41:25.364] Created future: [18:41:25.382] receiveMessageFromWorker() for ClusterFuture ... [18:41:25.382] - Validating connection of MultisessionFuture [18:41:25.382] - received message: FutureResult [18:41:25.382] - Received FutureResult [18:41:25.383] - Erased future from FutureRegistry [18:41:25.383] result() for ClusterFuture ... [18:41:25.383] - result already collected: FutureResult [18:41:25.383] result() for ClusterFuture ... done [18:41:25.383] receiveMessageFromWorker() for ClusterFuture ... done [18:41:25.364] MultisessionFuture: [18:41:25.364] Label: 'future_lapply-1' [18:41:25.364] Expression: [18:41:25.364] { [18:41:25.364] do.call(function(...) { [18:41:25.364] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:25.364] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:25.364] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:25.364] on.exit(options(oopts), add = TRUE) [18:41:25.364] } [18:41:25.364] { [18:41:25.364] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:25.364] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:25.364] ...future.FUN(...future.X_jj, ...) [18:41:25.364] }) [18:41:25.364] } [18:41:25.364] }, args = future.call.arguments) [18:41:25.364] } [18:41:25.364] Lazy evaluation: FALSE [18:41:25.364] Asynchronous evaluation: TRUE [18:41:25.364] Local evaluation: TRUE [18:41:25.364] Environment: R_GlobalEnv [18:41:25.364] Capture standard output: TRUE [18:41:25.364] Capture condition classes: 'condition' (excluding 'nothing') [18:41:25.364] Globals: 5 objects totaling 9.56 KiB (function '...future.FUN' of 7.17 KiB, DotDotDotList 'future.call.arguments' of 187 bytes, list '...future.elements_ii' of 2.15 KiB, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:25.364] Packages: 1 packages ('future') [18:41:25.364] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:25.364] Resolved: TRUE [18:41:25.364] Value: [18:41:25.364] Conditions captured: [18:41:25.364] Early signaling: FALSE [18:41:25.364] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:25.364] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:25.384] Chunk #1 of 1 ... DONE [18:41:25.384] Launching 1 futures (chunks) ... DONE [18:41:25.384] Resolving 1 futures (chunks) ... [18:41:25.384] resolve() on list ... [18:41:25.384] recursive: 0 [18:41:25.384] length: 1 [18:41:25.385] [18:41:25.385] Future #1 [18:41:25.385] result() for ClusterFuture ... [18:41:25.385] - result already collected: FutureResult [18:41:25.385] result() for ClusterFuture ... done [18:41:25.385] result() for ClusterFuture ... [18:41:25.385] - result already collected: FutureResult [18:41:25.386] result() for ClusterFuture ... done [18:41:25.386] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:25.386] - nx: 1 [18:41:25.386] - relay: TRUE [18:41:25.386] - stdout: TRUE [18:41:25.386] - signal: TRUE [18:41:25.387] - resignal: FALSE [18:41:25.387] - force: TRUE [18:41:25.387] - relayed: [n=1] FALSE [18:41:25.387] - queued futures: [n=1] FALSE [18:41:25.387] - until=1 [18:41:25.387] - relaying element #1 [18:41:25.387] result() for ClusterFuture ... [18:41:25.388] - result already collected: FutureResult [18:41:25.388] result() for ClusterFuture ... done [18:41:25.388] result() for ClusterFuture ... [18:41:25.388] - result already collected: FutureResult [18:41:25.388] result() for ClusterFuture ... done [18:41:25.388] result() for ClusterFuture ... [18:41:25.389] - result already collected: FutureResult [18:41:25.389] result() for ClusterFuture ... done [18:41:25.389] result() for ClusterFuture ... [18:41:25.389] - result already collected: FutureResult [18:41:25.389] result() for ClusterFuture ... done [18:41:25.389] - relayed: [n=1] TRUE [18:41:25.390] - queued futures: [n=1] TRUE [18:41:25.390] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:25.390] length: 0 (resolved future 1) [18:41:25.390] Relaying remaining futures [18:41:25.390] signalConditionsASAP(NULL, pos=0) ... [18:41:25.390] - nx: 1 [18:41:25.390] - relay: TRUE [18:41:25.391] - stdout: TRUE [18:41:25.391] - signal: TRUE [18:41:25.391] - resignal: FALSE [18:41:25.391] - force: TRUE [18:41:25.391] - relayed: [n=1] TRUE [18:41:25.391] - queued futures: [n=1] TRUE - flush all [18:41:25.392] - relayed: [n=1] TRUE [18:41:25.392] - queued futures: [n=1] TRUE [18:41:25.392] signalConditionsASAP(NULL, pos=0) ... done [18:41:25.392] resolve() on list ... DONE [18:41:25.392] result() for ClusterFuture ... [18:41:25.392] - result already collected: FutureResult [18:41:25.393] result() for ClusterFuture ... done [18:41:25.393] result() for ClusterFuture ... [18:41:25.393] - result already collected: FutureResult [18:41:25.393] result() for ClusterFuture ... done [18:41:25.393] - Number of value chunks collected: 1 [18:41:25.393] Resolving 1 futures (chunks) ... DONE [18:41:25.393] Reducing values from 1 chunks ... [18:41:25.394] - Number of values collected after concatenation: 1 [18:41:25.394] - Number of values expected: 1 [18:41:25.394] Reducing values from 1 chunks ... DONE [18:41:25.394] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [18:41:25.395] future_lapply() ... [18:41:25.398] Number of chunks: 2 [18:41:25.398] Index remapping (attribute 'ordering'): [n = 2] 1, 2 [18:41:25.399] getGlobalsAndPackagesXApply() ... [18:41:25.399] - future.globals: TRUE [18:41:25.399] getGlobalsAndPackages() ... [18:41:25.399] Searching for globals... [18:41:25.401] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [18:41:25.401] Searching for globals ... DONE [18:41:25.401] Resolving globals: FALSE [18:41:25.402] The total size of the 1 globals is 911 bytes (911 bytes) [18:41:25.402] The total size of the 1 globals exported for future expression ('FUN()') is 911 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (911 bytes of class 'function') [18:41:25.402] - globals: [1] 'FUN' [18:41:25.402] - packages: [1] 'listenv' [18:41:25.403] getGlobalsAndPackages() ... DONE [18:41:25.403] - globals found/used: [n=1] 'FUN' [18:41:25.403] - needed namespaces: [n=1] 'listenv' [18:41:25.403] Finding globals ... DONE [18:41:25.403] - use_args: TRUE [18:41:25.403] - Getting '...' globals ... [18:41:25.404] resolve() on list ... [18:41:25.404] recursive: 0 [18:41:25.404] length: 1 [18:41:25.404] elements: '...' [18:41:25.405] length: 0 (resolved future 1) [18:41:25.405] resolve() on list ... DONE [18:41:25.405] - '...' content: [n=0] [18:41:25.405] List of 1 [18:41:25.405] $ ...: list() [18:41:25.405] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:25.405] - attr(*, "where")=List of 1 [18:41:25.405] ..$ ...: [18:41:25.405] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:25.405] - attr(*, "resolved")= logi TRUE [18:41:25.405] - attr(*, "total_size")= num NA [18:41:25.408] - Getting '...' globals ... DONE [18:41:25.408] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:25.408] List of 2 [18:41:25.408] $ ...future.FUN:function (x, ...) [18:41:25.408] $ ... : list() [18:41:25.408] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:25.408] - attr(*, "where")=List of 2 [18:41:25.408] ..$ ...future.FUN: [18:41:25.408] ..$ ... : [18:41:25.408] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:25.408] - attr(*, "resolved")= logi FALSE [18:41:25.408] - attr(*, "total_size")= int 8195 [18:41:25.412] Packages to be attached in all futures: [n=1] 'listenv' [18:41:25.412] getGlobalsAndPackagesXApply() ... DONE [18:41:25.412] Number of futures (= number of chunks): 2 [18:41:25.412] Launching 2 futures (chunks) ... [18:41:25.412] Chunk #1 of 2 ... [18:41:25.413] - Finding globals in 'X' for chunk #1 ... [18:41:25.413] getGlobalsAndPackages() ... [18:41:25.413] Searching for globals... [18:41:25.413] [18:41:25.414] Searching for globals ... DONE [18:41:25.414] - globals: [0] [18:41:25.414] getGlobalsAndPackages() ... DONE [18:41:25.414] + additional globals found: [n=0] [18:41:25.414] + additional namespaces needed: [n=0] [18:41:25.414] - Finding globals in 'X' for chunk #1 ... DONE [18:41:25.414] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:25.415] - seeds: [18:41:25.415] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:25.415] getGlobalsAndPackages() ... [18:41:25.415] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:25.415] Resolving globals: FALSE [18:41:25.415] Tweak future expression to call with '...' arguments ... [18:41:25.416] { [18:41:25.416] do.call(function(...) { [18:41:25.416] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:25.416] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:25.416] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:25.416] on.exit(options(oopts), add = TRUE) [18:41:25.416] } [18:41:25.416] { [18:41:25.416] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:25.416] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:25.416] ...future.FUN(...future.X_jj, ...) [18:41:25.416] }) [18:41:25.416] } [18:41:25.416] }, args = future.call.arguments) [18:41:25.416] } [18:41:25.416] Tweak future expression to call with '...' arguments ... DONE [18:41:25.417] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:25.417] - packages: [1] 'listenv' [18:41:25.417] getGlobalsAndPackages() ... DONE [18:41:25.417] run() for 'Future' ... [18:41:25.418] - state: 'created' [18:41:25.418] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:25.433] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:25.433] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:25.434] - Field: 'node' [18:41:25.434] - Field: 'label' [18:41:25.434] - Field: 'local' [18:41:25.434] - Field: 'owner' [18:41:25.434] - Field: 'envir' [18:41:25.435] - Field: 'workers' [18:41:25.435] - Field: 'packages' [18:41:25.435] - Field: 'gc' [18:41:25.435] - Field: 'conditions' [18:41:25.435] - Field: 'persistent' [18:41:25.435] - Field: 'expr' [18:41:25.436] - Field: 'uuid' [18:41:25.436] - Field: 'seed' [18:41:25.436] - Field: 'version' [18:41:25.436] - Field: 'result' [18:41:25.436] - Field: 'asynchronous' [18:41:25.436] - Field: 'calls' [18:41:25.437] - Field: 'globals' [18:41:25.437] - Field: 'stdout' [18:41:25.437] - Field: 'earlySignal' [18:41:25.437] - Field: 'lazy' [18:41:25.437] - Field: 'state' [18:41:25.437] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:25.438] - Launch lazy future ... [18:41:25.438] Packages needed by the future expression (n = 1): 'listenv' [18:41:25.438] Packages needed by future strategies (n = 0): [18:41:25.439] { [18:41:25.439] { [18:41:25.439] { [18:41:25.439] ...future.startTime <- base::Sys.time() [18:41:25.439] { [18:41:25.439] { [18:41:25.439] { [18:41:25.439] { [18:41:25.439] { [18:41:25.439] base::local({ [18:41:25.439] has_future <- base::requireNamespace("future", [18:41:25.439] quietly = TRUE) [18:41:25.439] if (has_future) { [18:41:25.439] ns <- base::getNamespace("future") [18:41:25.439] version <- ns[[".package"]][["version"]] [18:41:25.439] if (is.null(version)) [18:41:25.439] version <- utils::packageVersion("future") [18:41:25.439] } [18:41:25.439] else { [18:41:25.439] version <- NULL [18:41:25.439] } [18:41:25.439] if (!has_future || version < "1.8.0") { [18:41:25.439] info <- base::c(r_version = base::gsub("R version ", [18:41:25.439] "", base::R.version$version.string), [18:41:25.439] platform = base::sprintf("%s (%s-bit)", [18:41:25.439] base::R.version$platform, 8 * [18:41:25.439] base::.Machine$sizeof.pointer), [18:41:25.439] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:25.439] "release", "version")], collapse = " "), [18:41:25.439] hostname = base::Sys.info()[["nodename"]]) [18:41:25.439] info <- base::sprintf("%s: %s", base::names(info), [18:41:25.439] info) [18:41:25.439] info <- base::paste(info, collapse = "; ") [18:41:25.439] if (!has_future) { [18:41:25.439] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:25.439] info) [18:41:25.439] } [18:41:25.439] else { [18:41:25.439] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:25.439] info, version) [18:41:25.439] } [18:41:25.439] base::stop(msg) [18:41:25.439] } [18:41:25.439] }) [18:41:25.439] } [18:41:25.439] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:25.439] base::options(mc.cores = 1L) [18:41:25.439] } [18:41:25.439] base::local({ [18:41:25.439] for (pkg in "listenv") { [18:41:25.439] base::loadNamespace(pkg) [18:41:25.439] base::library(pkg, character.only = TRUE) [18:41:25.439] } [18:41:25.439] }) [18:41:25.439] } [18:41:25.439] ...future.strategy.old <- future::plan("list") [18:41:25.439] options(future.plan = NULL) [18:41:25.439] Sys.unsetenv("R_FUTURE_PLAN") [18:41:25.439] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:25.439] } [18:41:25.439] ...future.workdir <- getwd() [18:41:25.439] } [18:41:25.439] ...future.oldOptions <- base::as.list(base::.Options) [18:41:25.439] ...future.oldEnvVars <- base::Sys.getenv() [18:41:25.439] } [18:41:25.439] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:25.439] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:25.439] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:25.439] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:25.439] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:25.439] future.stdout.windows.reencode = NULL, width = 80L) [18:41:25.439] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:25.439] base::names(...future.oldOptions)) [18:41:25.439] } [18:41:25.439] if (FALSE) { [18:41:25.439] } [18:41:25.439] else { [18:41:25.439] if (TRUE) { [18:41:25.439] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:25.439] open = "w") [18:41:25.439] } [18:41:25.439] else { [18:41:25.439] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:25.439] windows = "NUL", "/dev/null"), open = "w") [18:41:25.439] } [18:41:25.439] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:25.439] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:25.439] base::sink(type = "output", split = FALSE) [18:41:25.439] base::close(...future.stdout) [18:41:25.439] }, add = TRUE) [18:41:25.439] } [18:41:25.439] ...future.frame <- base::sys.nframe() [18:41:25.439] ...future.conditions <- base::list() [18:41:25.439] ...future.rng <- base::globalenv()$.Random.seed [18:41:25.439] if (FALSE) { [18:41:25.439] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:25.439] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:25.439] } [18:41:25.439] ...future.result <- base::tryCatch({ [18:41:25.439] base::withCallingHandlers({ [18:41:25.439] ...future.value <- base::withVisible(base::local({ [18:41:25.439] ...future.makeSendCondition <- base::local({ [18:41:25.439] sendCondition <- NULL [18:41:25.439] function(frame = 1L) { [18:41:25.439] if (is.function(sendCondition)) [18:41:25.439] return(sendCondition) [18:41:25.439] ns <- getNamespace("parallel") [18:41:25.439] if (exists("sendData", mode = "function", [18:41:25.439] envir = ns)) { [18:41:25.439] parallel_sendData <- get("sendData", mode = "function", [18:41:25.439] envir = ns) [18:41:25.439] envir <- sys.frame(frame) [18:41:25.439] master <- NULL [18:41:25.439] while (!identical(envir, .GlobalEnv) && [18:41:25.439] !identical(envir, emptyenv())) { [18:41:25.439] if (exists("master", mode = "list", envir = envir, [18:41:25.439] inherits = FALSE)) { [18:41:25.439] master <- get("master", mode = "list", [18:41:25.439] envir = envir, inherits = FALSE) [18:41:25.439] if (inherits(master, c("SOCKnode", [18:41:25.439] "SOCK0node"))) { [18:41:25.439] sendCondition <<- function(cond) { [18:41:25.439] data <- list(type = "VALUE", value = cond, [18:41:25.439] success = TRUE) [18:41:25.439] parallel_sendData(master, data) [18:41:25.439] } [18:41:25.439] return(sendCondition) [18:41:25.439] } [18:41:25.439] } [18:41:25.439] frame <- frame + 1L [18:41:25.439] envir <- sys.frame(frame) [18:41:25.439] } [18:41:25.439] } [18:41:25.439] sendCondition <<- function(cond) NULL [18:41:25.439] } [18:41:25.439] }) [18:41:25.439] withCallingHandlers({ [18:41:25.439] { [18:41:25.439] do.call(function(...) { [18:41:25.439] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:25.439] if (!identical(...future.globals.maxSize.org, [18:41:25.439] ...future.globals.maxSize)) { [18:41:25.439] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:25.439] on.exit(options(oopts), add = TRUE) [18:41:25.439] } [18:41:25.439] { [18:41:25.439] lapply(seq_along(...future.elements_ii), [18:41:25.439] FUN = function(jj) { [18:41:25.439] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:25.439] ...future.FUN(...future.X_jj, ...) [18:41:25.439] }) [18:41:25.439] } [18:41:25.439] }, args = future.call.arguments) [18:41:25.439] } [18:41:25.439] }, immediateCondition = function(cond) { [18:41:25.439] sendCondition <- ...future.makeSendCondition() [18:41:25.439] sendCondition(cond) [18:41:25.439] muffleCondition <- function (cond, pattern = "^muffle") [18:41:25.439] { [18:41:25.439] inherits <- base::inherits [18:41:25.439] invokeRestart <- base::invokeRestart [18:41:25.439] is.null <- base::is.null [18:41:25.439] muffled <- FALSE [18:41:25.439] if (inherits(cond, "message")) { [18:41:25.439] muffled <- grepl(pattern, "muffleMessage") [18:41:25.439] if (muffled) [18:41:25.439] invokeRestart("muffleMessage") [18:41:25.439] } [18:41:25.439] else if (inherits(cond, "warning")) { [18:41:25.439] muffled <- grepl(pattern, "muffleWarning") [18:41:25.439] if (muffled) [18:41:25.439] invokeRestart("muffleWarning") [18:41:25.439] } [18:41:25.439] else if (inherits(cond, "condition")) { [18:41:25.439] if (!is.null(pattern)) { [18:41:25.439] computeRestarts <- base::computeRestarts [18:41:25.439] grepl <- base::grepl [18:41:25.439] restarts <- computeRestarts(cond) [18:41:25.439] for (restart in restarts) { [18:41:25.439] name <- restart$name [18:41:25.439] if (is.null(name)) [18:41:25.439] next [18:41:25.439] if (!grepl(pattern, name)) [18:41:25.439] next [18:41:25.439] invokeRestart(restart) [18:41:25.439] muffled <- TRUE [18:41:25.439] break [18:41:25.439] } [18:41:25.439] } [18:41:25.439] } [18:41:25.439] invisible(muffled) [18:41:25.439] } [18:41:25.439] muffleCondition(cond) [18:41:25.439] }) [18:41:25.439] })) [18:41:25.439] future::FutureResult(value = ...future.value$value, [18:41:25.439] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:25.439] ...future.rng), globalenv = if (FALSE) [18:41:25.439] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:25.439] ...future.globalenv.names)) [18:41:25.439] else NULL, started = ...future.startTime, version = "1.8") [18:41:25.439] }, condition = base::local({ [18:41:25.439] c <- base::c [18:41:25.439] inherits <- base::inherits [18:41:25.439] invokeRestart <- base::invokeRestart [18:41:25.439] length <- base::length [18:41:25.439] list <- base::list [18:41:25.439] seq.int <- base::seq.int [18:41:25.439] signalCondition <- base::signalCondition [18:41:25.439] sys.calls <- base::sys.calls [18:41:25.439] `[[` <- base::`[[` [18:41:25.439] `+` <- base::`+` [18:41:25.439] `<<-` <- base::`<<-` [18:41:25.439] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:25.439] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:25.439] 3L)] [18:41:25.439] } [18:41:25.439] function(cond) { [18:41:25.439] is_error <- inherits(cond, "error") [18:41:25.439] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:25.439] NULL) [18:41:25.439] if (is_error) { [18:41:25.439] sessionInformation <- function() { [18:41:25.439] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:25.439] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:25.439] search = base::search(), system = base::Sys.info()) [18:41:25.439] } [18:41:25.439] ...future.conditions[[length(...future.conditions) + [18:41:25.439] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:25.439] cond$call), session = sessionInformation(), [18:41:25.439] timestamp = base::Sys.time(), signaled = 0L) [18:41:25.439] signalCondition(cond) [18:41:25.439] } [18:41:25.439] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:25.439] "immediateCondition"))) { [18:41:25.439] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:25.439] ...future.conditions[[length(...future.conditions) + [18:41:25.439] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:25.439] if (TRUE && !signal) { [18:41:25.439] muffleCondition <- function (cond, pattern = "^muffle") [18:41:25.439] { [18:41:25.439] inherits <- base::inherits [18:41:25.439] invokeRestart <- base::invokeRestart [18:41:25.439] is.null <- base::is.null [18:41:25.439] muffled <- FALSE [18:41:25.439] if (inherits(cond, "message")) { [18:41:25.439] muffled <- grepl(pattern, "muffleMessage") [18:41:25.439] if (muffled) [18:41:25.439] invokeRestart("muffleMessage") [18:41:25.439] } [18:41:25.439] else if (inherits(cond, "warning")) { [18:41:25.439] muffled <- grepl(pattern, "muffleWarning") [18:41:25.439] if (muffled) [18:41:25.439] invokeRestart("muffleWarning") [18:41:25.439] } [18:41:25.439] else if (inherits(cond, "condition")) { [18:41:25.439] if (!is.null(pattern)) { [18:41:25.439] computeRestarts <- base::computeRestarts [18:41:25.439] grepl <- base::grepl [18:41:25.439] restarts <- computeRestarts(cond) [18:41:25.439] for (restart in restarts) { [18:41:25.439] name <- restart$name [18:41:25.439] if (is.null(name)) [18:41:25.439] next [18:41:25.439] if (!grepl(pattern, name)) [18:41:25.439] next [18:41:25.439] invokeRestart(restart) [18:41:25.439] muffled <- TRUE [18:41:25.439] break [18:41:25.439] } [18:41:25.439] } [18:41:25.439] } [18:41:25.439] invisible(muffled) [18:41:25.439] } [18:41:25.439] muffleCondition(cond, pattern = "^muffle") [18:41:25.439] } [18:41:25.439] } [18:41:25.439] else { [18:41:25.439] if (TRUE) { [18:41:25.439] muffleCondition <- function (cond, pattern = "^muffle") [18:41:25.439] { [18:41:25.439] inherits <- base::inherits [18:41:25.439] invokeRestart <- base::invokeRestart [18:41:25.439] is.null <- base::is.null [18:41:25.439] muffled <- FALSE [18:41:25.439] if (inherits(cond, "message")) { [18:41:25.439] muffled <- grepl(pattern, "muffleMessage") [18:41:25.439] if (muffled) [18:41:25.439] invokeRestart("muffleMessage") [18:41:25.439] } [18:41:25.439] else if (inherits(cond, "warning")) { [18:41:25.439] muffled <- grepl(pattern, "muffleWarning") [18:41:25.439] if (muffled) [18:41:25.439] invokeRestart("muffleWarning") [18:41:25.439] } [18:41:25.439] else if (inherits(cond, "condition")) { [18:41:25.439] if (!is.null(pattern)) { [18:41:25.439] computeRestarts <- base::computeRestarts [18:41:25.439] grepl <- base::grepl [18:41:25.439] restarts <- computeRestarts(cond) [18:41:25.439] for (restart in restarts) { [18:41:25.439] name <- restart$name [18:41:25.439] if (is.null(name)) [18:41:25.439] next [18:41:25.439] if (!grepl(pattern, name)) [18:41:25.439] next [18:41:25.439] invokeRestart(restart) [18:41:25.439] muffled <- TRUE [18:41:25.439] break [18:41:25.439] } [18:41:25.439] } [18:41:25.439] } [18:41:25.439] invisible(muffled) [18:41:25.439] } [18:41:25.439] muffleCondition(cond, pattern = "^muffle") [18:41:25.439] } [18:41:25.439] } [18:41:25.439] } [18:41:25.439] })) [18:41:25.439] }, error = function(ex) { [18:41:25.439] base::structure(base::list(value = NULL, visible = NULL, [18:41:25.439] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:25.439] ...future.rng), started = ...future.startTime, [18:41:25.439] finished = Sys.time(), session_uuid = NA_character_, [18:41:25.439] version = "1.8"), class = "FutureResult") [18:41:25.439] }, finally = { [18:41:25.439] if (!identical(...future.workdir, getwd())) [18:41:25.439] setwd(...future.workdir) [18:41:25.439] { [18:41:25.439] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:25.439] ...future.oldOptions$nwarnings <- NULL [18:41:25.439] } [18:41:25.439] base::options(...future.oldOptions) [18:41:25.439] if (.Platform$OS.type == "windows") { [18:41:25.439] old_names <- names(...future.oldEnvVars) [18:41:25.439] envs <- base::Sys.getenv() [18:41:25.439] names <- names(envs) [18:41:25.439] common <- intersect(names, old_names) [18:41:25.439] added <- setdiff(names, old_names) [18:41:25.439] removed <- setdiff(old_names, names) [18:41:25.439] changed <- common[...future.oldEnvVars[common] != [18:41:25.439] envs[common]] [18:41:25.439] NAMES <- toupper(changed) [18:41:25.439] args <- list() [18:41:25.439] for (kk in seq_along(NAMES)) { [18:41:25.439] name <- changed[[kk]] [18:41:25.439] NAME <- NAMES[[kk]] [18:41:25.439] if (name != NAME && is.element(NAME, old_names)) [18:41:25.439] next [18:41:25.439] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:25.439] } [18:41:25.439] NAMES <- toupper(added) [18:41:25.439] for (kk in seq_along(NAMES)) { [18:41:25.439] name <- added[[kk]] [18:41:25.439] NAME <- NAMES[[kk]] [18:41:25.439] if (name != NAME && is.element(NAME, old_names)) [18:41:25.439] next [18:41:25.439] args[[name]] <- "" [18:41:25.439] } [18:41:25.439] NAMES <- toupper(removed) [18:41:25.439] for (kk in seq_along(NAMES)) { [18:41:25.439] name <- removed[[kk]] [18:41:25.439] NAME <- NAMES[[kk]] [18:41:25.439] if (name != NAME && is.element(NAME, old_names)) [18:41:25.439] next [18:41:25.439] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:25.439] } [18:41:25.439] if (length(args) > 0) [18:41:25.439] base::do.call(base::Sys.setenv, args = args) [18:41:25.439] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:25.439] } [18:41:25.439] else { [18:41:25.439] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:25.439] } [18:41:25.439] { [18:41:25.439] if (base::length(...future.futureOptionsAdded) > [18:41:25.439] 0L) { [18:41:25.439] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:25.439] base::names(opts) <- ...future.futureOptionsAdded [18:41:25.439] base::options(opts) [18:41:25.439] } [18:41:25.439] { [18:41:25.439] { [18:41:25.439] base::options(mc.cores = ...future.mc.cores.old) [18:41:25.439] NULL [18:41:25.439] } [18:41:25.439] options(future.plan = NULL) [18:41:25.439] if (is.na(NA_character_)) [18:41:25.439] Sys.unsetenv("R_FUTURE_PLAN") [18:41:25.439] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:25.439] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:25.439] .init = FALSE) [18:41:25.439] } [18:41:25.439] } [18:41:25.439] } [18:41:25.439] }) [18:41:25.439] if (TRUE) { [18:41:25.439] base::sink(type = "output", split = FALSE) [18:41:25.439] if (TRUE) { [18:41:25.439] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:25.439] } [18:41:25.439] else { [18:41:25.439] ...future.result["stdout"] <- base::list(NULL) [18:41:25.439] } [18:41:25.439] base::close(...future.stdout) [18:41:25.439] ...future.stdout <- NULL [18:41:25.439] } [18:41:25.439] ...future.result$conditions <- ...future.conditions [18:41:25.439] ...future.result$finished <- base::Sys.time() [18:41:25.439] ...future.result [18:41:25.439] } [18:41:25.445] Exporting 5 global objects (2.02 KiB) to cluster node #1 ... [18:41:25.445] Exporting '...future.FUN' (911 bytes) to cluster node #1 ... [18:41:25.445] Exporting '...future.FUN' (911 bytes) to cluster node #1 ... DONE [18:41:25.445] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:25.446] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:25.446] Exporting '...future.elements_ii' (569 bytes) to cluster node #1 ... [18:41:25.447] Exporting '...future.elements_ii' (569 bytes) to cluster node #1 ... DONE [18:41:25.447] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:25.447] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:25.447] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:25.448] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:25.448] Exporting 5 global objects (2.02 KiB) to cluster node #1 ... DONE [18:41:25.449] MultisessionFuture started [18:41:25.449] - Launch lazy future ... done [18:41:25.449] run() for 'MultisessionFuture' ... done [18:41:25.449] Created future: [18:41:25.468] receiveMessageFromWorker() for ClusterFuture ... [18:41:25.468] - Validating connection of MultisessionFuture [18:41:25.468] - received message: FutureResult [18:41:25.468] - Received FutureResult [18:41:25.469] - Erased future from FutureRegistry [18:41:25.469] result() for ClusterFuture ... [18:41:25.469] - result already collected: FutureResult [18:41:25.469] result() for ClusterFuture ... done [18:41:25.469] receiveMessageFromWorker() for ClusterFuture ... done [18:41:25.449] MultisessionFuture: [18:41:25.449] Label: 'future_lapply-1' [18:41:25.449] Expression: [18:41:25.449] { [18:41:25.449] do.call(function(...) { [18:41:25.449] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:25.449] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:25.449] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:25.449] on.exit(options(oopts), add = TRUE) [18:41:25.449] } [18:41:25.449] { [18:41:25.449] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:25.449] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:25.449] ...future.FUN(...future.X_jj, ...) [18:41:25.449] }) [18:41:25.449] } [18:41:25.449] }, args = future.call.arguments) [18:41:25.449] } [18:41:25.449] Lazy evaluation: FALSE [18:41:25.449] Asynchronous evaluation: TRUE [18:41:25.449] Local evaluation: TRUE [18:41:25.449] Environment: R_GlobalEnv [18:41:25.449] Capture standard output: TRUE [18:41:25.449] Capture condition classes: 'condition' (excluding 'nothing') [18:41:25.449] Globals: 5 objects totaling 1.59 KiB (function '...future.FUN' of 911 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 569 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:25.449] Packages: 1 packages ('listenv') [18:41:25.449] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:25.449] Resolved: TRUE [18:41:25.449] Value: [18:41:25.449] Conditions captured: [18:41:25.449] Early signaling: FALSE [18:41:25.449] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:25.449] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:25.470] Chunk #1 of 2 ... DONE [18:41:25.470] Chunk #2 of 2 ... [18:41:25.470] - Finding globals in 'X' for chunk #2 ... [18:41:25.470] getGlobalsAndPackages() ... [18:41:25.471] Searching for globals... [18:41:25.471] [18:41:25.471] Searching for globals ... DONE [18:41:25.472] - globals: [0] [18:41:25.472] getGlobalsAndPackages() ... DONE [18:41:25.472] + additional globals found: [n=0] [18:41:25.472] + additional namespaces needed: [n=0] [18:41:25.472] - Finding globals in 'X' for chunk #2 ... DONE [18:41:25.473] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:25.473] - seeds: [18:41:25.473] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:25.473] getGlobalsAndPackages() ... [18:41:25.473] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:25.473] Resolving globals: FALSE [18:41:25.474] Tweak future expression to call with '...' arguments ... [18:41:25.474] { [18:41:25.474] do.call(function(...) { [18:41:25.474] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:25.474] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:25.474] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:25.474] on.exit(options(oopts), add = TRUE) [18:41:25.474] } [18:41:25.474] { [18:41:25.474] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:25.474] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:25.474] ...future.FUN(...future.X_jj, ...) [18:41:25.474] }) [18:41:25.474] } [18:41:25.474] }, args = future.call.arguments) [18:41:25.474] } [18:41:25.474] Tweak future expression to call with '...' arguments ... DONE [18:41:25.475] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:25.475] - packages: [1] 'listenv' [18:41:25.476] getGlobalsAndPackages() ... DONE [18:41:25.476] run() for 'Future' ... [18:41:25.476] - state: 'created' [18:41:25.477] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:25.494] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:25.495] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:25.495] - Field: 'node' [18:41:25.495] - Field: 'label' [18:41:25.495] - Field: 'local' [18:41:25.495] - Field: 'owner' [18:41:25.496] - Field: 'envir' [18:41:25.496] - Field: 'workers' [18:41:25.496] - Field: 'packages' [18:41:25.496] - Field: 'gc' [18:41:25.496] - Field: 'conditions' [18:41:25.497] - Field: 'persistent' [18:41:25.497] - Field: 'expr' [18:41:25.497] - Field: 'uuid' [18:41:25.497] - Field: 'seed' [18:41:25.497] - Field: 'version' [18:41:25.498] - Field: 'result' [18:41:25.498] - Field: 'asynchronous' [18:41:25.498] - Field: 'calls' [18:41:25.498] - Field: 'globals' [18:41:25.498] - Field: 'stdout' [18:41:25.499] - Field: 'earlySignal' [18:41:25.499] - Field: 'lazy' [18:41:25.499] - Field: 'state' [18:41:25.499] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:25.499] - Launch lazy future ... [18:41:25.500] Packages needed by the future expression (n = 1): 'listenv' [18:41:25.500] Packages needed by future strategies (n = 0): [18:41:25.501] { [18:41:25.501] { [18:41:25.501] { [18:41:25.501] ...future.startTime <- base::Sys.time() [18:41:25.501] { [18:41:25.501] { [18:41:25.501] { [18:41:25.501] { [18:41:25.501] { [18:41:25.501] base::local({ [18:41:25.501] has_future <- base::requireNamespace("future", [18:41:25.501] quietly = TRUE) [18:41:25.501] if (has_future) { [18:41:25.501] ns <- base::getNamespace("future") [18:41:25.501] version <- ns[[".package"]][["version"]] [18:41:25.501] if (is.null(version)) [18:41:25.501] version <- utils::packageVersion("future") [18:41:25.501] } [18:41:25.501] else { [18:41:25.501] version <- NULL [18:41:25.501] } [18:41:25.501] if (!has_future || version < "1.8.0") { [18:41:25.501] info <- base::c(r_version = base::gsub("R version ", [18:41:25.501] "", base::R.version$version.string), [18:41:25.501] platform = base::sprintf("%s (%s-bit)", [18:41:25.501] base::R.version$platform, 8 * [18:41:25.501] base::.Machine$sizeof.pointer), [18:41:25.501] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:25.501] "release", "version")], collapse = " "), [18:41:25.501] hostname = base::Sys.info()[["nodename"]]) [18:41:25.501] info <- base::sprintf("%s: %s", base::names(info), [18:41:25.501] info) [18:41:25.501] info <- base::paste(info, collapse = "; ") [18:41:25.501] if (!has_future) { [18:41:25.501] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:25.501] info) [18:41:25.501] } [18:41:25.501] else { [18:41:25.501] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:25.501] info, version) [18:41:25.501] } [18:41:25.501] base::stop(msg) [18:41:25.501] } [18:41:25.501] }) [18:41:25.501] } [18:41:25.501] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:25.501] base::options(mc.cores = 1L) [18:41:25.501] } [18:41:25.501] base::local({ [18:41:25.501] for (pkg in "listenv") { [18:41:25.501] base::loadNamespace(pkg) [18:41:25.501] base::library(pkg, character.only = TRUE) [18:41:25.501] } [18:41:25.501] }) [18:41:25.501] } [18:41:25.501] ...future.strategy.old <- future::plan("list") [18:41:25.501] options(future.plan = NULL) [18:41:25.501] Sys.unsetenv("R_FUTURE_PLAN") [18:41:25.501] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:25.501] } [18:41:25.501] ...future.workdir <- getwd() [18:41:25.501] } [18:41:25.501] ...future.oldOptions <- base::as.list(base::.Options) [18:41:25.501] ...future.oldEnvVars <- base::Sys.getenv() [18:41:25.501] } [18:41:25.501] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:25.501] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:25.501] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:25.501] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:25.501] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:25.501] future.stdout.windows.reencode = NULL, width = 80L) [18:41:25.501] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:25.501] base::names(...future.oldOptions)) [18:41:25.501] } [18:41:25.501] if (FALSE) { [18:41:25.501] } [18:41:25.501] else { [18:41:25.501] if (TRUE) { [18:41:25.501] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:25.501] open = "w") [18:41:25.501] } [18:41:25.501] else { [18:41:25.501] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:25.501] windows = "NUL", "/dev/null"), open = "w") [18:41:25.501] } [18:41:25.501] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:25.501] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:25.501] base::sink(type = "output", split = FALSE) [18:41:25.501] base::close(...future.stdout) [18:41:25.501] }, add = TRUE) [18:41:25.501] } [18:41:25.501] ...future.frame <- base::sys.nframe() [18:41:25.501] ...future.conditions <- base::list() [18:41:25.501] ...future.rng <- base::globalenv()$.Random.seed [18:41:25.501] if (FALSE) { [18:41:25.501] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:25.501] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:25.501] } [18:41:25.501] ...future.result <- base::tryCatch({ [18:41:25.501] base::withCallingHandlers({ [18:41:25.501] ...future.value <- base::withVisible(base::local({ [18:41:25.501] ...future.makeSendCondition <- base::local({ [18:41:25.501] sendCondition <- NULL [18:41:25.501] function(frame = 1L) { [18:41:25.501] if (is.function(sendCondition)) [18:41:25.501] return(sendCondition) [18:41:25.501] ns <- getNamespace("parallel") [18:41:25.501] if (exists("sendData", mode = "function", [18:41:25.501] envir = ns)) { [18:41:25.501] parallel_sendData <- get("sendData", mode = "function", [18:41:25.501] envir = ns) [18:41:25.501] envir <- sys.frame(frame) [18:41:25.501] master <- NULL [18:41:25.501] while (!identical(envir, .GlobalEnv) && [18:41:25.501] !identical(envir, emptyenv())) { [18:41:25.501] if (exists("master", mode = "list", envir = envir, [18:41:25.501] inherits = FALSE)) { [18:41:25.501] master <- get("master", mode = "list", [18:41:25.501] envir = envir, inherits = FALSE) [18:41:25.501] if (inherits(master, c("SOCKnode", [18:41:25.501] "SOCK0node"))) { [18:41:25.501] sendCondition <<- function(cond) { [18:41:25.501] data <- list(type = "VALUE", value = cond, [18:41:25.501] success = TRUE) [18:41:25.501] parallel_sendData(master, data) [18:41:25.501] } [18:41:25.501] return(sendCondition) [18:41:25.501] } [18:41:25.501] } [18:41:25.501] frame <- frame + 1L [18:41:25.501] envir <- sys.frame(frame) [18:41:25.501] } [18:41:25.501] } [18:41:25.501] sendCondition <<- function(cond) NULL [18:41:25.501] } [18:41:25.501] }) [18:41:25.501] withCallingHandlers({ [18:41:25.501] { [18:41:25.501] do.call(function(...) { [18:41:25.501] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:25.501] if (!identical(...future.globals.maxSize.org, [18:41:25.501] ...future.globals.maxSize)) { [18:41:25.501] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:25.501] on.exit(options(oopts), add = TRUE) [18:41:25.501] } [18:41:25.501] { [18:41:25.501] lapply(seq_along(...future.elements_ii), [18:41:25.501] FUN = function(jj) { [18:41:25.501] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:25.501] ...future.FUN(...future.X_jj, ...) [18:41:25.501] }) [18:41:25.501] } [18:41:25.501] }, args = future.call.arguments) [18:41:25.501] } [18:41:25.501] }, immediateCondition = function(cond) { [18:41:25.501] sendCondition <- ...future.makeSendCondition() [18:41:25.501] sendCondition(cond) [18:41:25.501] muffleCondition <- function (cond, pattern = "^muffle") [18:41:25.501] { [18:41:25.501] inherits <- base::inherits [18:41:25.501] invokeRestart <- base::invokeRestart [18:41:25.501] is.null <- base::is.null [18:41:25.501] muffled <- FALSE [18:41:25.501] if (inherits(cond, "message")) { [18:41:25.501] muffled <- grepl(pattern, "muffleMessage") [18:41:25.501] if (muffled) [18:41:25.501] invokeRestart("muffleMessage") [18:41:25.501] } [18:41:25.501] else if (inherits(cond, "warning")) { [18:41:25.501] muffled <- grepl(pattern, "muffleWarning") [18:41:25.501] if (muffled) [18:41:25.501] invokeRestart("muffleWarning") [18:41:25.501] } [18:41:25.501] else if (inherits(cond, "condition")) { [18:41:25.501] if (!is.null(pattern)) { [18:41:25.501] computeRestarts <- base::computeRestarts [18:41:25.501] grepl <- base::grepl [18:41:25.501] restarts <- computeRestarts(cond) [18:41:25.501] for (restart in restarts) { [18:41:25.501] name <- restart$name [18:41:25.501] if (is.null(name)) [18:41:25.501] next [18:41:25.501] if (!grepl(pattern, name)) [18:41:25.501] next [18:41:25.501] invokeRestart(restart) [18:41:25.501] muffled <- TRUE [18:41:25.501] break [18:41:25.501] } [18:41:25.501] } [18:41:25.501] } [18:41:25.501] invisible(muffled) [18:41:25.501] } [18:41:25.501] muffleCondition(cond) [18:41:25.501] }) [18:41:25.501] })) [18:41:25.501] future::FutureResult(value = ...future.value$value, [18:41:25.501] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:25.501] ...future.rng), globalenv = if (FALSE) [18:41:25.501] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:25.501] ...future.globalenv.names)) [18:41:25.501] else NULL, started = ...future.startTime, version = "1.8") [18:41:25.501] }, condition = base::local({ [18:41:25.501] c <- base::c [18:41:25.501] inherits <- base::inherits [18:41:25.501] invokeRestart <- base::invokeRestart [18:41:25.501] length <- base::length [18:41:25.501] list <- base::list [18:41:25.501] seq.int <- base::seq.int [18:41:25.501] signalCondition <- base::signalCondition [18:41:25.501] sys.calls <- base::sys.calls [18:41:25.501] `[[` <- base::`[[` [18:41:25.501] `+` <- base::`+` [18:41:25.501] `<<-` <- base::`<<-` [18:41:25.501] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:25.501] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:25.501] 3L)] [18:41:25.501] } [18:41:25.501] function(cond) { [18:41:25.501] is_error <- inherits(cond, "error") [18:41:25.501] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:25.501] NULL) [18:41:25.501] if (is_error) { [18:41:25.501] sessionInformation <- function() { [18:41:25.501] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:25.501] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:25.501] search = base::search(), system = base::Sys.info()) [18:41:25.501] } [18:41:25.501] ...future.conditions[[length(...future.conditions) + [18:41:25.501] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:25.501] cond$call), session = sessionInformation(), [18:41:25.501] timestamp = base::Sys.time(), signaled = 0L) [18:41:25.501] signalCondition(cond) [18:41:25.501] } [18:41:25.501] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:25.501] "immediateCondition"))) { [18:41:25.501] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:25.501] ...future.conditions[[length(...future.conditions) + [18:41:25.501] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:25.501] if (TRUE && !signal) { [18:41:25.501] muffleCondition <- function (cond, pattern = "^muffle") [18:41:25.501] { [18:41:25.501] inherits <- base::inherits [18:41:25.501] invokeRestart <- base::invokeRestart [18:41:25.501] is.null <- base::is.null [18:41:25.501] muffled <- FALSE [18:41:25.501] if (inherits(cond, "message")) { [18:41:25.501] muffled <- grepl(pattern, "muffleMessage") [18:41:25.501] if (muffled) [18:41:25.501] invokeRestart("muffleMessage") [18:41:25.501] } [18:41:25.501] else if (inherits(cond, "warning")) { [18:41:25.501] muffled <- grepl(pattern, "muffleWarning") [18:41:25.501] if (muffled) [18:41:25.501] invokeRestart("muffleWarning") [18:41:25.501] } [18:41:25.501] else if (inherits(cond, "condition")) { [18:41:25.501] if (!is.null(pattern)) { [18:41:25.501] computeRestarts <- base::computeRestarts [18:41:25.501] grepl <- base::grepl [18:41:25.501] restarts <- computeRestarts(cond) [18:41:25.501] for (restart in restarts) { [18:41:25.501] name <- restart$name [18:41:25.501] if (is.null(name)) [18:41:25.501] next [18:41:25.501] if (!grepl(pattern, name)) [18:41:25.501] next [18:41:25.501] invokeRestart(restart) [18:41:25.501] muffled <- TRUE [18:41:25.501] break [18:41:25.501] } [18:41:25.501] } [18:41:25.501] } [18:41:25.501] invisible(muffled) [18:41:25.501] } [18:41:25.501] muffleCondition(cond, pattern = "^muffle") [18:41:25.501] } [18:41:25.501] } [18:41:25.501] else { [18:41:25.501] if (TRUE) { [18:41:25.501] muffleCondition <- function (cond, pattern = "^muffle") [18:41:25.501] { [18:41:25.501] inherits <- base::inherits [18:41:25.501] invokeRestart <- base::invokeRestart [18:41:25.501] is.null <- base::is.null [18:41:25.501] muffled <- FALSE [18:41:25.501] if (inherits(cond, "message")) { [18:41:25.501] muffled <- grepl(pattern, "muffleMessage") [18:41:25.501] if (muffled) [18:41:25.501] invokeRestart("muffleMessage") [18:41:25.501] } [18:41:25.501] else if (inherits(cond, "warning")) { [18:41:25.501] muffled <- grepl(pattern, "muffleWarning") [18:41:25.501] if (muffled) [18:41:25.501] invokeRestart("muffleWarning") [18:41:25.501] } [18:41:25.501] else if (inherits(cond, "condition")) { [18:41:25.501] if (!is.null(pattern)) { [18:41:25.501] computeRestarts <- base::computeRestarts [18:41:25.501] grepl <- base::grepl [18:41:25.501] restarts <- computeRestarts(cond) [18:41:25.501] for (restart in restarts) { [18:41:25.501] name <- restart$name [18:41:25.501] if (is.null(name)) [18:41:25.501] next [18:41:25.501] if (!grepl(pattern, name)) [18:41:25.501] next [18:41:25.501] invokeRestart(restart) [18:41:25.501] muffled <- TRUE [18:41:25.501] break [18:41:25.501] } [18:41:25.501] } [18:41:25.501] } [18:41:25.501] invisible(muffled) [18:41:25.501] } [18:41:25.501] muffleCondition(cond, pattern = "^muffle") [18:41:25.501] } [18:41:25.501] } [18:41:25.501] } [18:41:25.501] })) [18:41:25.501] }, error = function(ex) { [18:41:25.501] base::structure(base::list(value = NULL, visible = NULL, [18:41:25.501] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:25.501] ...future.rng), started = ...future.startTime, [18:41:25.501] finished = Sys.time(), session_uuid = NA_character_, [18:41:25.501] version = "1.8"), class = "FutureResult") [18:41:25.501] }, finally = { [18:41:25.501] if (!identical(...future.workdir, getwd())) [18:41:25.501] setwd(...future.workdir) [18:41:25.501] { [18:41:25.501] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:25.501] ...future.oldOptions$nwarnings <- NULL [18:41:25.501] } [18:41:25.501] base::options(...future.oldOptions) [18:41:25.501] if (.Platform$OS.type == "windows") { [18:41:25.501] old_names <- names(...future.oldEnvVars) [18:41:25.501] envs <- base::Sys.getenv() [18:41:25.501] names <- names(envs) [18:41:25.501] common <- intersect(names, old_names) [18:41:25.501] added <- setdiff(names, old_names) [18:41:25.501] removed <- setdiff(old_names, names) [18:41:25.501] changed <- common[...future.oldEnvVars[common] != [18:41:25.501] envs[common]] [18:41:25.501] NAMES <- toupper(changed) [18:41:25.501] args <- list() [18:41:25.501] for (kk in seq_along(NAMES)) { [18:41:25.501] name <- changed[[kk]] [18:41:25.501] NAME <- NAMES[[kk]] [18:41:25.501] if (name != NAME && is.element(NAME, old_names)) [18:41:25.501] next [18:41:25.501] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:25.501] } [18:41:25.501] NAMES <- toupper(added) [18:41:25.501] for (kk in seq_along(NAMES)) { [18:41:25.501] name <- added[[kk]] [18:41:25.501] NAME <- NAMES[[kk]] [18:41:25.501] if (name != NAME && is.element(NAME, old_names)) [18:41:25.501] next [18:41:25.501] args[[name]] <- "" [18:41:25.501] } [18:41:25.501] NAMES <- toupper(removed) [18:41:25.501] for (kk in seq_along(NAMES)) { [18:41:25.501] name <- removed[[kk]] [18:41:25.501] NAME <- NAMES[[kk]] [18:41:25.501] if (name != NAME && is.element(NAME, old_names)) [18:41:25.501] next [18:41:25.501] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:25.501] } [18:41:25.501] if (length(args) > 0) [18:41:25.501] base::do.call(base::Sys.setenv, args = args) [18:41:25.501] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:25.501] } [18:41:25.501] else { [18:41:25.501] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:25.501] } [18:41:25.501] { [18:41:25.501] if (base::length(...future.futureOptionsAdded) > [18:41:25.501] 0L) { [18:41:25.501] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:25.501] base::names(opts) <- ...future.futureOptionsAdded [18:41:25.501] base::options(opts) [18:41:25.501] } [18:41:25.501] { [18:41:25.501] { [18:41:25.501] base::options(mc.cores = ...future.mc.cores.old) [18:41:25.501] NULL [18:41:25.501] } [18:41:25.501] options(future.plan = NULL) [18:41:25.501] if (is.na(NA_character_)) [18:41:25.501] Sys.unsetenv("R_FUTURE_PLAN") [18:41:25.501] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:25.501] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:25.501] .init = FALSE) [18:41:25.501] } [18:41:25.501] } [18:41:25.501] } [18:41:25.501] }) [18:41:25.501] if (TRUE) { [18:41:25.501] base::sink(type = "output", split = FALSE) [18:41:25.501] if (TRUE) { [18:41:25.501] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:25.501] } [18:41:25.501] else { [18:41:25.501] ...future.result["stdout"] <- base::list(NULL) [18:41:25.501] } [18:41:25.501] base::close(...future.stdout) [18:41:25.501] ...future.stdout <- NULL [18:41:25.501] } [18:41:25.501] ...future.result$conditions <- ...future.conditions [18:41:25.501] ...future.result$finished <- base::Sys.time() [18:41:25.501] ...future.result [18:41:25.501] } [18:41:25.507] Exporting 5 global objects (4.14 KiB) to cluster node #1 ... [18:41:25.507] Exporting '...future.FUN' (911 bytes) to cluster node #1 ... [18:41:25.508] Exporting '...future.FUN' (911 bytes) to cluster node #1 ... DONE [18:41:25.508] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:25.508] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:25.508] Exporting '...future.elements_ii' (2.67 KiB) to cluster node #1 ... [18:41:25.509] Exporting '...future.elements_ii' (2.67 KiB) to cluster node #1 ... DONE [18:41:25.509] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:25.510] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:25.510] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:25.510] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:25.510] Exporting 5 global objects (4.14 KiB) to cluster node #1 ... DONE [18:41:25.511] MultisessionFuture started [18:41:25.511] - Launch lazy future ... done [18:41:25.511] run() for 'MultisessionFuture' ... done [18:41:25.512] Created future: [18:41:25.527] receiveMessageFromWorker() for ClusterFuture ... [18:41:25.528] - Validating connection of MultisessionFuture [18:41:25.528] - received message: FutureResult [18:41:25.528] - Received FutureResult [18:41:25.528] - Erased future from FutureRegistry [18:41:25.529] result() for ClusterFuture ... [18:41:25.529] - result already collected: FutureResult [18:41:25.529] result() for ClusterFuture ... done [18:41:25.529] receiveMessageFromWorker() for ClusterFuture ... done [18:41:25.512] MultisessionFuture: [18:41:25.512] Label: 'future_lapply-2' [18:41:25.512] Expression: [18:41:25.512] { [18:41:25.512] do.call(function(...) { [18:41:25.512] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:25.512] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:25.512] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:25.512] on.exit(options(oopts), add = TRUE) [18:41:25.512] } [18:41:25.512] { [18:41:25.512] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:25.512] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:25.512] ...future.FUN(...future.X_jj, ...) [18:41:25.512] }) [18:41:25.512] } [18:41:25.512] }, args = future.call.arguments) [18:41:25.512] } [18:41:25.512] Lazy evaluation: FALSE [18:41:25.512] Asynchronous evaluation: TRUE [18:41:25.512] Local evaluation: TRUE [18:41:25.512] Environment: R_GlobalEnv [18:41:25.512] Capture standard output: TRUE [18:41:25.512] Capture condition classes: 'condition' (excluding 'nothing') [18:41:25.512] Globals: 5 objects totaling 3.71 KiB (function '...future.FUN' of 911 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 2.67 KiB, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:25.512] Packages: 1 packages ('listenv') [18:41:25.512] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:25.512] Resolved: TRUE [18:41:25.512] Value: [18:41:25.512] Conditions captured: [18:41:25.512] Early signaling: FALSE [18:41:25.512] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:25.512] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:25.530] Chunk #2 of 2 ... DONE [18:41:25.530] Launching 2 futures (chunks) ... DONE [18:41:25.530] Resolving 2 futures (chunks) ... [18:41:25.530] resolve() on list ... [18:41:25.530] recursive: 0 [18:41:25.531] length: 2 [18:41:25.531] [18:41:25.531] Future #1 [18:41:25.531] result() for ClusterFuture ... [18:41:25.531] - result already collected: FutureResult [18:41:25.531] result() for ClusterFuture ... done [18:41:25.532] result() for ClusterFuture ... [18:41:25.532] - result already collected: FutureResult [18:41:25.532] result() for ClusterFuture ... done [18:41:25.532] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:25.532] - nx: 2 [18:41:25.533] - relay: TRUE [18:41:25.533] - stdout: TRUE [18:41:25.533] - signal: TRUE [18:41:25.533] - resignal: FALSE [18:41:25.533] - force: TRUE [18:41:25.533] - relayed: [n=2] FALSE, FALSE [18:41:25.534] - queued futures: [n=2] FALSE, FALSE [18:41:25.534] - until=1 [18:41:25.534] - relaying element #1 [18:41:25.534] result() for ClusterFuture ... [18:41:25.537] - result already collected: FutureResult [18:41:25.537] result() for ClusterFuture ... done [18:41:25.538] result() for ClusterFuture ... [18:41:25.538] - result already collected: FutureResult [18:41:25.538] result() for ClusterFuture ... done [18:41:25.538] result() for ClusterFuture ... [18:41:25.538] - result already collected: FutureResult [18:41:25.539] result() for ClusterFuture ... done [18:41:25.539] result() for ClusterFuture ... [18:41:25.539] - result already collected: FutureResult [18:41:25.539] result() for ClusterFuture ... done [18:41:25.539] - relayed: [n=2] TRUE, FALSE [18:41:25.540] - queued futures: [n=2] TRUE, FALSE [18:41:25.540] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:25.540] length: 1 (resolved future 1) [18:41:25.540] Future #2 [18:41:25.540] result() for ClusterFuture ... [18:41:25.541] - result already collected: FutureResult [18:41:25.541] result() for ClusterFuture ... done [18:41:25.541] result() for ClusterFuture ... [18:41:25.541] - result already collected: FutureResult [18:41:25.541] result() for ClusterFuture ... done [18:41:25.541] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:25.542] - nx: 2 [18:41:25.542] - relay: TRUE [18:41:25.542] - stdout: TRUE [18:41:25.542] - signal: TRUE [18:41:25.542] - resignal: FALSE [18:41:25.542] - force: TRUE [18:41:25.543] - relayed: [n=2] TRUE, FALSE [18:41:25.543] - queued futures: [n=2] TRUE, FALSE [18:41:25.543] - until=2 [18:41:25.543] - relaying element #2 [18:41:25.543] result() for ClusterFuture ... [18:41:25.543] - result already collected: FutureResult [18:41:25.544] result() for ClusterFuture ... done [18:41:25.544] result() for ClusterFuture ... [18:41:25.544] - result already collected: FutureResult [18:41:25.544] result() for ClusterFuture ... done [18:41:25.544] result() for ClusterFuture ... [18:41:25.545] - result already collected: FutureResult [18:41:25.545] result() for ClusterFuture ... done [18:41:25.545] result() for ClusterFuture ... [18:41:25.545] - result already collected: FutureResult [18:41:25.545] result() for ClusterFuture ... done [18:41:25.545] - relayed: [n=2] TRUE, TRUE [18:41:25.545] - queued futures: [n=2] TRUE, TRUE [18:41:25.546] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:25.546] length: 0 (resolved future 2) [18:41:25.546] Relaying remaining futures [18:41:25.546] signalConditionsASAP(NULL, pos=0) ... [18:41:25.546] - nx: 2 [18:41:25.547] - relay: TRUE [18:41:25.547] - stdout: TRUE [18:41:25.547] - signal: TRUE [18:41:25.547] - resignal: FALSE [18:41:25.547] - force: TRUE [18:41:25.547] - relayed: [n=2] TRUE, TRUE [18:41:25.548] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:25.548] - relayed: [n=2] TRUE, TRUE [18:41:25.548] - queued futures: [n=2] TRUE, TRUE [18:41:25.548] signalConditionsASAP(NULL, pos=0) ... done [18:41:25.548] resolve() on list ... DONE [18:41:25.549] result() for ClusterFuture ... [18:41:25.549] - result already collected: FutureResult [18:41:25.549] result() for ClusterFuture ... done [18:41:25.549] result() for ClusterFuture ... [18:41:25.549] - result already collected: FutureResult [18:41:25.549] result() for ClusterFuture ... done [18:41:25.550] result() for ClusterFuture ... [18:41:25.550] - result already collected: FutureResult [18:41:25.550] result() for ClusterFuture ... done [18:41:25.550] result() for ClusterFuture ... [18:41:25.550] - result already collected: FutureResult [18:41:25.550] result() for ClusterFuture ... done [18:41:25.551] - Number of value chunks collected: 2 [18:41:25.551] Resolving 2 futures (chunks) ... DONE [18:41:25.551] Reducing values from 2 chunks ... [18:41:25.551] - Number of values collected after concatenation: 2 [18:41:25.551] - Number of values expected: 2 [18:41:25.551] Reverse index remapping (attribute 'ordering'): [n = 2] 1, 2 [18:41:25.552] Reducing values from 2 chunks ... DONE [18:41:25.552] future_lapply() ... DONE List of 1 $ y:List of 2 ..$ a: Named chr "A" .. ..- attr(*, "names")= chr "A" ..$ b: Named chr [1:2] "A" "B" .. ..- attr(*, "names")= chr [1:2] "A" "B" - future_lapply(x, FUN = vector, ...) ... [18:41:25.554] future_lapply() ... [18:41:25.558] Number of chunks: 2 [18:41:25.558] Index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [18:41:25.558] getGlobalsAndPackagesXApply() ... [18:41:25.558] - future.globals: TRUE [18:41:25.558] getGlobalsAndPackages() ... [18:41:25.559] Searching for globals... [18:41:25.560] - globals found: [2] 'FUN', '.Internal' [18:41:25.560] Searching for globals ... DONE [18:41:25.560] Resolving globals: FALSE [18:41:25.561] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:25.561] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:25.562] - globals: [1] 'FUN' [18:41:25.562] [18:41:25.562] getGlobalsAndPackages() ... DONE [18:41:25.562] - globals found/used: [n=1] 'FUN' [18:41:25.562] - needed namespaces: [n=0] [18:41:25.563] Finding globals ... DONE [18:41:25.563] - use_args: TRUE [18:41:25.563] - Getting '...' globals ... [18:41:25.563] resolve() on list ... [18:41:25.564] recursive: 0 [18:41:25.564] length: 1 [18:41:25.564] elements: '...' [18:41:25.564] length: 0 (resolved future 1) [18:41:25.564] resolve() on list ... DONE [18:41:25.565] - '...' content: [n=1] 'length' [18:41:25.565] List of 1 [18:41:25.565] $ ...:List of 1 [18:41:25.565] ..$ length: int 2 [18:41:25.565] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:25.565] - attr(*, "where")=List of 1 [18:41:25.565] ..$ ...: [18:41:25.565] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:25.565] - attr(*, "resolved")= logi TRUE [18:41:25.565] - attr(*, "total_size")= num NA [18:41:25.568] - Getting '...' globals ... DONE [18:41:25.569] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:25.569] List of 2 [18:41:25.569] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:25.569] $ ... :List of 1 [18:41:25.569] ..$ length: int 2 [18:41:25.569] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:25.569] - attr(*, "where")=List of 2 [18:41:25.569] ..$ ...future.FUN: [18:41:25.569] ..$ ... : [18:41:25.569] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:25.569] - attr(*, "resolved")= logi FALSE [18:41:25.569] - attr(*, "total_size")= int 4763 [18:41:25.573] Packages to be attached in all futures: [n=0] [18:41:25.573] getGlobalsAndPackagesXApply() ... DONE [18:41:25.574] Number of futures (= number of chunks): 2 [18:41:25.574] Launching 2 futures (chunks) ... [18:41:25.574] Chunk #1 of 2 ... [18:41:25.574] - Finding globals in 'X' for chunk #1 ... [18:41:25.574] getGlobalsAndPackages() ... [18:41:25.575] Searching for globals... [18:41:25.575] [18:41:25.575] Searching for globals ... DONE [18:41:25.575] - globals: [0] [18:41:25.576] getGlobalsAndPackages() ... DONE [18:41:25.576] + additional globals found: [n=0] [18:41:25.576] + additional namespaces needed: [n=0] [18:41:25.576] - Finding globals in 'X' for chunk #1 ... DONE [18:41:25.576] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:25.576] - seeds: [18:41:25.577] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:25.577] getGlobalsAndPackages() ... [18:41:25.577] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:25.577] Resolving globals: FALSE [18:41:25.577] Tweak future expression to call with '...' arguments ... [18:41:25.578] { [18:41:25.578] do.call(function(...) { [18:41:25.578] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:25.578] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:25.578] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:25.578] on.exit(options(oopts), add = TRUE) [18:41:25.578] } [18:41:25.578] { [18:41:25.578] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:25.578] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:25.578] ...future.FUN(...future.X_jj, ...) [18:41:25.578] }) [18:41:25.578] } [18:41:25.578] }, args = future.call.arguments) [18:41:25.578] } [18:41:25.578] Tweak future expression to call with '...' arguments ... DONE [18:41:25.579] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:25.579] [18:41:25.579] getGlobalsAndPackages() ... DONE [18:41:25.579] run() for 'Future' ... [18:41:25.580] - state: 'created' [18:41:25.580] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:25.597] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:25.597] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:25.597] - Field: 'node' [18:41:25.598] - Field: 'label' [18:41:25.598] - Field: 'local' [18:41:25.598] - Field: 'owner' [18:41:25.598] - Field: 'envir' [18:41:25.598] - Field: 'workers' [18:41:25.599] - Field: 'packages' [18:41:25.599] - Field: 'gc' [18:41:25.599] - Field: 'conditions' [18:41:25.599] - Field: 'persistent' [18:41:25.599] - Field: 'expr' [18:41:25.600] - Field: 'uuid' [18:41:25.600] - Field: 'seed' [18:41:25.600] - Field: 'version' [18:41:25.600] - Field: 'result' [18:41:25.600] - Field: 'asynchronous' [18:41:25.601] - Field: 'calls' [18:41:25.601] - Field: 'globals' [18:41:25.601] - Field: 'stdout' [18:41:25.601] - Field: 'earlySignal' [18:41:25.601] - Field: 'lazy' [18:41:25.601] - Field: 'state' [18:41:25.602] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:25.602] - Launch lazy future ... [18:41:25.602] Packages needed by the future expression (n = 0): [18:41:25.602] Packages needed by future strategies (n = 0): [18:41:25.603] { [18:41:25.603] { [18:41:25.603] { [18:41:25.603] ...future.startTime <- base::Sys.time() [18:41:25.603] { [18:41:25.603] { [18:41:25.603] { [18:41:25.603] { [18:41:25.603] base::local({ [18:41:25.603] has_future <- base::requireNamespace("future", [18:41:25.603] quietly = TRUE) [18:41:25.603] if (has_future) { [18:41:25.603] ns <- base::getNamespace("future") [18:41:25.603] version <- ns[[".package"]][["version"]] [18:41:25.603] if (is.null(version)) [18:41:25.603] version <- utils::packageVersion("future") [18:41:25.603] } [18:41:25.603] else { [18:41:25.603] version <- NULL [18:41:25.603] } [18:41:25.603] if (!has_future || version < "1.8.0") { [18:41:25.603] info <- base::c(r_version = base::gsub("R version ", [18:41:25.603] "", base::R.version$version.string), [18:41:25.603] platform = base::sprintf("%s (%s-bit)", [18:41:25.603] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:25.603] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:25.603] "release", "version")], collapse = " "), [18:41:25.603] hostname = base::Sys.info()[["nodename"]]) [18:41:25.603] info <- base::sprintf("%s: %s", base::names(info), [18:41:25.603] info) [18:41:25.603] info <- base::paste(info, collapse = "; ") [18:41:25.603] if (!has_future) { [18:41:25.603] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:25.603] info) [18:41:25.603] } [18:41:25.603] else { [18:41:25.603] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:25.603] info, version) [18:41:25.603] } [18:41:25.603] base::stop(msg) [18:41:25.603] } [18:41:25.603] }) [18:41:25.603] } [18:41:25.603] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:25.603] base::options(mc.cores = 1L) [18:41:25.603] } [18:41:25.603] ...future.strategy.old <- future::plan("list") [18:41:25.603] options(future.plan = NULL) [18:41:25.603] Sys.unsetenv("R_FUTURE_PLAN") [18:41:25.603] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:25.603] } [18:41:25.603] ...future.workdir <- getwd() [18:41:25.603] } [18:41:25.603] ...future.oldOptions <- base::as.list(base::.Options) [18:41:25.603] ...future.oldEnvVars <- base::Sys.getenv() [18:41:25.603] } [18:41:25.603] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:25.603] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:25.603] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:25.603] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:25.603] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:25.603] future.stdout.windows.reencode = NULL, width = 80L) [18:41:25.603] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:25.603] base::names(...future.oldOptions)) [18:41:25.603] } [18:41:25.603] if (FALSE) { [18:41:25.603] } [18:41:25.603] else { [18:41:25.603] if (TRUE) { [18:41:25.603] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:25.603] open = "w") [18:41:25.603] } [18:41:25.603] else { [18:41:25.603] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:25.603] windows = "NUL", "/dev/null"), open = "w") [18:41:25.603] } [18:41:25.603] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:25.603] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:25.603] base::sink(type = "output", split = FALSE) [18:41:25.603] base::close(...future.stdout) [18:41:25.603] }, add = TRUE) [18:41:25.603] } [18:41:25.603] ...future.frame <- base::sys.nframe() [18:41:25.603] ...future.conditions <- base::list() [18:41:25.603] ...future.rng <- base::globalenv()$.Random.seed [18:41:25.603] if (FALSE) { [18:41:25.603] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:25.603] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:25.603] } [18:41:25.603] ...future.result <- base::tryCatch({ [18:41:25.603] base::withCallingHandlers({ [18:41:25.603] ...future.value <- base::withVisible(base::local({ [18:41:25.603] ...future.makeSendCondition <- base::local({ [18:41:25.603] sendCondition <- NULL [18:41:25.603] function(frame = 1L) { [18:41:25.603] if (is.function(sendCondition)) [18:41:25.603] return(sendCondition) [18:41:25.603] ns <- getNamespace("parallel") [18:41:25.603] if (exists("sendData", mode = "function", [18:41:25.603] envir = ns)) { [18:41:25.603] parallel_sendData <- get("sendData", mode = "function", [18:41:25.603] envir = ns) [18:41:25.603] envir <- sys.frame(frame) [18:41:25.603] master <- NULL [18:41:25.603] while (!identical(envir, .GlobalEnv) && [18:41:25.603] !identical(envir, emptyenv())) { [18:41:25.603] if (exists("master", mode = "list", envir = envir, [18:41:25.603] inherits = FALSE)) { [18:41:25.603] master <- get("master", mode = "list", [18:41:25.603] envir = envir, inherits = FALSE) [18:41:25.603] if (inherits(master, c("SOCKnode", [18:41:25.603] "SOCK0node"))) { [18:41:25.603] sendCondition <<- function(cond) { [18:41:25.603] data <- list(type = "VALUE", value = cond, [18:41:25.603] success = TRUE) [18:41:25.603] parallel_sendData(master, data) [18:41:25.603] } [18:41:25.603] return(sendCondition) [18:41:25.603] } [18:41:25.603] } [18:41:25.603] frame <- frame + 1L [18:41:25.603] envir <- sys.frame(frame) [18:41:25.603] } [18:41:25.603] } [18:41:25.603] sendCondition <<- function(cond) NULL [18:41:25.603] } [18:41:25.603] }) [18:41:25.603] withCallingHandlers({ [18:41:25.603] { [18:41:25.603] do.call(function(...) { [18:41:25.603] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:25.603] if (!identical(...future.globals.maxSize.org, [18:41:25.603] ...future.globals.maxSize)) { [18:41:25.603] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:25.603] on.exit(options(oopts), add = TRUE) [18:41:25.603] } [18:41:25.603] { [18:41:25.603] lapply(seq_along(...future.elements_ii), [18:41:25.603] FUN = function(jj) { [18:41:25.603] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:25.603] ...future.FUN(...future.X_jj, ...) [18:41:25.603] }) [18:41:25.603] } [18:41:25.603] }, args = future.call.arguments) [18:41:25.603] } [18:41:25.603] }, immediateCondition = function(cond) { [18:41:25.603] sendCondition <- ...future.makeSendCondition() [18:41:25.603] sendCondition(cond) [18:41:25.603] muffleCondition <- function (cond, pattern = "^muffle") [18:41:25.603] { [18:41:25.603] inherits <- base::inherits [18:41:25.603] invokeRestart <- base::invokeRestart [18:41:25.603] is.null <- base::is.null [18:41:25.603] muffled <- FALSE [18:41:25.603] if (inherits(cond, "message")) { [18:41:25.603] muffled <- grepl(pattern, "muffleMessage") [18:41:25.603] if (muffled) [18:41:25.603] invokeRestart("muffleMessage") [18:41:25.603] } [18:41:25.603] else if (inherits(cond, "warning")) { [18:41:25.603] muffled <- grepl(pattern, "muffleWarning") [18:41:25.603] if (muffled) [18:41:25.603] invokeRestart("muffleWarning") [18:41:25.603] } [18:41:25.603] else if (inherits(cond, "condition")) { [18:41:25.603] if (!is.null(pattern)) { [18:41:25.603] computeRestarts <- base::computeRestarts [18:41:25.603] grepl <- base::grepl [18:41:25.603] restarts <- computeRestarts(cond) [18:41:25.603] for (restart in restarts) { [18:41:25.603] name <- restart$name [18:41:25.603] if (is.null(name)) [18:41:25.603] next [18:41:25.603] if (!grepl(pattern, name)) [18:41:25.603] next [18:41:25.603] invokeRestart(restart) [18:41:25.603] muffled <- TRUE [18:41:25.603] break [18:41:25.603] } [18:41:25.603] } [18:41:25.603] } [18:41:25.603] invisible(muffled) [18:41:25.603] } [18:41:25.603] muffleCondition(cond) [18:41:25.603] }) [18:41:25.603] })) [18:41:25.603] future::FutureResult(value = ...future.value$value, [18:41:25.603] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:25.603] ...future.rng), globalenv = if (FALSE) [18:41:25.603] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:25.603] ...future.globalenv.names)) [18:41:25.603] else NULL, started = ...future.startTime, version = "1.8") [18:41:25.603] }, condition = base::local({ [18:41:25.603] c <- base::c [18:41:25.603] inherits <- base::inherits [18:41:25.603] invokeRestart <- base::invokeRestart [18:41:25.603] length <- base::length [18:41:25.603] list <- base::list [18:41:25.603] seq.int <- base::seq.int [18:41:25.603] signalCondition <- base::signalCondition [18:41:25.603] sys.calls <- base::sys.calls [18:41:25.603] `[[` <- base::`[[` [18:41:25.603] `+` <- base::`+` [18:41:25.603] `<<-` <- base::`<<-` [18:41:25.603] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:25.603] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:25.603] 3L)] [18:41:25.603] } [18:41:25.603] function(cond) { [18:41:25.603] is_error <- inherits(cond, "error") [18:41:25.603] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:25.603] NULL) [18:41:25.603] if (is_error) { [18:41:25.603] sessionInformation <- function() { [18:41:25.603] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:25.603] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:25.603] search = base::search(), system = base::Sys.info()) [18:41:25.603] } [18:41:25.603] ...future.conditions[[length(...future.conditions) + [18:41:25.603] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:25.603] cond$call), session = sessionInformation(), [18:41:25.603] timestamp = base::Sys.time(), signaled = 0L) [18:41:25.603] signalCondition(cond) [18:41:25.603] } [18:41:25.603] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:25.603] "immediateCondition"))) { [18:41:25.603] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:25.603] ...future.conditions[[length(...future.conditions) + [18:41:25.603] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:25.603] if (TRUE && !signal) { [18:41:25.603] muffleCondition <- function (cond, pattern = "^muffle") [18:41:25.603] { [18:41:25.603] inherits <- base::inherits [18:41:25.603] invokeRestart <- base::invokeRestart [18:41:25.603] is.null <- base::is.null [18:41:25.603] muffled <- FALSE [18:41:25.603] if (inherits(cond, "message")) { [18:41:25.603] muffled <- grepl(pattern, "muffleMessage") [18:41:25.603] if (muffled) [18:41:25.603] invokeRestart("muffleMessage") [18:41:25.603] } [18:41:25.603] else if (inherits(cond, "warning")) { [18:41:25.603] muffled <- grepl(pattern, "muffleWarning") [18:41:25.603] if (muffled) [18:41:25.603] invokeRestart("muffleWarning") [18:41:25.603] } [18:41:25.603] else if (inherits(cond, "condition")) { [18:41:25.603] if (!is.null(pattern)) { [18:41:25.603] computeRestarts <- base::computeRestarts [18:41:25.603] grepl <- base::grepl [18:41:25.603] restarts <- computeRestarts(cond) [18:41:25.603] for (restart in restarts) { [18:41:25.603] name <- restart$name [18:41:25.603] if (is.null(name)) [18:41:25.603] next [18:41:25.603] if (!grepl(pattern, name)) [18:41:25.603] next [18:41:25.603] invokeRestart(restart) [18:41:25.603] muffled <- TRUE [18:41:25.603] break [18:41:25.603] } [18:41:25.603] } [18:41:25.603] } [18:41:25.603] invisible(muffled) [18:41:25.603] } [18:41:25.603] muffleCondition(cond, pattern = "^muffle") [18:41:25.603] } [18:41:25.603] } [18:41:25.603] else { [18:41:25.603] if (TRUE) { [18:41:25.603] muffleCondition <- function (cond, pattern = "^muffle") [18:41:25.603] { [18:41:25.603] inherits <- base::inherits [18:41:25.603] invokeRestart <- base::invokeRestart [18:41:25.603] is.null <- base::is.null [18:41:25.603] muffled <- FALSE [18:41:25.603] if (inherits(cond, "message")) { [18:41:25.603] muffled <- grepl(pattern, "muffleMessage") [18:41:25.603] if (muffled) [18:41:25.603] invokeRestart("muffleMessage") [18:41:25.603] } [18:41:25.603] else if (inherits(cond, "warning")) { [18:41:25.603] muffled <- grepl(pattern, "muffleWarning") [18:41:25.603] if (muffled) [18:41:25.603] invokeRestart("muffleWarning") [18:41:25.603] } [18:41:25.603] else if (inherits(cond, "condition")) { [18:41:25.603] if (!is.null(pattern)) { [18:41:25.603] computeRestarts <- base::computeRestarts [18:41:25.603] grepl <- base::grepl [18:41:25.603] restarts <- computeRestarts(cond) [18:41:25.603] for (restart in restarts) { [18:41:25.603] name <- restart$name [18:41:25.603] if (is.null(name)) [18:41:25.603] next [18:41:25.603] if (!grepl(pattern, name)) [18:41:25.603] next [18:41:25.603] invokeRestart(restart) [18:41:25.603] muffled <- TRUE [18:41:25.603] break [18:41:25.603] } [18:41:25.603] } [18:41:25.603] } [18:41:25.603] invisible(muffled) [18:41:25.603] } [18:41:25.603] muffleCondition(cond, pattern = "^muffle") [18:41:25.603] } [18:41:25.603] } [18:41:25.603] } [18:41:25.603] })) [18:41:25.603] }, error = function(ex) { [18:41:25.603] base::structure(base::list(value = NULL, visible = NULL, [18:41:25.603] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:25.603] ...future.rng), started = ...future.startTime, [18:41:25.603] finished = Sys.time(), session_uuid = NA_character_, [18:41:25.603] version = "1.8"), class = "FutureResult") [18:41:25.603] }, finally = { [18:41:25.603] if (!identical(...future.workdir, getwd())) [18:41:25.603] setwd(...future.workdir) [18:41:25.603] { [18:41:25.603] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:25.603] ...future.oldOptions$nwarnings <- NULL [18:41:25.603] } [18:41:25.603] base::options(...future.oldOptions) [18:41:25.603] if (.Platform$OS.type == "windows") { [18:41:25.603] old_names <- names(...future.oldEnvVars) [18:41:25.603] envs <- base::Sys.getenv() [18:41:25.603] names <- names(envs) [18:41:25.603] common <- intersect(names, old_names) [18:41:25.603] added <- setdiff(names, old_names) [18:41:25.603] removed <- setdiff(old_names, names) [18:41:25.603] changed <- common[...future.oldEnvVars[common] != [18:41:25.603] envs[common]] [18:41:25.603] NAMES <- toupper(changed) [18:41:25.603] args <- list() [18:41:25.603] for (kk in seq_along(NAMES)) { [18:41:25.603] name <- changed[[kk]] [18:41:25.603] NAME <- NAMES[[kk]] [18:41:25.603] if (name != NAME && is.element(NAME, old_names)) [18:41:25.603] next [18:41:25.603] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:25.603] } [18:41:25.603] NAMES <- toupper(added) [18:41:25.603] for (kk in seq_along(NAMES)) { [18:41:25.603] name <- added[[kk]] [18:41:25.603] NAME <- NAMES[[kk]] [18:41:25.603] if (name != NAME && is.element(NAME, old_names)) [18:41:25.603] next [18:41:25.603] args[[name]] <- "" [18:41:25.603] } [18:41:25.603] NAMES <- toupper(removed) [18:41:25.603] for (kk in seq_along(NAMES)) { [18:41:25.603] name <- removed[[kk]] [18:41:25.603] NAME <- NAMES[[kk]] [18:41:25.603] if (name != NAME && is.element(NAME, old_names)) [18:41:25.603] next [18:41:25.603] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:25.603] } [18:41:25.603] if (length(args) > 0) [18:41:25.603] base::do.call(base::Sys.setenv, args = args) [18:41:25.603] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:25.603] } [18:41:25.603] else { [18:41:25.603] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:25.603] } [18:41:25.603] { [18:41:25.603] if (base::length(...future.futureOptionsAdded) > [18:41:25.603] 0L) { [18:41:25.603] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:25.603] base::names(opts) <- ...future.futureOptionsAdded [18:41:25.603] base::options(opts) [18:41:25.603] } [18:41:25.603] { [18:41:25.603] { [18:41:25.603] base::options(mc.cores = ...future.mc.cores.old) [18:41:25.603] NULL [18:41:25.603] } [18:41:25.603] options(future.plan = NULL) [18:41:25.603] if (is.na(NA_character_)) [18:41:25.603] Sys.unsetenv("R_FUTURE_PLAN") [18:41:25.603] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:25.603] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:25.603] .init = FALSE) [18:41:25.603] } [18:41:25.603] } [18:41:25.603] } [18:41:25.603] }) [18:41:25.603] if (TRUE) { [18:41:25.603] base::sink(type = "output", split = FALSE) [18:41:25.603] if (TRUE) { [18:41:25.603] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:25.603] } [18:41:25.603] else { [18:41:25.603] ...future.result["stdout"] <- base::list(NULL) [18:41:25.603] } [18:41:25.603] base::close(...future.stdout) [18:41:25.603] ...future.stdout <- NULL [18:41:25.603] } [18:41:25.603] ...future.result$conditions <- ...future.conditions [18:41:25.603] ...future.result$finished <- base::Sys.time() [18:41:25.603] ...future.result [18:41:25.603] } [18:41:25.609] Exporting 5 global objects (1.20 KiB) to cluster node #1 ... [18:41:25.609] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... [18:41:25.610] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... DONE [18:41:25.610] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... [18:41:25.610] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... DONE [18:41:25.610] Exporting '...future.elements_ii' (127 bytes) to cluster node #1 ... [18:41:25.611] Exporting '...future.elements_ii' (127 bytes) to cluster node #1 ... DONE [18:41:25.611] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:25.611] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:25.612] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:25.612] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:25.612] Exporting 5 global objects (1.20 KiB) to cluster node #1 ... DONE [18:41:25.613] MultisessionFuture started [18:41:25.613] - Launch lazy future ... done [18:41:25.613] run() for 'MultisessionFuture' ... done [18:41:25.613] Created future: [18:41:25.631] receiveMessageFromWorker() for ClusterFuture ... [18:41:25.631] - Validating connection of MultisessionFuture [18:41:25.632] - received message: FutureResult [18:41:25.632] - Received FutureResult [18:41:25.632] - Erased future from FutureRegistry [18:41:25.632] result() for ClusterFuture ... [18:41:25.633] - result already collected: FutureResult [18:41:25.633] result() for ClusterFuture ... done [18:41:25.633] receiveMessageFromWorker() for ClusterFuture ... done [18:41:25.614] MultisessionFuture: [18:41:25.614] Label: 'future_lapply-1' [18:41:25.614] Expression: [18:41:25.614] { [18:41:25.614] do.call(function(...) { [18:41:25.614] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:25.614] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:25.614] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:25.614] on.exit(options(oopts), add = TRUE) [18:41:25.614] } [18:41:25.614] { [18:41:25.614] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:25.614] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:25.614] ...future.FUN(...future.X_jj, ...) [18:41:25.614] }) [18:41:25.614] } [18:41:25.614] }, args = future.call.arguments) [18:41:25.614] } [18:41:25.614] Lazy evaluation: FALSE [18:41:25.614] Asynchronous evaluation: TRUE [18:41:25.614] Local evaluation: TRUE [18:41:25.614] Environment: R_GlobalEnv [18:41:25.614] Capture standard output: TRUE [18:41:25.614] Capture condition classes: 'condition' (excluding 'nothing') [18:41:25.614] Globals: 5 objects totaling 789 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 127 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:25.614] Packages: [18:41:25.614] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:25.614] Resolved: TRUE [18:41:25.614] Value: [18:41:25.614] Conditions captured: [18:41:25.614] Early signaling: FALSE [18:41:25.614] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:25.614] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:25.633] Chunk #1 of 2 ... DONE [18:41:25.634] Chunk #2 of 2 ... [18:41:25.634] - Finding globals in 'X' for chunk #2 ... [18:41:25.634] getGlobalsAndPackages() ... [18:41:25.634] Searching for globals... [18:41:25.634] [18:41:25.635] Searching for globals ... DONE [18:41:25.635] - globals: [0] [18:41:25.635] getGlobalsAndPackages() ... DONE [18:41:25.635] + additional globals found: [n=0] [18:41:25.635] + additional namespaces needed: [n=0] [18:41:25.636] - Finding globals in 'X' for chunk #2 ... DONE [18:41:25.636] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:25.636] - seeds: [18:41:25.636] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:25.636] getGlobalsAndPackages() ... [18:41:25.636] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:25.637] Resolving globals: FALSE [18:41:25.637] Tweak future expression to call with '...' arguments ... [18:41:25.637] { [18:41:25.637] do.call(function(...) { [18:41:25.637] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:25.637] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:25.637] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:25.637] on.exit(options(oopts), add = TRUE) [18:41:25.637] } [18:41:25.637] { [18:41:25.637] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:25.637] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:25.637] ...future.FUN(...future.X_jj, ...) [18:41:25.637] }) [18:41:25.637] } [18:41:25.637] }, args = future.call.arguments) [18:41:25.637] } [18:41:25.637] Tweak future expression to call with '...' arguments ... DONE [18:41:25.638] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:25.638] [18:41:25.638] getGlobalsAndPackages() ... DONE [18:41:25.639] run() for 'Future' ... [18:41:25.639] - state: 'created' [18:41:25.639] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:25.657] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:25.657] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:25.657] - Field: 'node' [18:41:25.657] - Field: 'label' [18:41:25.657] - Field: 'local' [18:41:25.658] - Field: 'owner' [18:41:25.658] - Field: 'envir' [18:41:25.658] - Field: 'workers' [18:41:25.658] - Field: 'packages' [18:41:25.658] - Field: 'gc' [18:41:25.659] - Field: 'conditions' [18:41:25.659] - Field: 'persistent' [18:41:25.659] - Field: 'expr' [18:41:25.659] - Field: 'uuid' [18:41:25.659] - Field: 'seed' [18:41:25.660] - Field: 'version' [18:41:25.660] - Field: 'result' [18:41:25.660] - Field: 'asynchronous' [18:41:25.660] - Field: 'calls' [18:41:25.660] - Field: 'globals' [18:41:25.661] - Field: 'stdout' [18:41:25.661] - Field: 'earlySignal' [18:41:25.661] - Field: 'lazy' [18:41:25.661] - Field: 'state' [18:41:25.662] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:25.662] - Launch lazy future ... [18:41:25.662] Packages needed by the future expression (n = 0): [18:41:25.663] Packages needed by future strategies (n = 0): [18:41:25.663] { [18:41:25.663] { [18:41:25.663] { [18:41:25.663] ...future.startTime <- base::Sys.time() [18:41:25.663] { [18:41:25.663] { [18:41:25.663] { [18:41:25.663] { [18:41:25.663] base::local({ [18:41:25.663] has_future <- base::requireNamespace("future", [18:41:25.663] quietly = TRUE) [18:41:25.663] if (has_future) { [18:41:25.663] ns <- base::getNamespace("future") [18:41:25.663] version <- ns[[".package"]][["version"]] [18:41:25.663] if (is.null(version)) [18:41:25.663] version <- utils::packageVersion("future") [18:41:25.663] } [18:41:25.663] else { [18:41:25.663] version <- NULL [18:41:25.663] } [18:41:25.663] if (!has_future || version < "1.8.0") { [18:41:25.663] info <- base::c(r_version = base::gsub("R version ", [18:41:25.663] "", base::R.version$version.string), [18:41:25.663] platform = base::sprintf("%s (%s-bit)", [18:41:25.663] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:25.663] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:25.663] "release", "version")], collapse = " "), [18:41:25.663] hostname = base::Sys.info()[["nodename"]]) [18:41:25.663] info <- base::sprintf("%s: %s", base::names(info), [18:41:25.663] info) [18:41:25.663] info <- base::paste(info, collapse = "; ") [18:41:25.663] if (!has_future) { [18:41:25.663] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:25.663] info) [18:41:25.663] } [18:41:25.663] else { [18:41:25.663] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:25.663] info, version) [18:41:25.663] } [18:41:25.663] base::stop(msg) [18:41:25.663] } [18:41:25.663] }) [18:41:25.663] } [18:41:25.663] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:25.663] base::options(mc.cores = 1L) [18:41:25.663] } [18:41:25.663] ...future.strategy.old <- future::plan("list") [18:41:25.663] options(future.plan = NULL) [18:41:25.663] Sys.unsetenv("R_FUTURE_PLAN") [18:41:25.663] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:25.663] } [18:41:25.663] ...future.workdir <- getwd() [18:41:25.663] } [18:41:25.663] ...future.oldOptions <- base::as.list(base::.Options) [18:41:25.663] ...future.oldEnvVars <- base::Sys.getenv() [18:41:25.663] } [18:41:25.663] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:25.663] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:25.663] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:25.663] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:25.663] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:25.663] future.stdout.windows.reencode = NULL, width = 80L) [18:41:25.663] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:25.663] base::names(...future.oldOptions)) [18:41:25.663] } [18:41:25.663] if (FALSE) { [18:41:25.663] } [18:41:25.663] else { [18:41:25.663] if (TRUE) { [18:41:25.663] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:25.663] open = "w") [18:41:25.663] } [18:41:25.663] else { [18:41:25.663] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:25.663] windows = "NUL", "/dev/null"), open = "w") [18:41:25.663] } [18:41:25.663] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:25.663] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:25.663] base::sink(type = "output", split = FALSE) [18:41:25.663] base::close(...future.stdout) [18:41:25.663] }, add = TRUE) [18:41:25.663] } [18:41:25.663] ...future.frame <- base::sys.nframe() [18:41:25.663] ...future.conditions <- base::list() [18:41:25.663] ...future.rng <- base::globalenv()$.Random.seed [18:41:25.663] if (FALSE) { [18:41:25.663] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:25.663] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:25.663] } [18:41:25.663] ...future.result <- base::tryCatch({ [18:41:25.663] base::withCallingHandlers({ [18:41:25.663] ...future.value <- base::withVisible(base::local({ [18:41:25.663] ...future.makeSendCondition <- base::local({ [18:41:25.663] sendCondition <- NULL [18:41:25.663] function(frame = 1L) { [18:41:25.663] if (is.function(sendCondition)) [18:41:25.663] return(sendCondition) [18:41:25.663] ns <- getNamespace("parallel") [18:41:25.663] if (exists("sendData", mode = "function", [18:41:25.663] envir = ns)) { [18:41:25.663] parallel_sendData <- get("sendData", mode = "function", [18:41:25.663] envir = ns) [18:41:25.663] envir <- sys.frame(frame) [18:41:25.663] master <- NULL [18:41:25.663] while (!identical(envir, .GlobalEnv) && [18:41:25.663] !identical(envir, emptyenv())) { [18:41:25.663] if (exists("master", mode = "list", envir = envir, [18:41:25.663] inherits = FALSE)) { [18:41:25.663] master <- get("master", mode = "list", [18:41:25.663] envir = envir, inherits = FALSE) [18:41:25.663] if (inherits(master, c("SOCKnode", [18:41:25.663] "SOCK0node"))) { [18:41:25.663] sendCondition <<- function(cond) { [18:41:25.663] data <- list(type = "VALUE", value = cond, [18:41:25.663] success = TRUE) [18:41:25.663] parallel_sendData(master, data) [18:41:25.663] } [18:41:25.663] return(sendCondition) [18:41:25.663] } [18:41:25.663] } [18:41:25.663] frame <- frame + 1L [18:41:25.663] envir <- sys.frame(frame) [18:41:25.663] } [18:41:25.663] } [18:41:25.663] sendCondition <<- function(cond) NULL [18:41:25.663] } [18:41:25.663] }) [18:41:25.663] withCallingHandlers({ [18:41:25.663] { [18:41:25.663] do.call(function(...) { [18:41:25.663] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:25.663] if (!identical(...future.globals.maxSize.org, [18:41:25.663] ...future.globals.maxSize)) { [18:41:25.663] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:25.663] on.exit(options(oopts), add = TRUE) [18:41:25.663] } [18:41:25.663] { [18:41:25.663] lapply(seq_along(...future.elements_ii), [18:41:25.663] FUN = function(jj) { [18:41:25.663] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:25.663] ...future.FUN(...future.X_jj, ...) [18:41:25.663] }) [18:41:25.663] } [18:41:25.663] }, args = future.call.arguments) [18:41:25.663] } [18:41:25.663] }, immediateCondition = function(cond) { [18:41:25.663] sendCondition <- ...future.makeSendCondition() [18:41:25.663] sendCondition(cond) [18:41:25.663] muffleCondition <- function (cond, pattern = "^muffle") [18:41:25.663] { [18:41:25.663] inherits <- base::inherits [18:41:25.663] invokeRestart <- base::invokeRestart [18:41:25.663] is.null <- base::is.null [18:41:25.663] muffled <- FALSE [18:41:25.663] if (inherits(cond, "message")) { [18:41:25.663] muffled <- grepl(pattern, "muffleMessage") [18:41:25.663] if (muffled) [18:41:25.663] invokeRestart("muffleMessage") [18:41:25.663] } [18:41:25.663] else if (inherits(cond, "warning")) { [18:41:25.663] muffled <- grepl(pattern, "muffleWarning") [18:41:25.663] if (muffled) [18:41:25.663] invokeRestart("muffleWarning") [18:41:25.663] } [18:41:25.663] else if (inherits(cond, "condition")) { [18:41:25.663] if (!is.null(pattern)) { [18:41:25.663] computeRestarts <- base::computeRestarts [18:41:25.663] grepl <- base::grepl [18:41:25.663] restarts <- computeRestarts(cond) [18:41:25.663] for (restart in restarts) { [18:41:25.663] name <- restart$name [18:41:25.663] if (is.null(name)) [18:41:25.663] next [18:41:25.663] if (!grepl(pattern, name)) [18:41:25.663] next [18:41:25.663] invokeRestart(restart) [18:41:25.663] muffled <- TRUE [18:41:25.663] break [18:41:25.663] } [18:41:25.663] } [18:41:25.663] } [18:41:25.663] invisible(muffled) [18:41:25.663] } [18:41:25.663] muffleCondition(cond) [18:41:25.663] }) [18:41:25.663] })) [18:41:25.663] future::FutureResult(value = ...future.value$value, [18:41:25.663] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:25.663] ...future.rng), globalenv = if (FALSE) [18:41:25.663] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:25.663] ...future.globalenv.names)) [18:41:25.663] else NULL, started = ...future.startTime, version = "1.8") [18:41:25.663] }, condition = base::local({ [18:41:25.663] c <- base::c [18:41:25.663] inherits <- base::inherits [18:41:25.663] invokeRestart <- base::invokeRestart [18:41:25.663] length <- base::length [18:41:25.663] list <- base::list [18:41:25.663] seq.int <- base::seq.int [18:41:25.663] signalCondition <- base::signalCondition [18:41:25.663] sys.calls <- base::sys.calls [18:41:25.663] `[[` <- base::`[[` [18:41:25.663] `+` <- base::`+` [18:41:25.663] `<<-` <- base::`<<-` [18:41:25.663] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:25.663] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:25.663] 3L)] [18:41:25.663] } [18:41:25.663] function(cond) { [18:41:25.663] is_error <- inherits(cond, "error") [18:41:25.663] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:25.663] NULL) [18:41:25.663] if (is_error) { [18:41:25.663] sessionInformation <- function() { [18:41:25.663] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:25.663] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:25.663] search = base::search(), system = base::Sys.info()) [18:41:25.663] } [18:41:25.663] ...future.conditions[[length(...future.conditions) + [18:41:25.663] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:25.663] cond$call), session = sessionInformation(), [18:41:25.663] timestamp = base::Sys.time(), signaled = 0L) [18:41:25.663] signalCondition(cond) [18:41:25.663] } [18:41:25.663] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:25.663] "immediateCondition"))) { [18:41:25.663] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:25.663] ...future.conditions[[length(...future.conditions) + [18:41:25.663] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:25.663] if (TRUE && !signal) { [18:41:25.663] muffleCondition <- function (cond, pattern = "^muffle") [18:41:25.663] { [18:41:25.663] inherits <- base::inherits [18:41:25.663] invokeRestart <- base::invokeRestart [18:41:25.663] is.null <- base::is.null [18:41:25.663] muffled <- FALSE [18:41:25.663] if (inherits(cond, "message")) { [18:41:25.663] muffled <- grepl(pattern, "muffleMessage") [18:41:25.663] if (muffled) [18:41:25.663] invokeRestart("muffleMessage") [18:41:25.663] } [18:41:25.663] else if (inherits(cond, "warning")) { [18:41:25.663] muffled <- grepl(pattern, "muffleWarning") [18:41:25.663] if (muffled) [18:41:25.663] invokeRestart("muffleWarning") [18:41:25.663] } [18:41:25.663] else if (inherits(cond, "condition")) { [18:41:25.663] if (!is.null(pattern)) { [18:41:25.663] computeRestarts <- base::computeRestarts [18:41:25.663] grepl <- base::grepl [18:41:25.663] restarts <- computeRestarts(cond) [18:41:25.663] for (restart in restarts) { [18:41:25.663] name <- restart$name [18:41:25.663] if (is.null(name)) [18:41:25.663] next [18:41:25.663] if (!grepl(pattern, name)) [18:41:25.663] next [18:41:25.663] invokeRestart(restart) [18:41:25.663] muffled <- TRUE [18:41:25.663] break [18:41:25.663] } [18:41:25.663] } [18:41:25.663] } [18:41:25.663] invisible(muffled) [18:41:25.663] } [18:41:25.663] muffleCondition(cond, pattern = "^muffle") [18:41:25.663] } [18:41:25.663] } [18:41:25.663] else { [18:41:25.663] if (TRUE) { [18:41:25.663] muffleCondition <- function (cond, pattern = "^muffle") [18:41:25.663] { [18:41:25.663] inherits <- base::inherits [18:41:25.663] invokeRestart <- base::invokeRestart [18:41:25.663] is.null <- base::is.null [18:41:25.663] muffled <- FALSE [18:41:25.663] if (inherits(cond, "message")) { [18:41:25.663] muffled <- grepl(pattern, "muffleMessage") [18:41:25.663] if (muffled) [18:41:25.663] invokeRestart("muffleMessage") [18:41:25.663] } [18:41:25.663] else if (inherits(cond, "warning")) { [18:41:25.663] muffled <- grepl(pattern, "muffleWarning") [18:41:25.663] if (muffled) [18:41:25.663] invokeRestart("muffleWarning") [18:41:25.663] } [18:41:25.663] else if (inherits(cond, "condition")) { [18:41:25.663] if (!is.null(pattern)) { [18:41:25.663] computeRestarts <- base::computeRestarts [18:41:25.663] grepl <- base::grepl [18:41:25.663] restarts <- computeRestarts(cond) [18:41:25.663] for (restart in restarts) { [18:41:25.663] name <- restart$name [18:41:25.663] if (is.null(name)) [18:41:25.663] next [18:41:25.663] if (!grepl(pattern, name)) [18:41:25.663] next [18:41:25.663] invokeRestart(restart) [18:41:25.663] muffled <- TRUE [18:41:25.663] break [18:41:25.663] } [18:41:25.663] } [18:41:25.663] } [18:41:25.663] invisible(muffled) [18:41:25.663] } [18:41:25.663] muffleCondition(cond, pattern = "^muffle") [18:41:25.663] } [18:41:25.663] } [18:41:25.663] } [18:41:25.663] })) [18:41:25.663] }, error = function(ex) { [18:41:25.663] base::structure(base::list(value = NULL, visible = NULL, [18:41:25.663] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:25.663] ...future.rng), started = ...future.startTime, [18:41:25.663] finished = Sys.time(), session_uuid = NA_character_, [18:41:25.663] version = "1.8"), class = "FutureResult") [18:41:25.663] }, finally = { [18:41:25.663] if (!identical(...future.workdir, getwd())) [18:41:25.663] setwd(...future.workdir) [18:41:25.663] { [18:41:25.663] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:25.663] ...future.oldOptions$nwarnings <- NULL [18:41:25.663] } [18:41:25.663] base::options(...future.oldOptions) [18:41:25.663] if (.Platform$OS.type == "windows") { [18:41:25.663] old_names <- names(...future.oldEnvVars) [18:41:25.663] envs <- base::Sys.getenv() [18:41:25.663] names <- names(envs) [18:41:25.663] common <- intersect(names, old_names) [18:41:25.663] added <- setdiff(names, old_names) [18:41:25.663] removed <- setdiff(old_names, names) [18:41:25.663] changed <- common[...future.oldEnvVars[common] != [18:41:25.663] envs[common]] [18:41:25.663] NAMES <- toupper(changed) [18:41:25.663] args <- list() [18:41:25.663] for (kk in seq_along(NAMES)) { [18:41:25.663] name <- changed[[kk]] [18:41:25.663] NAME <- NAMES[[kk]] [18:41:25.663] if (name != NAME && is.element(NAME, old_names)) [18:41:25.663] next [18:41:25.663] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:25.663] } [18:41:25.663] NAMES <- toupper(added) [18:41:25.663] for (kk in seq_along(NAMES)) { [18:41:25.663] name <- added[[kk]] [18:41:25.663] NAME <- NAMES[[kk]] [18:41:25.663] if (name != NAME && is.element(NAME, old_names)) [18:41:25.663] next [18:41:25.663] args[[name]] <- "" [18:41:25.663] } [18:41:25.663] NAMES <- toupper(removed) [18:41:25.663] for (kk in seq_along(NAMES)) { [18:41:25.663] name <- removed[[kk]] [18:41:25.663] NAME <- NAMES[[kk]] [18:41:25.663] if (name != NAME && is.element(NAME, old_names)) [18:41:25.663] next [18:41:25.663] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:25.663] } [18:41:25.663] if (length(args) > 0) [18:41:25.663] base::do.call(base::Sys.setenv, args = args) [18:41:25.663] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:25.663] } [18:41:25.663] else { [18:41:25.663] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:25.663] } [18:41:25.663] { [18:41:25.663] if (base::length(...future.futureOptionsAdded) > [18:41:25.663] 0L) { [18:41:25.663] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:25.663] base::names(opts) <- ...future.futureOptionsAdded [18:41:25.663] base::options(opts) [18:41:25.663] } [18:41:25.663] { [18:41:25.663] { [18:41:25.663] base::options(mc.cores = ...future.mc.cores.old) [18:41:25.663] NULL [18:41:25.663] } [18:41:25.663] options(future.plan = NULL) [18:41:25.663] if (is.na(NA_character_)) [18:41:25.663] Sys.unsetenv("R_FUTURE_PLAN") [18:41:25.663] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:25.663] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:25.663] .init = FALSE) [18:41:25.663] } [18:41:25.663] } [18:41:25.663] } [18:41:25.663] }) [18:41:25.663] if (TRUE) { [18:41:25.663] base::sink(type = "output", split = FALSE) [18:41:25.663] if (TRUE) { [18:41:25.663] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:25.663] } [18:41:25.663] else { [18:41:25.663] ...future.result["stdout"] <- base::list(NULL) [18:41:25.663] } [18:41:25.663] base::close(...future.stdout) [18:41:25.663] ...future.stdout <- NULL [18:41:25.663] } [18:41:25.663] ...future.result$conditions <- ...future.conditions [18:41:25.663] ...future.result$finished <- base::Sys.time() [18:41:25.663] ...future.result [18:41:25.663] } [18:41:25.670] Exporting 5 global objects (1.20 KiB) to cluster node #1 ... [18:41:25.670] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... [18:41:25.670] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... DONE [18:41:25.671] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... [18:41:25.671] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... DONE [18:41:25.671] Exporting '...future.elements_ii' (128 bytes) to cluster node #1 ... [18:41:25.672] Exporting '...future.elements_ii' (128 bytes) to cluster node #1 ... DONE [18:41:25.672] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:25.672] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:25.673] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:25.673] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:25.673] Exporting 5 global objects (1.20 KiB) to cluster node #1 ... DONE [18:41:25.674] MultisessionFuture started [18:41:25.675] - Launch lazy future ... done [18:41:25.675] run() for 'MultisessionFuture' ... done [18:41:25.675] Created future: [18:41:25.694] receiveMessageFromWorker() for ClusterFuture ... [18:41:25.694] - Validating connection of MultisessionFuture [18:41:25.694] - received message: FutureResult [18:41:25.695] - Received FutureResult [18:41:25.695] - Erased future from FutureRegistry [18:41:25.695] result() for ClusterFuture ... [18:41:25.695] - result already collected: FutureResult [18:41:25.695] result() for ClusterFuture ... done [18:41:25.695] receiveMessageFromWorker() for ClusterFuture ... done [18:41:25.676] MultisessionFuture: [18:41:25.676] Label: 'future_lapply-2' [18:41:25.676] Expression: [18:41:25.676] { [18:41:25.676] do.call(function(...) { [18:41:25.676] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:25.676] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:25.676] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:25.676] on.exit(options(oopts), add = TRUE) [18:41:25.676] } [18:41:25.676] { [18:41:25.676] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:25.676] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:25.676] ...future.FUN(...future.X_jj, ...) [18:41:25.676] }) [18:41:25.676] } [18:41:25.676] }, args = future.call.arguments) [18:41:25.676] } [18:41:25.676] Lazy evaluation: FALSE [18:41:25.676] Asynchronous evaluation: TRUE [18:41:25.676] Local evaluation: TRUE [18:41:25.676] Environment: R_GlobalEnv [18:41:25.676] Capture standard output: TRUE [18:41:25.676] Capture condition classes: 'condition' (excluding 'nothing') [18:41:25.676] Globals: 5 objects totaling 790 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 128 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:25.676] Packages: [18:41:25.676] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:25.676] Resolved: TRUE [18:41:25.676] Value: [18:41:25.676] Conditions captured: [18:41:25.676] Early signaling: FALSE [18:41:25.676] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:25.676] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:25.696] Chunk #2 of 2 ... DONE [18:41:25.696] Launching 2 futures (chunks) ... DONE [18:41:25.696] Resolving 2 futures (chunks) ... [18:41:25.696] resolve() on list ... [18:41:25.697] recursive: 0 [18:41:25.697] length: 2 [18:41:25.697] [18:41:25.697] Future #1 [18:41:25.697] result() for ClusterFuture ... [18:41:25.697] - result already collected: FutureResult [18:41:25.698] result() for ClusterFuture ... done [18:41:25.698] result() for ClusterFuture ... [18:41:25.698] - result already collected: FutureResult [18:41:25.698] result() for ClusterFuture ... done [18:41:25.698] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:25.698] - nx: 2 [18:41:25.698] - relay: TRUE [18:41:25.699] - stdout: TRUE [18:41:25.699] - signal: TRUE [18:41:25.699] - resignal: FALSE [18:41:25.699] - force: TRUE [18:41:25.699] - relayed: [n=2] FALSE, FALSE [18:41:25.699] - queued futures: [n=2] FALSE, FALSE [18:41:25.700] - until=1 [18:41:25.700] - relaying element #1 [18:41:25.700] result() for ClusterFuture ... [18:41:25.700] - result already collected: FutureResult [18:41:25.700] result() for ClusterFuture ... done [18:41:25.700] result() for ClusterFuture ... [18:41:25.701] - result already collected: FutureResult [18:41:25.701] result() for ClusterFuture ... done [18:41:25.701] result() for ClusterFuture ... [18:41:25.701] - result already collected: FutureResult [18:41:25.701] result() for ClusterFuture ... done [18:41:25.701] result() for ClusterFuture ... [18:41:25.701] - result already collected: FutureResult [18:41:25.702] result() for ClusterFuture ... done [18:41:25.702] - relayed: [n=2] TRUE, FALSE [18:41:25.702] - queued futures: [n=2] TRUE, FALSE [18:41:25.702] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:25.702] length: 1 (resolved future 1) [18:41:25.703] Future #2 [18:41:25.703] result() for ClusterFuture ... [18:41:25.703] - result already collected: FutureResult [18:41:25.703] result() for ClusterFuture ... done [18:41:25.703] result() for ClusterFuture ... [18:41:25.703] - result already collected: FutureResult [18:41:25.703] result() for ClusterFuture ... done [18:41:25.704] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:25.704] - nx: 2 [18:41:25.704] - relay: TRUE [18:41:25.704] - stdout: TRUE [18:41:25.704] - signal: TRUE [18:41:25.704] - resignal: FALSE [18:41:25.705] - force: TRUE [18:41:25.705] - relayed: [n=2] TRUE, FALSE [18:41:25.705] - queued futures: [n=2] TRUE, FALSE [18:41:25.705] - until=2 [18:41:25.705] - relaying element #2 [18:41:25.705] result() for ClusterFuture ... [18:41:25.705] - result already collected: FutureResult [18:41:25.706] result() for ClusterFuture ... done [18:41:25.706] result() for ClusterFuture ... [18:41:25.706] - result already collected: FutureResult [18:41:25.706] result() for ClusterFuture ... done [18:41:25.706] result() for ClusterFuture ... [18:41:25.706] - result already collected: FutureResult [18:41:25.707] result() for ClusterFuture ... done [18:41:25.707] result() for ClusterFuture ... [18:41:25.707] - result already collected: FutureResult [18:41:25.707] result() for ClusterFuture ... done [18:41:25.707] - relayed: [n=2] TRUE, TRUE [18:41:25.707] - queued futures: [n=2] TRUE, TRUE [18:41:25.708] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:25.708] length: 0 (resolved future 2) [18:41:25.708] Relaying remaining futures [18:41:25.708] signalConditionsASAP(NULL, pos=0) ... [18:41:25.708] - nx: 2 [18:41:25.708] - relay: TRUE [18:41:25.708] - stdout: TRUE [18:41:25.709] - signal: TRUE [18:41:25.709] - resignal: FALSE [18:41:25.709] - force: TRUE [18:41:25.709] - relayed: [n=2] TRUE, TRUE [18:41:25.709] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:25.709] - relayed: [n=2] TRUE, TRUE [18:41:25.710] - queued futures: [n=2] TRUE, TRUE [18:41:25.710] signalConditionsASAP(NULL, pos=0) ... done [18:41:25.710] resolve() on list ... DONE [18:41:25.710] result() for ClusterFuture ... [18:41:25.710] - result already collected: FutureResult [18:41:25.710] result() for ClusterFuture ... done [18:41:25.711] result() for ClusterFuture ... [18:41:25.711] - result already collected: FutureResult [18:41:25.711] result() for ClusterFuture ... done [18:41:25.711] result() for ClusterFuture ... [18:41:25.711] - result already collected: FutureResult [18:41:25.711] result() for ClusterFuture ... done [18:41:25.712] result() for ClusterFuture ... [18:41:25.712] - result already collected: FutureResult [18:41:25.712] result() for ClusterFuture ... done [18:41:25.712] - Number of value chunks collected: 2 [18:41:25.712] Resolving 2 futures (chunks) ... DONE [18:41:25.712] Reducing values from 2 chunks ... [18:41:25.712] - Number of values collected after concatenation: 4 [18:41:25.713] - Number of values expected: 4 [18:41:25.713] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [18:41:25.713] Reducing values from 2 chunks ... DONE [18:41:25.713] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL [18:41:25.716] future_lapply() ... [18:41:25.719] Number of chunks: 2 [18:41:25.719] Index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [18:41:25.720] getGlobalsAndPackagesXApply() ... [18:41:25.720] - future.globals: TRUE [18:41:25.720] getGlobalsAndPackages() ... [18:41:25.720] Searching for globals... [18:41:25.722] - globals found: [2] 'FUN', '.Internal' [18:41:25.722] Searching for globals ... DONE [18:41:25.722] Resolving globals: FALSE [18:41:25.722] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:25.723] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:25.723] - globals: [1] 'FUN' [18:41:25.723] [18:41:25.723] getGlobalsAndPackages() ... DONE [18:41:25.724] - globals found/used: [n=1] 'FUN' [18:41:25.724] - needed namespaces: [n=0] [18:41:25.724] Finding globals ... DONE [18:41:25.724] - use_args: TRUE [18:41:25.724] - Getting '...' globals ... [18:41:25.725] resolve() on list ... [18:41:25.725] recursive: 0 [18:41:25.725] length: 1 [18:41:25.725] elements: '...' [18:41:25.725] length: 0 (resolved future 1) [18:41:25.726] resolve() on list ... DONE [18:41:25.726] - '...' content: [n=1] 'length' [18:41:25.726] List of 1 [18:41:25.726] $ ...:List of 1 [18:41:25.726] ..$ length: int 2 [18:41:25.726] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:25.726] - attr(*, "where")=List of 1 [18:41:25.726] ..$ ...: [18:41:25.726] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:25.726] - attr(*, "resolved")= logi TRUE [18:41:25.726] - attr(*, "total_size")= num NA [18:41:25.732] - Getting '...' globals ... DONE [18:41:25.732] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:25.732] List of 2 [18:41:25.732] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:25.732] $ ... :List of 1 [18:41:25.732] ..$ length: int 2 [18:41:25.732] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:25.732] - attr(*, "where")=List of 2 [18:41:25.732] ..$ ...future.FUN: [18:41:25.732] ..$ ... : [18:41:25.732] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:25.732] - attr(*, "resolved")= logi FALSE [18:41:25.732] - attr(*, "total_size")= int 4799 [18:41:25.736] Packages to be attached in all futures: [n=0] [18:41:25.737] getGlobalsAndPackagesXApply() ... DONE [18:41:25.737] Number of futures (= number of chunks): 2 [18:41:25.737] Launching 2 futures (chunks) ... [18:41:25.737] Chunk #1 of 2 ... [18:41:25.737] - Finding globals in 'X' for chunk #1 ... [18:41:25.738] getGlobalsAndPackages() ... [18:41:25.738] Searching for globals... [18:41:25.738] [18:41:25.738] Searching for globals ... DONE [18:41:25.738] - globals: [0] [18:41:25.739] getGlobalsAndPackages() ... DONE [18:41:25.739] + additional globals found: [n=0] [18:41:25.739] + additional namespaces needed: [n=0] [18:41:25.739] - Finding globals in 'X' for chunk #1 ... DONE [18:41:25.739] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:25.739] - seeds: [18:41:25.739] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:25.740] getGlobalsAndPackages() ... [18:41:25.740] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:25.740] Resolving globals: FALSE [18:41:25.740] Tweak future expression to call with '...' arguments ... [18:41:25.740] { [18:41:25.740] do.call(function(...) { [18:41:25.740] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:25.740] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:25.740] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:25.740] on.exit(options(oopts), add = TRUE) [18:41:25.740] } [18:41:25.740] { [18:41:25.740] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:25.740] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:25.740] ...future.FUN(...future.X_jj, ...) [18:41:25.740] }) [18:41:25.740] } [18:41:25.740] }, args = future.call.arguments) [18:41:25.740] } [18:41:25.741] Tweak future expression to call with '...' arguments ... DONE [18:41:25.741] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:25.742] [18:41:25.742] getGlobalsAndPackages() ... DONE [18:41:25.742] run() for 'Future' ... [18:41:25.742] - state: 'created' [18:41:25.742] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:25.758] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:25.758] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:25.759] - Field: 'node' [18:41:25.759] - Field: 'label' [18:41:25.759] - Field: 'local' [18:41:25.759] - Field: 'owner' [18:41:25.759] - Field: 'envir' [18:41:25.759] - Field: 'workers' [18:41:25.760] - Field: 'packages' [18:41:25.760] - Field: 'gc' [18:41:25.760] - Field: 'conditions' [18:41:25.760] - Field: 'persistent' [18:41:25.760] - Field: 'expr' [18:41:25.761] - Field: 'uuid' [18:41:25.761] - Field: 'seed' [18:41:25.761] - Field: 'version' [18:41:25.761] - Field: 'result' [18:41:25.761] - Field: 'asynchronous' [18:41:25.761] - Field: 'calls' [18:41:25.762] - Field: 'globals' [18:41:25.762] - Field: 'stdout' [18:41:25.762] - Field: 'earlySignal' [18:41:25.762] - Field: 'lazy' [18:41:25.762] - Field: 'state' [18:41:25.763] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:25.763] - Launch lazy future ... [18:41:25.763] Packages needed by the future expression (n = 0): [18:41:25.763] Packages needed by future strategies (n = 0): [18:41:25.764] { [18:41:25.764] { [18:41:25.764] { [18:41:25.764] ...future.startTime <- base::Sys.time() [18:41:25.764] { [18:41:25.764] { [18:41:25.764] { [18:41:25.764] { [18:41:25.764] base::local({ [18:41:25.764] has_future <- base::requireNamespace("future", [18:41:25.764] quietly = TRUE) [18:41:25.764] if (has_future) { [18:41:25.764] ns <- base::getNamespace("future") [18:41:25.764] version <- ns[[".package"]][["version"]] [18:41:25.764] if (is.null(version)) [18:41:25.764] version <- utils::packageVersion("future") [18:41:25.764] } [18:41:25.764] else { [18:41:25.764] version <- NULL [18:41:25.764] } [18:41:25.764] if (!has_future || version < "1.8.0") { [18:41:25.764] info <- base::c(r_version = base::gsub("R version ", [18:41:25.764] "", base::R.version$version.string), [18:41:25.764] platform = base::sprintf("%s (%s-bit)", [18:41:25.764] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:25.764] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:25.764] "release", "version")], collapse = " "), [18:41:25.764] hostname = base::Sys.info()[["nodename"]]) [18:41:25.764] info <- base::sprintf("%s: %s", base::names(info), [18:41:25.764] info) [18:41:25.764] info <- base::paste(info, collapse = "; ") [18:41:25.764] if (!has_future) { [18:41:25.764] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:25.764] info) [18:41:25.764] } [18:41:25.764] else { [18:41:25.764] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:25.764] info, version) [18:41:25.764] } [18:41:25.764] base::stop(msg) [18:41:25.764] } [18:41:25.764] }) [18:41:25.764] } [18:41:25.764] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:25.764] base::options(mc.cores = 1L) [18:41:25.764] } [18:41:25.764] ...future.strategy.old <- future::plan("list") [18:41:25.764] options(future.plan = NULL) [18:41:25.764] Sys.unsetenv("R_FUTURE_PLAN") [18:41:25.764] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:25.764] } [18:41:25.764] ...future.workdir <- getwd() [18:41:25.764] } [18:41:25.764] ...future.oldOptions <- base::as.list(base::.Options) [18:41:25.764] ...future.oldEnvVars <- base::Sys.getenv() [18:41:25.764] } [18:41:25.764] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:25.764] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:25.764] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:25.764] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:25.764] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:25.764] future.stdout.windows.reencode = NULL, width = 80L) [18:41:25.764] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:25.764] base::names(...future.oldOptions)) [18:41:25.764] } [18:41:25.764] if (FALSE) { [18:41:25.764] } [18:41:25.764] else { [18:41:25.764] if (TRUE) { [18:41:25.764] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:25.764] open = "w") [18:41:25.764] } [18:41:25.764] else { [18:41:25.764] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:25.764] windows = "NUL", "/dev/null"), open = "w") [18:41:25.764] } [18:41:25.764] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:25.764] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:25.764] base::sink(type = "output", split = FALSE) [18:41:25.764] base::close(...future.stdout) [18:41:25.764] }, add = TRUE) [18:41:25.764] } [18:41:25.764] ...future.frame <- base::sys.nframe() [18:41:25.764] ...future.conditions <- base::list() [18:41:25.764] ...future.rng <- base::globalenv()$.Random.seed [18:41:25.764] if (FALSE) { [18:41:25.764] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:25.764] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:25.764] } [18:41:25.764] ...future.result <- base::tryCatch({ [18:41:25.764] base::withCallingHandlers({ [18:41:25.764] ...future.value <- base::withVisible(base::local({ [18:41:25.764] ...future.makeSendCondition <- base::local({ [18:41:25.764] sendCondition <- NULL [18:41:25.764] function(frame = 1L) { [18:41:25.764] if (is.function(sendCondition)) [18:41:25.764] return(sendCondition) [18:41:25.764] ns <- getNamespace("parallel") [18:41:25.764] if (exists("sendData", mode = "function", [18:41:25.764] envir = ns)) { [18:41:25.764] parallel_sendData <- get("sendData", mode = "function", [18:41:25.764] envir = ns) [18:41:25.764] envir <- sys.frame(frame) [18:41:25.764] master <- NULL [18:41:25.764] while (!identical(envir, .GlobalEnv) && [18:41:25.764] !identical(envir, emptyenv())) { [18:41:25.764] if (exists("master", mode = "list", envir = envir, [18:41:25.764] inherits = FALSE)) { [18:41:25.764] master <- get("master", mode = "list", [18:41:25.764] envir = envir, inherits = FALSE) [18:41:25.764] if (inherits(master, c("SOCKnode", [18:41:25.764] "SOCK0node"))) { [18:41:25.764] sendCondition <<- function(cond) { [18:41:25.764] data <- list(type = "VALUE", value = cond, [18:41:25.764] success = TRUE) [18:41:25.764] parallel_sendData(master, data) [18:41:25.764] } [18:41:25.764] return(sendCondition) [18:41:25.764] } [18:41:25.764] } [18:41:25.764] frame <- frame + 1L [18:41:25.764] envir <- sys.frame(frame) [18:41:25.764] } [18:41:25.764] } [18:41:25.764] sendCondition <<- function(cond) NULL [18:41:25.764] } [18:41:25.764] }) [18:41:25.764] withCallingHandlers({ [18:41:25.764] { [18:41:25.764] do.call(function(...) { [18:41:25.764] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:25.764] if (!identical(...future.globals.maxSize.org, [18:41:25.764] ...future.globals.maxSize)) { [18:41:25.764] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:25.764] on.exit(options(oopts), add = TRUE) [18:41:25.764] } [18:41:25.764] { [18:41:25.764] lapply(seq_along(...future.elements_ii), [18:41:25.764] FUN = function(jj) { [18:41:25.764] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:25.764] ...future.FUN(...future.X_jj, ...) [18:41:25.764] }) [18:41:25.764] } [18:41:25.764] }, args = future.call.arguments) [18:41:25.764] } [18:41:25.764] }, immediateCondition = function(cond) { [18:41:25.764] sendCondition <- ...future.makeSendCondition() [18:41:25.764] sendCondition(cond) [18:41:25.764] muffleCondition <- function (cond, pattern = "^muffle") [18:41:25.764] { [18:41:25.764] inherits <- base::inherits [18:41:25.764] invokeRestart <- base::invokeRestart [18:41:25.764] is.null <- base::is.null [18:41:25.764] muffled <- FALSE [18:41:25.764] if (inherits(cond, "message")) { [18:41:25.764] muffled <- grepl(pattern, "muffleMessage") [18:41:25.764] if (muffled) [18:41:25.764] invokeRestart("muffleMessage") [18:41:25.764] } [18:41:25.764] else if (inherits(cond, "warning")) { [18:41:25.764] muffled <- grepl(pattern, "muffleWarning") [18:41:25.764] if (muffled) [18:41:25.764] invokeRestart("muffleWarning") [18:41:25.764] } [18:41:25.764] else if (inherits(cond, "condition")) { [18:41:25.764] if (!is.null(pattern)) { [18:41:25.764] computeRestarts <- base::computeRestarts [18:41:25.764] grepl <- base::grepl [18:41:25.764] restarts <- computeRestarts(cond) [18:41:25.764] for (restart in restarts) { [18:41:25.764] name <- restart$name [18:41:25.764] if (is.null(name)) [18:41:25.764] next [18:41:25.764] if (!grepl(pattern, name)) [18:41:25.764] next [18:41:25.764] invokeRestart(restart) [18:41:25.764] muffled <- TRUE [18:41:25.764] break [18:41:25.764] } [18:41:25.764] } [18:41:25.764] } [18:41:25.764] invisible(muffled) [18:41:25.764] } [18:41:25.764] muffleCondition(cond) [18:41:25.764] }) [18:41:25.764] })) [18:41:25.764] future::FutureResult(value = ...future.value$value, [18:41:25.764] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:25.764] ...future.rng), globalenv = if (FALSE) [18:41:25.764] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:25.764] ...future.globalenv.names)) [18:41:25.764] else NULL, started = ...future.startTime, version = "1.8") [18:41:25.764] }, condition = base::local({ [18:41:25.764] c <- base::c [18:41:25.764] inherits <- base::inherits [18:41:25.764] invokeRestart <- base::invokeRestart [18:41:25.764] length <- base::length [18:41:25.764] list <- base::list [18:41:25.764] seq.int <- base::seq.int [18:41:25.764] signalCondition <- base::signalCondition [18:41:25.764] sys.calls <- base::sys.calls [18:41:25.764] `[[` <- base::`[[` [18:41:25.764] `+` <- base::`+` [18:41:25.764] `<<-` <- base::`<<-` [18:41:25.764] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:25.764] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:25.764] 3L)] [18:41:25.764] } [18:41:25.764] function(cond) { [18:41:25.764] is_error <- inherits(cond, "error") [18:41:25.764] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:25.764] NULL) [18:41:25.764] if (is_error) { [18:41:25.764] sessionInformation <- function() { [18:41:25.764] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:25.764] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:25.764] search = base::search(), system = base::Sys.info()) [18:41:25.764] } [18:41:25.764] ...future.conditions[[length(...future.conditions) + [18:41:25.764] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:25.764] cond$call), session = sessionInformation(), [18:41:25.764] timestamp = base::Sys.time(), signaled = 0L) [18:41:25.764] signalCondition(cond) [18:41:25.764] } [18:41:25.764] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:25.764] "immediateCondition"))) { [18:41:25.764] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:25.764] ...future.conditions[[length(...future.conditions) + [18:41:25.764] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:25.764] if (TRUE && !signal) { [18:41:25.764] muffleCondition <- function (cond, pattern = "^muffle") [18:41:25.764] { [18:41:25.764] inherits <- base::inherits [18:41:25.764] invokeRestart <- base::invokeRestart [18:41:25.764] is.null <- base::is.null [18:41:25.764] muffled <- FALSE [18:41:25.764] if (inherits(cond, "message")) { [18:41:25.764] muffled <- grepl(pattern, "muffleMessage") [18:41:25.764] if (muffled) [18:41:25.764] invokeRestart("muffleMessage") [18:41:25.764] } [18:41:25.764] else if (inherits(cond, "warning")) { [18:41:25.764] muffled <- grepl(pattern, "muffleWarning") [18:41:25.764] if (muffled) [18:41:25.764] invokeRestart("muffleWarning") [18:41:25.764] } [18:41:25.764] else if (inherits(cond, "condition")) { [18:41:25.764] if (!is.null(pattern)) { [18:41:25.764] computeRestarts <- base::computeRestarts [18:41:25.764] grepl <- base::grepl [18:41:25.764] restarts <- computeRestarts(cond) [18:41:25.764] for (restart in restarts) { [18:41:25.764] name <- restart$name [18:41:25.764] if (is.null(name)) [18:41:25.764] next [18:41:25.764] if (!grepl(pattern, name)) [18:41:25.764] next [18:41:25.764] invokeRestart(restart) [18:41:25.764] muffled <- TRUE [18:41:25.764] break [18:41:25.764] } [18:41:25.764] } [18:41:25.764] } [18:41:25.764] invisible(muffled) [18:41:25.764] } [18:41:25.764] muffleCondition(cond, pattern = "^muffle") [18:41:25.764] } [18:41:25.764] } [18:41:25.764] else { [18:41:25.764] if (TRUE) { [18:41:25.764] muffleCondition <- function (cond, pattern = "^muffle") [18:41:25.764] { [18:41:25.764] inherits <- base::inherits [18:41:25.764] invokeRestart <- base::invokeRestart [18:41:25.764] is.null <- base::is.null [18:41:25.764] muffled <- FALSE [18:41:25.764] if (inherits(cond, "message")) { [18:41:25.764] muffled <- grepl(pattern, "muffleMessage") [18:41:25.764] if (muffled) [18:41:25.764] invokeRestart("muffleMessage") [18:41:25.764] } [18:41:25.764] else if (inherits(cond, "warning")) { [18:41:25.764] muffled <- grepl(pattern, "muffleWarning") [18:41:25.764] if (muffled) [18:41:25.764] invokeRestart("muffleWarning") [18:41:25.764] } [18:41:25.764] else if (inherits(cond, "condition")) { [18:41:25.764] if (!is.null(pattern)) { [18:41:25.764] computeRestarts <- base::computeRestarts [18:41:25.764] grepl <- base::grepl [18:41:25.764] restarts <- computeRestarts(cond) [18:41:25.764] for (restart in restarts) { [18:41:25.764] name <- restart$name [18:41:25.764] if (is.null(name)) [18:41:25.764] next [18:41:25.764] if (!grepl(pattern, name)) [18:41:25.764] next [18:41:25.764] invokeRestart(restart) [18:41:25.764] muffled <- TRUE [18:41:25.764] break [18:41:25.764] } [18:41:25.764] } [18:41:25.764] } [18:41:25.764] invisible(muffled) [18:41:25.764] } [18:41:25.764] muffleCondition(cond, pattern = "^muffle") [18:41:25.764] } [18:41:25.764] } [18:41:25.764] } [18:41:25.764] })) [18:41:25.764] }, error = function(ex) { [18:41:25.764] base::structure(base::list(value = NULL, visible = NULL, [18:41:25.764] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:25.764] ...future.rng), started = ...future.startTime, [18:41:25.764] finished = Sys.time(), session_uuid = NA_character_, [18:41:25.764] version = "1.8"), class = "FutureResult") [18:41:25.764] }, finally = { [18:41:25.764] if (!identical(...future.workdir, getwd())) [18:41:25.764] setwd(...future.workdir) [18:41:25.764] { [18:41:25.764] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:25.764] ...future.oldOptions$nwarnings <- NULL [18:41:25.764] } [18:41:25.764] base::options(...future.oldOptions) [18:41:25.764] if (.Platform$OS.type == "windows") { [18:41:25.764] old_names <- names(...future.oldEnvVars) [18:41:25.764] envs <- base::Sys.getenv() [18:41:25.764] names <- names(envs) [18:41:25.764] common <- intersect(names, old_names) [18:41:25.764] added <- setdiff(names, old_names) [18:41:25.764] removed <- setdiff(old_names, names) [18:41:25.764] changed <- common[...future.oldEnvVars[common] != [18:41:25.764] envs[common]] [18:41:25.764] NAMES <- toupper(changed) [18:41:25.764] args <- list() [18:41:25.764] for (kk in seq_along(NAMES)) { [18:41:25.764] name <- changed[[kk]] [18:41:25.764] NAME <- NAMES[[kk]] [18:41:25.764] if (name != NAME && is.element(NAME, old_names)) [18:41:25.764] next [18:41:25.764] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:25.764] } [18:41:25.764] NAMES <- toupper(added) [18:41:25.764] for (kk in seq_along(NAMES)) { [18:41:25.764] name <- added[[kk]] [18:41:25.764] NAME <- NAMES[[kk]] [18:41:25.764] if (name != NAME && is.element(NAME, old_names)) [18:41:25.764] next [18:41:25.764] args[[name]] <- "" [18:41:25.764] } [18:41:25.764] NAMES <- toupper(removed) [18:41:25.764] for (kk in seq_along(NAMES)) { [18:41:25.764] name <- removed[[kk]] [18:41:25.764] NAME <- NAMES[[kk]] [18:41:25.764] if (name != NAME && is.element(NAME, old_names)) [18:41:25.764] next [18:41:25.764] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:25.764] } [18:41:25.764] if (length(args) > 0) [18:41:25.764] base::do.call(base::Sys.setenv, args = args) [18:41:25.764] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:25.764] } [18:41:25.764] else { [18:41:25.764] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:25.764] } [18:41:25.764] { [18:41:25.764] if (base::length(...future.futureOptionsAdded) > [18:41:25.764] 0L) { [18:41:25.764] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:25.764] base::names(opts) <- ...future.futureOptionsAdded [18:41:25.764] base::options(opts) [18:41:25.764] } [18:41:25.764] { [18:41:25.764] { [18:41:25.764] base::options(mc.cores = ...future.mc.cores.old) [18:41:25.764] NULL [18:41:25.764] } [18:41:25.764] options(future.plan = NULL) [18:41:25.764] if (is.na(NA_character_)) [18:41:25.764] Sys.unsetenv("R_FUTURE_PLAN") [18:41:25.764] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:25.764] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:25.764] .init = FALSE) [18:41:25.764] } [18:41:25.764] } [18:41:25.764] } [18:41:25.764] }) [18:41:25.764] if (TRUE) { [18:41:25.764] base::sink(type = "output", split = FALSE) [18:41:25.764] if (TRUE) { [18:41:25.764] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:25.764] } [18:41:25.764] else { [18:41:25.764] ...future.result["stdout"] <- base::list(NULL) [18:41:25.764] } [18:41:25.764] base::close(...future.stdout) [18:41:25.764] ...future.stdout <- NULL [18:41:25.764] } [18:41:25.764] ...future.result$conditions <- ...future.conditions [18:41:25.764] ...future.result$finished <- base::Sys.time() [18:41:25.764] ...future.result [18:41:25.764] } [18:41:25.769] Exporting 5 global objects (1.20 KiB) to cluster node #1 ... [18:41:25.770] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... [18:41:25.770] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... DONE [18:41:25.770] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... [18:41:25.771] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... DONE [18:41:25.771] Exporting '...future.elements_ii' (127 bytes) to cluster node #1 ... [18:41:25.771] Exporting '...future.elements_ii' (127 bytes) to cluster node #1 ... DONE [18:41:25.771] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:25.772] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:25.772] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:25.772] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:25.772] Exporting 5 global objects (1.20 KiB) to cluster node #1 ... DONE [18:41:25.773] MultisessionFuture started [18:41:25.773] - Launch lazy future ... done [18:41:25.773] run() for 'MultisessionFuture' ... done [18:41:25.774] Created future: [18:41:25.789] receiveMessageFromWorker() for ClusterFuture ... [18:41:25.789] - Validating connection of MultisessionFuture [18:41:25.789] - received message: FutureResult [18:41:25.789] - Received FutureResult [18:41:25.790] - Erased future from FutureRegistry [18:41:25.790] result() for ClusterFuture ... [18:41:25.790] - result already collected: FutureResult [18:41:25.790] result() for ClusterFuture ... done [18:41:25.790] receiveMessageFromWorker() for ClusterFuture ... done [18:41:25.774] MultisessionFuture: [18:41:25.774] Label: 'future_lapply-1' [18:41:25.774] Expression: [18:41:25.774] { [18:41:25.774] do.call(function(...) { [18:41:25.774] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:25.774] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:25.774] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:25.774] on.exit(options(oopts), add = TRUE) [18:41:25.774] } [18:41:25.774] { [18:41:25.774] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:25.774] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:25.774] ...future.FUN(...future.X_jj, ...) [18:41:25.774] }) [18:41:25.774] } [18:41:25.774] }, args = future.call.arguments) [18:41:25.774] } [18:41:25.774] Lazy evaluation: FALSE [18:41:25.774] Asynchronous evaluation: TRUE [18:41:25.774] Local evaluation: TRUE [18:41:25.774] Environment: R_GlobalEnv [18:41:25.774] Capture standard output: TRUE [18:41:25.774] Capture condition classes: 'condition' (excluding 'nothing') [18:41:25.774] Globals: 5 objects totaling 789 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 127 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:25.774] Packages: [18:41:25.774] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:25.774] Resolved: TRUE [18:41:25.774] Value: [18:41:25.774] Conditions captured: [18:41:25.774] Early signaling: FALSE [18:41:25.774] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:25.774] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:25.791] Chunk #1 of 2 ... DONE [18:41:25.791] Chunk #2 of 2 ... [18:41:25.791] - Finding globals in 'X' for chunk #2 ... [18:41:25.791] getGlobalsAndPackages() ... [18:41:25.791] Searching for globals... [18:41:25.792] [18:41:25.792] Searching for globals ... DONE [18:41:25.792] - globals: [0] [18:41:25.792] getGlobalsAndPackages() ... DONE [18:41:25.792] + additional globals found: [n=0] [18:41:25.793] + additional namespaces needed: [n=0] [18:41:25.793] - Finding globals in 'X' for chunk #2 ... DONE [18:41:25.793] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:25.793] - seeds: [18:41:25.793] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:25.793] getGlobalsAndPackages() ... [18:41:25.794] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:25.794] Resolving globals: FALSE [18:41:25.794] Tweak future expression to call with '...' arguments ... [18:41:25.794] { [18:41:25.794] do.call(function(...) { [18:41:25.794] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:25.794] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:25.794] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:25.794] on.exit(options(oopts), add = TRUE) [18:41:25.794] } [18:41:25.794] { [18:41:25.794] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:25.794] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:25.794] ...future.FUN(...future.X_jj, ...) [18:41:25.794] }) [18:41:25.794] } [18:41:25.794] }, args = future.call.arguments) [18:41:25.794] } [18:41:25.795] Tweak future expression to call with '...' arguments ... DONE [18:41:25.795] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:25.795] [18:41:25.795] getGlobalsAndPackages() ... DONE [18:41:25.796] run() for 'Future' ... [18:41:25.796] - state: 'created' [18:41:25.796] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:25.814] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:25.814] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:25.814] - Field: 'node' [18:41:25.814] - Field: 'label' [18:41:25.815] - Field: 'local' [18:41:25.815] - Field: 'owner' [18:41:25.815] - Field: 'envir' [18:41:25.815] - Field: 'workers' [18:41:25.815] - Field: 'packages' [18:41:25.815] - Field: 'gc' [18:41:25.816] - Field: 'conditions' [18:41:25.816] - Field: 'persistent' [18:41:25.816] - Field: 'expr' [18:41:25.816] - Field: 'uuid' [18:41:25.816] - Field: 'seed' [18:41:25.816] - Field: 'version' [18:41:25.817] - Field: 'result' [18:41:25.817] - Field: 'asynchronous' [18:41:25.817] - Field: 'calls' [18:41:25.817] - Field: 'globals' [18:41:25.817] - Field: 'stdout' [18:41:25.818] - Field: 'earlySignal' [18:41:25.818] - Field: 'lazy' [18:41:25.818] - Field: 'state' [18:41:25.818] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:25.818] - Launch lazy future ... [18:41:25.819] Packages needed by the future expression (n = 0): [18:41:25.819] Packages needed by future strategies (n = 0): [18:41:25.819] { [18:41:25.819] { [18:41:25.819] { [18:41:25.819] ...future.startTime <- base::Sys.time() [18:41:25.819] { [18:41:25.819] { [18:41:25.819] { [18:41:25.819] { [18:41:25.819] base::local({ [18:41:25.819] has_future <- base::requireNamespace("future", [18:41:25.819] quietly = TRUE) [18:41:25.819] if (has_future) { [18:41:25.819] ns <- base::getNamespace("future") [18:41:25.819] version <- ns[[".package"]][["version"]] [18:41:25.819] if (is.null(version)) [18:41:25.819] version <- utils::packageVersion("future") [18:41:25.819] } [18:41:25.819] else { [18:41:25.819] version <- NULL [18:41:25.819] } [18:41:25.819] if (!has_future || version < "1.8.0") { [18:41:25.819] info <- base::c(r_version = base::gsub("R version ", [18:41:25.819] "", base::R.version$version.string), [18:41:25.819] platform = base::sprintf("%s (%s-bit)", [18:41:25.819] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:25.819] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:25.819] "release", "version")], collapse = " "), [18:41:25.819] hostname = base::Sys.info()[["nodename"]]) [18:41:25.819] info <- base::sprintf("%s: %s", base::names(info), [18:41:25.819] info) [18:41:25.819] info <- base::paste(info, collapse = "; ") [18:41:25.819] if (!has_future) { [18:41:25.819] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:25.819] info) [18:41:25.819] } [18:41:25.819] else { [18:41:25.819] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:25.819] info, version) [18:41:25.819] } [18:41:25.819] base::stop(msg) [18:41:25.819] } [18:41:25.819] }) [18:41:25.819] } [18:41:25.819] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:25.819] base::options(mc.cores = 1L) [18:41:25.819] } [18:41:25.819] ...future.strategy.old <- future::plan("list") [18:41:25.819] options(future.plan = NULL) [18:41:25.819] Sys.unsetenv("R_FUTURE_PLAN") [18:41:25.819] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:25.819] } [18:41:25.819] ...future.workdir <- getwd() [18:41:25.819] } [18:41:25.819] ...future.oldOptions <- base::as.list(base::.Options) [18:41:25.819] ...future.oldEnvVars <- base::Sys.getenv() [18:41:25.819] } [18:41:25.819] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:25.819] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:25.819] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:25.819] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:25.819] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:25.819] future.stdout.windows.reencode = NULL, width = 80L) [18:41:25.819] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:25.819] base::names(...future.oldOptions)) [18:41:25.819] } [18:41:25.819] if (FALSE) { [18:41:25.819] } [18:41:25.819] else { [18:41:25.819] if (TRUE) { [18:41:25.819] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:25.819] open = "w") [18:41:25.819] } [18:41:25.819] else { [18:41:25.819] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:25.819] windows = "NUL", "/dev/null"), open = "w") [18:41:25.819] } [18:41:25.819] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:25.819] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:25.819] base::sink(type = "output", split = FALSE) [18:41:25.819] base::close(...future.stdout) [18:41:25.819] }, add = TRUE) [18:41:25.819] } [18:41:25.819] ...future.frame <- base::sys.nframe() [18:41:25.819] ...future.conditions <- base::list() [18:41:25.819] ...future.rng <- base::globalenv()$.Random.seed [18:41:25.819] if (FALSE) { [18:41:25.819] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:25.819] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:25.819] } [18:41:25.819] ...future.result <- base::tryCatch({ [18:41:25.819] base::withCallingHandlers({ [18:41:25.819] ...future.value <- base::withVisible(base::local({ [18:41:25.819] ...future.makeSendCondition <- base::local({ [18:41:25.819] sendCondition <- NULL [18:41:25.819] function(frame = 1L) { [18:41:25.819] if (is.function(sendCondition)) [18:41:25.819] return(sendCondition) [18:41:25.819] ns <- getNamespace("parallel") [18:41:25.819] if (exists("sendData", mode = "function", [18:41:25.819] envir = ns)) { [18:41:25.819] parallel_sendData <- get("sendData", mode = "function", [18:41:25.819] envir = ns) [18:41:25.819] envir <- sys.frame(frame) [18:41:25.819] master <- NULL [18:41:25.819] while (!identical(envir, .GlobalEnv) && [18:41:25.819] !identical(envir, emptyenv())) { [18:41:25.819] if (exists("master", mode = "list", envir = envir, [18:41:25.819] inherits = FALSE)) { [18:41:25.819] master <- get("master", mode = "list", [18:41:25.819] envir = envir, inherits = FALSE) [18:41:25.819] if (inherits(master, c("SOCKnode", [18:41:25.819] "SOCK0node"))) { [18:41:25.819] sendCondition <<- function(cond) { [18:41:25.819] data <- list(type = "VALUE", value = cond, [18:41:25.819] success = TRUE) [18:41:25.819] parallel_sendData(master, data) [18:41:25.819] } [18:41:25.819] return(sendCondition) [18:41:25.819] } [18:41:25.819] } [18:41:25.819] frame <- frame + 1L [18:41:25.819] envir <- sys.frame(frame) [18:41:25.819] } [18:41:25.819] } [18:41:25.819] sendCondition <<- function(cond) NULL [18:41:25.819] } [18:41:25.819] }) [18:41:25.819] withCallingHandlers({ [18:41:25.819] { [18:41:25.819] do.call(function(...) { [18:41:25.819] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:25.819] if (!identical(...future.globals.maxSize.org, [18:41:25.819] ...future.globals.maxSize)) { [18:41:25.819] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:25.819] on.exit(options(oopts), add = TRUE) [18:41:25.819] } [18:41:25.819] { [18:41:25.819] lapply(seq_along(...future.elements_ii), [18:41:25.819] FUN = function(jj) { [18:41:25.819] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:25.819] ...future.FUN(...future.X_jj, ...) [18:41:25.819] }) [18:41:25.819] } [18:41:25.819] }, args = future.call.arguments) [18:41:25.819] } [18:41:25.819] }, immediateCondition = function(cond) { [18:41:25.819] sendCondition <- ...future.makeSendCondition() [18:41:25.819] sendCondition(cond) [18:41:25.819] muffleCondition <- function (cond, pattern = "^muffle") [18:41:25.819] { [18:41:25.819] inherits <- base::inherits [18:41:25.819] invokeRestart <- base::invokeRestart [18:41:25.819] is.null <- base::is.null [18:41:25.819] muffled <- FALSE [18:41:25.819] if (inherits(cond, "message")) { [18:41:25.819] muffled <- grepl(pattern, "muffleMessage") [18:41:25.819] if (muffled) [18:41:25.819] invokeRestart("muffleMessage") [18:41:25.819] } [18:41:25.819] else if (inherits(cond, "warning")) { [18:41:25.819] muffled <- grepl(pattern, "muffleWarning") [18:41:25.819] if (muffled) [18:41:25.819] invokeRestart("muffleWarning") [18:41:25.819] } [18:41:25.819] else if (inherits(cond, "condition")) { [18:41:25.819] if (!is.null(pattern)) { [18:41:25.819] computeRestarts <- base::computeRestarts [18:41:25.819] grepl <- base::grepl [18:41:25.819] restarts <- computeRestarts(cond) [18:41:25.819] for (restart in restarts) { [18:41:25.819] name <- restart$name [18:41:25.819] if (is.null(name)) [18:41:25.819] next [18:41:25.819] if (!grepl(pattern, name)) [18:41:25.819] next [18:41:25.819] invokeRestart(restart) [18:41:25.819] muffled <- TRUE [18:41:25.819] break [18:41:25.819] } [18:41:25.819] } [18:41:25.819] } [18:41:25.819] invisible(muffled) [18:41:25.819] } [18:41:25.819] muffleCondition(cond) [18:41:25.819] }) [18:41:25.819] })) [18:41:25.819] future::FutureResult(value = ...future.value$value, [18:41:25.819] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:25.819] ...future.rng), globalenv = if (FALSE) [18:41:25.819] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:25.819] ...future.globalenv.names)) [18:41:25.819] else NULL, started = ...future.startTime, version = "1.8") [18:41:25.819] }, condition = base::local({ [18:41:25.819] c <- base::c [18:41:25.819] inherits <- base::inherits [18:41:25.819] invokeRestart <- base::invokeRestart [18:41:25.819] length <- base::length [18:41:25.819] list <- base::list [18:41:25.819] seq.int <- base::seq.int [18:41:25.819] signalCondition <- base::signalCondition [18:41:25.819] sys.calls <- base::sys.calls [18:41:25.819] `[[` <- base::`[[` [18:41:25.819] `+` <- base::`+` [18:41:25.819] `<<-` <- base::`<<-` [18:41:25.819] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:25.819] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:25.819] 3L)] [18:41:25.819] } [18:41:25.819] function(cond) { [18:41:25.819] is_error <- inherits(cond, "error") [18:41:25.819] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:25.819] NULL) [18:41:25.819] if (is_error) { [18:41:25.819] sessionInformation <- function() { [18:41:25.819] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:25.819] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:25.819] search = base::search(), system = base::Sys.info()) [18:41:25.819] } [18:41:25.819] ...future.conditions[[length(...future.conditions) + [18:41:25.819] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:25.819] cond$call), session = sessionInformation(), [18:41:25.819] timestamp = base::Sys.time(), signaled = 0L) [18:41:25.819] signalCondition(cond) [18:41:25.819] } [18:41:25.819] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:25.819] "immediateCondition"))) { [18:41:25.819] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:25.819] ...future.conditions[[length(...future.conditions) + [18:41:25.819] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:25.819] if (TRUE && !signal) { [18:41:25.819] muffleCondition <- function (cond, pattern = "^muffle") [18:41:25.819] { [18:41:25.819] inherits <- base::inherits [18:41:25.819] invokeRestart <- base::invokeRestart [18:41:25.819] is.null <- base::is.null [18:41:25.819] muffled <- FALSE [18:41:25.819] if (inherits(cond, "message")) { [18:41:25.819] muffled <- grepl(pattern, "muffleMessage") [18:41:25.819] if (muffled) [18:41:25.819] invokeRestart("muffleMessage") [18:41:25.819] } [18:41:25.819] else if (inherits(cond, "warning")) { [18:41:25.819] muffled <- grepl(pattern, "muffleWarning") [18:41:25.819] if (muffled) [18:41:25.819] invokeRestart("muffleWarning") [18:41:25.819] } [18:41:25.819] else if (inherits(cond, "condition")) { [18:41:25.819] if (!is.null(pattern)) { [18:41:25.819] computeRestarts <- base::computeRestarts [18:41:25.819] grepl <- base::grepl [18:41:25.819] restarts <- computeRestarts(cond) [18:41:25.819] for (restart in restarts) { [18:41:25.819] name <- restart$name [18:41:25.819] if (is.null(name)) [18:41:25.819] next [18:41:25.819] if (!grepl(pattern, name)) [18:41:25.819] next [18:41:25.819] invokeRestart(restart) [18:41:25.819] muffled <- TRUE [18:41:25.819] break [18:41:25.819] } [18:41:25.819] } [18:41:25.819] } [18:41:25.819] invisible(muffled) [18:41:25.819] } [18:41:25.819] muffleCondition(cond, pattern = "^muffle") [18:41:25.819] } [18:41:25.819] } [18:41:25.819] else { [18:41:25.819] if (TRUE) { [18:41:25.819] muffleCondition <- function (cond, pattern = "^muffle") [18:41:25.819] { [18:41:25.819] inherits <- base::inherits [18:41:25.819] invokeRestart <- base::invokeRestart [18:41:25.819] is.null <- base::is.null [18:41:25.819] muffled <- FALSE [18:41:25.819] if (inherits(cond, "message")) { [18:41:25.819] muffled <- grepl(pattern, "muffleMessage") [18:41:25.819] if (muffled) [18:41:25.819] invokeRestart("muffleMessage") [18:41:25.819] } [18:41:25.819] else if (inherits(cond, "warning")) { [18:41:25.819] muffled <- grepl(pattern, "muffleWarning") [18:41:25.819] if (muffled) [18:41:25.819] invokeRestart("muffleWarning") [18:41:25.819] } [18:41:25.819] else if (inherits(cond, "condition")) { [18:41:25.819] if (!is.null(pattern)) { [18:41:25.819] computeRestarts <- base::computeRestarts [18:41:25.819] grepl <- base::grepl [18:41:25.819] restarts <- computeRestarts(cond) [18:41:25.819] for (restart in restarts) { [18:41:25.819] name <- restart$name [18:41:25.819] if (is.null(name)) [18:41:25.819] next [18:41:25.819] if (!grepl(pattern, name)) [18:41:25.819] next [18:41:25.819] invokeRestart(restart) [18:41:25.819] muffled <- TRUE [18:41:25.819] break [18:41:25.819] } [18:41:25.819] } [18:41:25.819] } [18:41:25.819] invisible(muffled) [18:41:25.819] } [18:41:25.819] muffleCondition(cond, pattern = "^muffle") [18:41:25.819] } [18:41:25.819] } [18:41:25.819] } [18:41:25.819] })) [18:41:25.819] }, error = function(ex) { [18:41:25.819] base::structure(base::list(value = NULL, visible = NULL, [18:41:25.819] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:25.819] ...future.rng), started = ...future.startTime, [18:41:25.819] finished = Sys.time(), session_uuid = NA_character_, [18:41:25.819] version = "1.8"), class = "FutureResult") [18:41:25.819] }, finally = { [18:41:25.819] if (!identical(...future.workdir, getwd())) [18:41:25.819] setwd(...future.workdir) [18:41:25.819] { [18:41:25.819] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:25.819] ...future.oldOptions$nwarnings <- NULL [18:41:25.819] } [18:41:25.819] base::options(...future.oldOptions) [18:41:25.819] if (.Platform$OS.type == "windows") { [18:41:25.819] old_names <- names(...future.oldEnvVars) [18:41:25.819] envs <- base::Sys.getenv() [18:41:25.819] names <- names(envs) [18:41:25.819] common <- intersect(names, old_names) [18:41:25.819] added <- setdiff(names, old_names) [18:41:25.819] removed <- setdiff(old_names, names) [18:41:25.819] changed <- common[...future.oldEnvVars[common] != [18:41:25.819] envs[common]] [18:41:25.819] NAMES <- toupper(changed) [18:41:25.819] args <- list() [18:41:25.819] for (kk in seq_along(NAMES)) { [18:41:25.819] name <- changed[[kk]] [18:41:25.819] NAME <- NAMES[[kk]] [18:41:25.819] if (name != NAME && is.element(NAME, old_names)) [18:41:25.819] next [18:41:25.819] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:25.819] } [18:41:25.819] NAMES <- toupper(added) [18:41:25.819] for (kk in seq_along(NAMES)) { [18:41:25.819] name <- added[[kk]] [18:41:25.819] NAME <- NAMES[[kk]] [18:41:25.819] if (name != NAME && is.element(NAME, old_names)) [18:41:25.819] next [18:41:25.819] args[[name]] <- "" [18:41:25.819] } [18:41:25.819] NAMES <- toupper(removed) [18:41:25.819] for (kk in seq_along(NAMES)) { [18:41:25.819] name <- removed[[kk]] [18:41:25.819] NAME <- NAMES[[kk]] [18:41:25.819] if (name != NAME && is.element(NAME, old_names)) [18:41:25.819] next [18:41:25.819] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:25.819] } [18:41:25.819] if (length(args) > 0) [18:41:25.819] base::do.call(base::Sys.setenv, args = args) [18:41:25.819] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:25.819] } [18:41:25.819] else { [18:41:25.819] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:25.819] } [18:41:25.819] { [18:41:25.819] if (base::length(...future.futureOptionsAdded) > [18:41:25.819] 0L) { [18:41:25.819] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:25.819] base::names(opts) <- ...future.futureOptionsAdded [18:41:25.819] base::options(opts) [18:41:25.819] } [18:41:25.819] { [18:41:25.819] { [18:41:25.819] base::options(mc.cores = ...future.mc.cores.old) [18:41:25.819] NULL [18:41:25.819] } [18:41:25.819] options(future.plan = NULL) [18:41:25.819] if (is.na(NA_character_)) [18:41:25.819] Sys.unsetenv("R_FUTURE_PLAN") [18:41:25.819] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:25.819] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:25.819] .init = FALSE) [18:41:25.819] } [18:41:25.819] } [18:41:25.819] } [18:41:25.819] }) [18:41:25.819] if (TRUE) { [18:41:25.819] base::sink(type = "output", split = FALSE) [18:41:25.819] if (TRUE) { [18:41:25.819] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:25.819] } [18:41:25.819] else { [18:41:25.819] ...future.result["stdout"] <- base::list(NULL) [18:41:25.819] } [18:41:25.819] base::close(...future.stdout) [18:41:25.819] ...future.stdout <- NULL [18:41:25.819] } [18:41:25.819] ...future.result$conditions <- ...future.conditions [18:41:25.819] ...future.result$finished <- base::Sys.time() [18:41:25.819] ...future.result [18:41:25.819] } [18:41:25.825] Exporting 5 global objects (1.20 KiB) to cluster node #1 ... [18:41:25.825] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... [18:41:25.825] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... DONE [18:41:25.825] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... [18:41:25.826] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... DONE [18:41:25.826] Exporting '...future.elements_ii' (128 bytes) to cluster node #1 ... [18:41:25.826] Exporting '...future.elements_ii' (128 bytes) to cluster node #1 ... DONE [18:41:25.827] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:25.827] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:25.827] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:25.827] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:25.828] Exporting 5 global objects (1.20 KiB) to cluster node #1 ... DONE [18:41:25.828] MultisessionFuture started [18:41:25.828] - Launch lazy future ... done [18:41:25.829] run() for 'MultisessionFuture' ... done [18:41:25.829] Created future: [18:41:25.843] receiveMessageFromWorker() for ClusterFuture ... [18:41:25.843] - Validating connection of MultisessionFuture [18:41:25.843] - received message: FutureResult [18:41:25.843] - Received FutureResult [18:41:25.844] - Erased future from FutureRegistry [18:41:25.844] result() for ClusterFuture ... [18:41:25.844] - result already collected: FutureResult [18:41:25.844] result() for ClusterFuture ... done [18:41:25.844] receiveMessageFromWorker() for ClusterFuture ... done [18:41:25.829] MultisessionFuture: [18:41:25.829] Label: 'future_lapply-2' [18:41:25.829] Expression: [18:41:25.829] { [18:41:25.829] do.call(function(...) { [18:41:25.829] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:25.829] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:25.829] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:25.829] on.exit(options(oopts), add = TRUE) [18:41:25.829] } [18:41:25.829] { [18:41:25.829] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:25.829] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:25.829] ...future.FUN(...future.X_jj, ...) [18:41:25.829] }) [18:41:25.829] } [18:41:25.829] }, args = future.call.arguments) [18:41:25.829] } [18:41:25.829] Lazy evaluation: FALSE [18:41:25.829] Asynchronous evaluation: TRUE [18:41:25.829] Local evaluation: TRUE [18:41:25.829] Environment: R_GlobalEnv [18:41:25.829] Capture standard output: TRUE [18:41:25.829] Capture condition classes: 'condition' (excluding 'nothing') [18:41:25.829] Globals: 5 objects totaling 790 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 128 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:25.829] Packages: [18:41:25.829] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:25.829] Resolved: TRUE [18:41:25.829] Value: [18:41:25.829] Conditions captured: [18:41:25.829] Early signaling: FALSE [18:41:25.829] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:25.829] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:25.845] Chunk #2 of 2 ... DONE [18:41:25.845] Launching 2 futures (chunks) ... DONE [18:41:25.845] Resolving 2 futures (chunks) ... [18:41:25.845] resolve() on list ... [18:41:25.845] recursive: 0 [18:41:25.846] length: 2 [18:41:25.846] [18:41:25.846] Future #1 [18:41:25.846] result() for ClusterFuture ... [18:41:25.846] - result already collected: FutureResult [18:41:25.846] result() for ClusterFuture ... done [18:41:25.847] result() for ClusterFuture ... [18:41:25.847] - result already collected: FutureResult [18:41:25.847] result() for ClusterFuture ... done [18:41:25.847] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:25.847] - nx: 2 [18:41:25.847] - relay: TRUE [18:41:25.848] - stdout: TRUE [18:41:25.848] - signal: TRUE [18:41:25.848] - resignal: FALSE [18:41:25.848] - force: TRUE [18:41:25.848] - relayed: [n=2] FALSE, FALSE [18:41:25.848] - queued futures: [n=2] FALSE, FALSE [18:41:25.848] - until=1 [18:41:25.849] - relaying element #1 [18:41:25.849] result() for ClusterFuture ... [18:41:25.849] - result already collected: FutureResult [18:41:25.849] result() for ClusterFuture ... done [18:41:25.849] result() for ClusterFuture ... [18:41:25.849] - result already collected: FutureResult [18:41:25.850] result() for ClusterFuture ... done [18:41:25.850] result() for ClusterFuture ... [18:41:25.850] - result already collected: FutureResult [18:41:25.850] result() for ClusterFuture ... done [18:41:25.850] result() for ClusterFuture ... [18:41:25.850] - result already collected: FutureResult [18:41:25.851] result() for ClusterFuture ... done [18:41:25.851] - relayed: [n=2] TRUE, FALSE [18:41:25.851] - queued futures: [n=2] TRUE, FALSE [18:41:25.851] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:25.851] length: 1 (resolved future 1) [18:41:25.851] Future #2 [18:41:25.852] result() for ClusterFuture ... [18:41:25.852] - result already collected: FutureResult [18:41:25.852] result() for ClusterFuture ... done [18:41:25.852] result() for ClusterFuture ... [18:41:25.852] - result already collected: FutureResult [18:41:25.852] result() for ClusterFuture ... done [18:41:25.853] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:25.853] - nx: 2 [18:41:25.853] - relay: TRUE [18:41:25.853] - stdout: TRUE [18:41:25.853] - signal: TRUE [18:41:25.853] - resignal: FALSE [18:41:25.853] - force: TRUE [18:41:25.854] - relayed: [n=2] TRUE, FALSE [18:41:25.854] - queued futures: [n=2] TRUE, FALSE [18:41:25.854] - until=2 [18:41:25.854] - relaying element #2 [18:41:25.854] result() for ClusterFuture ... [18:41:25.854] - result already collected: FutureResult [18:41:25.855] result() for ClusterFuture ... done [18:41:25.855] result() for ClusterFuture ... [18:41:25.855] - result already collected: FutureResult [18:41:25.855] result() for ClusterFuture ... done [18:41:25.855] result() for ClusterFuture ... [18:41:25.855] - result already collected: FutureResult [18:41:25.856] result() for ClusterFuture ... done [18:41:25.856] result() for ClusterFuture ... [18:41:25.856] - result already collected: FutureResult [18:41:25.856] result() for ClusterFuture ... done [18:41:25.856] - relayed: [n=2] TRUE, TRUE [18:41:25.856] - queued futures: [n=2] TRUE, TRUE [18:41:25.857] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:25.857] length: 0 (resolved future 2) [18:41:25.857] Relaying remaining futures [18:41:25.857] signalConditionsASAP(NULL, pos=0) ... [18:41:25.857] - nx: 2 [18:41:25.857] - relay: TRUE [18:41:25.858] - stdout: TRUE [18:41:25.858] - signal: TRUE [18:41:25.858] - resignal: FALSE [18:41:25.858] - force: TRUE [18:41:25.858] - relayed: [n=2] TRUE, TRUE [18:41:25.858] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:25.859] - relayed: [n=2] TRUE, TRUE [18:41:25.859] - queued futures: [n=2] TRUE, TRUE [18:41:25.859] signalConditionsASAP(NULL, pos=0) ... done [18:41:25.859] resolve() on list ... DONE [18:41:25.859] result() for ClusterFuture ... [18:41:25.859] - result already collected: FutureResult [18:41:25.859] result() for ClusterFuture ... done [18:41:25.860] result() for ClusterFuture ... [18:41:25.860] - result already collected: FutureResult [18:41:25.860] result() for ClusterFuture ... done [18:41:25.860] result() for ClusterFuture ... [18:41:25.860] - result already collected: FutureResult [18:41:25.860] result() for ClusterFuture ... done [18:41:25.861] result() for ClusterFuture ... [18:41:25.861] - result already collected: FutureResult [18:41:25.861] result() for ClusterFuture ... done [18:41:25.861] - Number of value chunks collected: 2 [18:41:25.861] Resolving 2 futures (chunks) ... DONE [18:41:25.861] Reducing values from 2 chunks ... [18:41:25.862] - Number of values collected after concatenation: 4 [18:41:25.862] - Number of values expected: 4 [18:41:25.862] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [18:41:25.862] Reducing values from 2 chunks ... DONE [18:41:25.862] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL - future_lapply(x, FUN = base::vector, ...) ... [18:41:25.865] future_lapply() ... [18:41:25.868] Number of chunks: 2 [18:41:25.869] Index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [18:41:25.869] getGlobalsAndPackagesXApply() ... [18:41:25.869] - future.globals: TRUE [18:41:25.869] getGlobalsAndPackages() ... [18:41:25.869] Searching for globals... [18:41:25.871] - globals found: [2] 'FUN', '.Internal' [18:41:25.871] Searching for globals ... DONE [18:41:25.871] Resolving globals: FALSE [18:41:25.872] The total size of the 1 globals is 456 bytes (456 bytes) [18:41:25.872] The total size of the 1 globals exported for future expression ('FUN(length = 2L)') is 456 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (456 bytes of class 'function') [18:41:25.872] - globals: [1] 'FUN' [18:41:25.873] [18:41:25.873] getGlobalsAndPackages() ... DONE [18:41:25.873] - globals found/used: [n=1] 'FUN' [18:41:25.873] - needed namespaces: [n=0] [18:41:25.873] Finding globals ... DONE [18:41:25.873] - use_args: TRUE [18:41:25.874] - Getting '...' globals ... [18:41:25.874] resolve() on list ... [18:41:25.874] recursive: 0 [18:41:25.874] length: 1 [18:41:25.875] elements: '...' [18:41:25.875] length: 0 (resolved future 1) [18:41:25.875] resolve() on list ... DONE [18:41:25.875] - '...' content: [n=1] 'length' [18:41:25.875] List of 1 [18:41:25.875] $ ...:List of 1 [18:41:25.875] ..$ length: int 2 [18:41:25.875] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:25.875] - attr(*, "where")=List of 1 [18:41:25.875] ..$ ...: [18:41:25.875] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:25.875] - attr(*, "resolved")= logi TRUE [18:41:25.875] - attr(*, "total_size")= num NA [18:41:25.879] - Getting '...' globals ... DONE [18:41:25.879] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:25.880] List of 2 [18:41:25.880] $ ...future.FUN:function (mode = "logical", length = 0L) [18:41:25.880] $ ... :List of 1 [18:41:25.880] ..$ length: int 2 [18:41:25.880] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:25.880] - attr(*, "where")=List of 2 [18:41:25.880] ..$ ...future.FUN: [18:41:25.880] ..$ ... : [18:41:25.880] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:25.880] - attr(*, "resolved")= logi FALSE [18:41:25.880] - attr(*, "total_size")= int 4881 [18:41:25.884] Packages to be attached in all futures: [n=0] [18:41:25.884] getGlobalsAndPackagesXApply() ... DONE [18:41:25.884] Number of futures (= number of chunks): 2 [18:41:25.884] Launching 2 futures (chunks) ... [18:41:25.885] Chunk #1 of 2 ... [18:41:25.885] - Finding globals in 'X' for chunk #1 ... [18:41:25.885] getGlobalsAndPackages() ... [18:41:25.885] Searching for globals... [18:41:25.885] [18:41:25.886] Searching for globals ... DONE [18:41:25.886] - globals: [0] [18:41:25.886] getGlobalsAndPackages() ... DONE [18:41:25.886] + additional globals found: [n=0] [18:41:25.886] + additional namespaces needed: [n=0] [18:41:25.886] - Finding globals in 'X' for chunk #1 ... DONE [18:41:25.887] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:25.887] - seeds: [18:41:25.887] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:25.887] getGlobalsAndPackages() ... [18:41:25.887] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:25.887] Resolving globals: FALSE [18:41:25.888] Tweak future expression to call with '...' arguments ... [18:41:25.888] { [18:41:25.888] do.call(function(...) { [18:41:25.888] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:25.888] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:25.888] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:25.888] on.exit(options(oopts), add = TRUE) [18:41:25.888] } [18:41:25.888] { [18:41:25.888] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:25.888] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:25.888] ...future.FUN(...future.X_jj, ...) [18:41:25.888] }) [18:41:25.888] } [18:41:25.888] }, args = future.call.arguments) [18:41:25.888] } [18:41:25.888] Tweak future expression to call with '...' arguments ... DONE [18:41:25.889] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:25.889] [18:41:25.889] getGlobalsAndPackages() ... DONE [18:41:25.890] run() for 'Future' ... [18:41:25.890] - state: 'created' [18:41:25.890] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:25.906] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:25.906] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:25.906] - Field: 'node' [18:41:25.906] - Field: 'label' [18:41:25.907] - Field: 'local' [18:41:25.907] - Field: 'owner' [18:41:25.907] - Field: 'envir' [18:41:25.907] - Field: 'workers' [18:41:25.907] - Field: 'packages' [18:41:25.907] - Field: 'gc' [18:41:25.908] - Field: 'conditions' [18:41:25.908] - Field: 'persistent' [18:41:25.908] - Field: 'expr' [18:41:25.908] - Field: 'uuid' [18:41:25.908] - Field: 'seed' [18:41:25.909] - Field: 'version' [18:41:25.909] - Field: 'result' [18:41:25.909] - Field: 'asynchronous' [18:41:25.909] - Field: 'calls' [18:41:25.909] - Field: 'globals' [18:41:25.910] - Field: 'stdout' [18:41:25.910] - Field: 'earlySignal' [18:41:25.910] - Field: 'lazy' [18:41:25.910] - Field: 'state' [18:41:25.910] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:25.910] - Launch lazy future ... [18:41:25.911] Packages needed by the future expression (n = 0): [18:41:25.911] Packages needed by future strategies (n = 0): [18:41:25.912] { [18:41:25.912] { [18:41:25.912] { [18:41:25.912] ...future.startTime <- base::Sys.time() [18:41:25.912] { [18:41:25.912] { [18:41:25.912] { [18:41:25.912] { [18:41:25.912] base::local({ [18:41:25.912] has_future <- base::requireNamespace("future", [18:41:25.912] quietly = TRUE) [18:41:25.912] if (has_future) { [18:41:25.912] ns <- base::getNamespace("future") [18:41:25.912] version <- ns[[".package"]][["version"]] [18:41:25.912] if (is.null(version)) [18:41:25.912] version <- utils::packageVersion("future") [18:41:25.912] } [18:41:25.912] else { [18:41:25.912] version <- NULL [18:41:25.912] } [18:41:25.912] if (!has_future || version < "1.8.0") { [18:41:25.912] info <- base::c(r_version = base::gsub("R version ", [18:41:25.912] "", base::R.version$version.string), [18:41:25.912] platform = base::sprintf("%s (%s-bit)", [18:41:25.912] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:25.912] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:25.912] "release", "version")], collapse = " "), [18:41:25.912] hostname = base::Sys.info()[["nodename"]]) [18:41:25.912] info <- base::sprintf("%s: %s", base::names(info), [18:41:25.912] info) [18:41:25.912] info <- base::paste(info, collapse = "; ") [18:41:25.912] if (!has_future) { [18:41:25.912] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:25.912] info) [18:41:25.912] } [18:41:25.912] else { [18:41:25.912] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:25.912] info, version) [18:41:25.912] } [18:41:25.912] base::stop(msg) [18:41:25.912] } [18:41:25.912] }) [18:41:25.912] } [18:41:25.912] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:25.912] base::options(mc.cores = 1L) [18:41:25.912] } [18:41:25.912] ...future.strategy.old <- future::plan("list") [18:41:25.912] options(future.plan = NULL) [18:41:25.912] Sys.unsetenv("R_FUTURE_PLAN") [18:41:25.912] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:25.912] } [18:41:25.912] ...future.workdir <- getwd() [18:41:25.912] } [18:41:25.912] ...future.oldOptions <- base::as.list(base::.Options) [18:41:25.912] ...future.oldEnvVars <- base::Sys.getenv() [18:41:25.912] } [18:41:25.912] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:25.912] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:25.912] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:25.912] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:25.912] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:25.912] future.stdout.windows.reencode = NULL, width = 80L) [18:41:25.912] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:25.912] base::names(...future.oldOptions)) [18:41:25.912] } [18:41:25.912] if (FALSE) { [18:41:25.912] } [18:41:25.912] else { [18:41:25.912] if (TRUE) { [18:41:25.912] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:25.912] open = "w") [18:41:25.912] } [18:41:25.912] else { [18:41:25.912] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:25.912] windows = "NUL", "/dev/null"), open = "w") [18:41:25.912] } [18:41:25.912] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:25.912] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:25.912] base::sink(type = "output", split = FALSE) [18:41:25.912] base::close(...future.stdout) [18:41:25.912] }, add = TRUE) [18:41:25.912] } [18:41:25.912] ...future.frame <- base::sys.nframe() [18:41:25.912] ...future.conditions <- base::list() [18:41:25.912] ...future.rng <- base::globalenv()$.Random.seed [18:41:25.912] if (FALSE) { [18:41:25.912] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:25.912] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:25.912] } [18:41:25.912] ...future.result <- base::tryCatch({ [18:41:25.912] base::withCallingHandlers({ [18:41:25.912] ...future.value <- base::withVisible(base::local({ [18:41:25.912] ...future.makeSendCondition <- base::local({ [18:41:25.912] sendCondition <- NULL [18:41:25.912] function(frame = 1L) { [18:41:25.912] if (is.function(sendCondition)) [18:41:25.912] return(sendCondition) [18:41:25.912] ns <- getNamespace("parallel") [18:41:25.912] if (exists("sendData", mode = "function", [18:41:25.912] envir = ns)) { [18:41:25.912] parallel_sendData <- get("sendData", mode = "function", [18:41:25.912] envir = ns) [18:41:25.912] envir <- sys.frame(frame) [18:41:25.912] master <- NULL [18:41:25.912] while (!identical(envir, .GlobalEnv) && [18:41:25.912] !identical(envir, emptyenv())) { [18:41:25.912] if (exists("master", mode = "list", envir = envir, [18:41:25.912] inherits = FALSE)) { [18:41:25.912] master <- get("master", mode = "list", [18:41:25.912] envir = envir, inherits = FALSE) [18:41:25.912] if (inherits(master, c("SOCKnode", [18:41:25.912] "SOCK0node"))) { [18:41:25.912] sendCondition <<- function(cond) { [18:41:25.912] data <- list(type = "VALUE", value = cond, [18:41:25.912] success = TRUE) [18:41:25.912] parallel_sendData(master, data) [18:41:25.912] } [18:41:25.912] return(sendCondition) [18:41:25.912] } [18:41:25.912] } [18:41:25.912] frame <- frame + 1L [18:41:25.912] envir <- sys.frame(frame) [18:41:25.912] } [18:41:25.912] } [18:41:25.912] sendCondition <<- function(cond) NULL [18:41:25.912] } [18:41:25.912] }) [18:41:25.912] withCallingHandlers({ [18:41:25.912] { [18:41:25.912] do.call(function(...) { [18:41:25.912] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:25.912] if (!identical(...future.globals.maxSize.org, [18:41:25.912] ...future.globals.maxSize)) { [18:41:25.912] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:25.912] on.exit(options(oopts), add = TRUE) [18:41:25.912] } [18:41:25.912] { [18:41:25.912] lapply(seq_along(...future.elements_ii), [18:41:25.912] FUN = function(jj) { [18:41:25.912] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:25.912] ...future.FUN(...future.X_jj, ...) [18:41:25.912] }) [18:41:25.912] } [18:41:25.912] }, args = future.call.arguments) [18:41:25.912] } [18:41:25.912] }, immediateCondition = function(cond) { [18:41:25.912] sendCondition <- ...future.makeSendCondition() [18:41:25.912] sendCondition(cond) [18:41:25.912] muffleCondition <- function (cond, pattern = "^muffle") [18:41:25.912] { [18:41:25.912] inherits <- base::inherits [18:41:25.912] invokeRestart <- base::invokeRestart [18:41:25.912] is.null <- base::is.null [18:41:25.912] muffled <- FALSE [18:41:25.912] if (inherits(cond, "message")) { [18:41:25.912] muffled <- grepl(pattern, "muffleMessage") [18:41:25.912] if (muffled) [18:41:25.912] invokeRestart("muffleMessage") [18:41:25.912] } [18:41:25.912] else if (inherits(cond, "warning")) { [18:41:25.912] muffled <- grepl(pattern, "muffleWarning") [18:41:25.912] if (muffled) [18:41:25.912] invokeRestart("muffleWarning") [18:41:25.912] } [18:41:25.912] else if (inherits(cond, "condition")) { [18:41:25.912] if (!is.null(pattern)) { [18:41:25.912] computeRestarts <- base::computeRestarts [18:41:25.912] grepl <- base::grepl [18:41:25.912] restarts <- computeRestarts(cond) [18:41:25.912] for (restart in restarts) { [18:41:25.912] name <- restart$name [18:41:25.912] if (is.null(name)) [18:41:25.912] next [18:41:25.912] if (!grepl(pattern, name)) [18:41:25.912] next [18:41:25.912] invokeRestart(restart) [18:41:25.912] muffled <- TRUE [18:41:25.912] break [18:41:25.912] } [18:41:25.912] } [18:41:25.912] } [18:41:25.912] invisible(muffled) [18:41:25.912] } [18:41:25.912] muffleCondition(cond) [18:41:25.912] }) [18:41:25.912] })) [18:41:25.912] future::FutureResult(value = ...future.value$value, [18:41:25.912] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:25.912] ...future.rng), globalenv = if (FALSE) [18:41:25.912] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:25.912] ...future.globalenv.names)) [18:41:25.912] else NULL, started = ...future.startTime, version = "1.8") [18:41:25.912] }, condition = base::local({ [18:41:25.912] c <- base::c [18:41:25.912] inherits <- base::inherits [18:41:25.912] invokeRestart <- base::invokeRestart [18:41:25.912] length <- base::length [18:41:25.912] list <- base::list [18:41:25.912] seq.int <- base::seq.int [18:41:25.912] signalCondition <- base::signalCondition [18:41:25.912] sys.calls <- base::sys.calls [18:41:25.912] `[[` <- base::`[[` [18:41:25.912] `+` <- base::`+` [18:41:25.912] `<<-` <- base::`<<-` [18:41:25.912] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:25.912] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:25.912] 3L)] [18:41:25.912] } [18:41:25.912] function(cond) { [18:41:25.912] is_error <- inherits(cond, "error") [18:41:25.912] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:25.912] NULL) [18:41:25.912] if (is_error) { [18:41:25.912] sessionInformation <- function() { [18:41:25.912] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:25.912] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:25.912] search = base::search(), system = base::Sys.info()) [18:41:25.912] } [18:41:25.912] ...future.conditions[[length(...future.conditions) + [18:41:25.912] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:25.912] cond$call), session = sessionInformation(), [18:41:25.912] timestamp = base::Sys.time(), signaled = 0L) [18:41:25.912] signalCondition(cond) [18:41:25.912] } [18:41:25.912] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:25.912] "immediateCondition"))) { [18:41:25.912] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:25.912] ...future.conditions[[length(...future.conditions) + [18:41:25.912] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:25.912] if (TRUE && !signal) { [18:41:25.912] muffleCondition <- function (cond, pattern = "^muffle") [18:41:25.912] { [18:41:25.912] inherits <- base::inherits [18:41:25.912] invokeRestart <- base::invokeRestart [18:41:25.912] is.null <- base::is.null [18:41:25.912] muffled <- FALSE [18:41:25.912] if (inherits(cond, "message")) { [18:41:25.912] muffled <- grepl(pattern, "muffleMessage") [18:41:25.912] if (muffled) [18:41:25.912] invokeRestart("muffleMessage") [18:41:25.912] } [18:41:25.912] else if (inherits(cond, "warning")) { [18:41:25.912] muffled <- grepl(pattern, "muffleWarning") [18:41:25.912] if (muffled) [18:41:25.912] invokeRestart("muffleWarning") [18:41:25.912] } [18:41:25.912] else if (inherits(cond, "condition")) { [18:41:25.912] if (!is.null(pattern)) { [18:41:25.912] computeRestarts <- base::computeRestarts [18:41:25.912] grepl <- base::grepl [18:41:25.912] restarts <- computeRestarts(cond) [18:41:25.912] for (restart in restarts) { [18:41:25.912] name <- restart$name [18:41:25.912] if (is.null(name)) [18:41:25.912] next [18:41:25.912] if (!grepl(pattern, name)) [18:41:25.912] next [18:41:25.912] invokeRestart(restart) [18:41:25.912] muffled <- TRUE [18:41:25.912] break [18:41:25.912] } [18:41:25.912] } [18:41:25.912] } [18:41:25.912] invisible(muffled) [18:41:25.912] } [18:41:25.912] muffleCondition(cond, pattern = "^muffle") [18:41:25.912] } [18:41:25.912] } [18:41:25.912] else { [18:41:25.912] if (TRUE) { [18:41:25.912] muffleCondition <- function (cond, pattern = "^muffle") [18:41:25.912] { [18:41:25.912] inherits <- base::inherits [18:41:25.912] invokeRestart <- base::invokeRestart [18:41:25.912] is.null <- base::is.null [18:41:25.912] muffled <- FALSE [18:41:25.912] if (inherits(cond, "message")) { [18:41:25.912] muffled <- grepl(pattern, "muffleMessage") [18:41:25.912] if (muffled) [18:41:25.912] invokeRestart("muffleMessage") [18:41:25.912] } [18:41:25.912] else if (inherits(cond, "warning")) { [18:41:25.912] muffled <- grepl(pattern, "muffleWarning") [18:41:25.912] if (muffled) [18:41:25.912] invokeRestart("muffleWarning") [18:41:25.912] } [18:41:25.912] else if (inherits(cond, "condition")) { [18:41:25.912] if (!is.null(pattern)) { [18:41:25.912] computeRestarts <- base::computeRestarts [18:41:25.912] grepl <- base::grepl [18:41:25.912] restarts <- computeRestarts(cond) [18:41:25.912] for (restart in restarts) { [18:41:25.912] name <- restart$name [18:41:25.912] if (is.null(name)) [18:41:25.912] next [18:41:25.912] if (!grepl(pattern, name)) [18:41:25.912] next [18:41:25.912] invokeRestart(restart) [18:41:25.912] muffled <- TRUE [18:41:25.912] break [18:41:25.912] } [18:41:25.912] } [18:41:25.912] } [18:41:25.912] invisible(muffled) [18:41:25.912] } [18:41:25.912] muffleCondition(cond, pattern = "^muffle") [18:41:25.912] } [18:41:25.912] } [18:41:25.912] } [18:41:25.912] })) [18:41:25.912] }, error = function(ex) { [18:41:25.912] base::structure(base::list(value = NULL, visible = NULL, [18:41:25.912] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:25.912] ...future.rng), started = ...future.startTime, [18:41:25.912] finished = Sys.time(), session_uuid = NA_character_, [18:41:25.912] version = "1.8"), class = "FutureResult") [18:41:25.912] }, finally = { [18:41:25.912] if (!identical(...future.workdir, getwd())) [18:41:25.912] setwd(...future.workdir) [18:41:25.912] { [18:41:25.912] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:25.912] ...future.oldOptions$nwarnings <- NULL [18:41:25.912] } [18:41:25.912] base::options(...future.oldOptions) [18:41:25.912] if (.Platform$OS.type == "windows") { [18:41:25.912] old_names <- names(...future.oldEnvVars) [18:41:25.912] envs <- base::Sys.getenv() [18:41:25.912] names <- names(envs) [18:41:25.912] common <- intersect(names, old_names) [18:41:25.912] added <- setdiff(names, old_names) [18:41:25.912] removed <- setdiff(old_names, names) [18:41:25.912] changed <- common[...future.oldEnvVars[common] != [18:41:25.912] envs[common]] [18:41:25.912] NAMES <- toupper(changed) [18:41:25.912] args <- list() [18:41:25.912] for (kk in seq_along(NAMES)) { [18:41:25.912] name <- changed[[kk]] [18:41:25.912] NAME <- NAMES[[kk]] [18:41:25.912] if (name != NAME && is.element(NAME, old_names)) [18:41:25.912] next [18:41:25.912] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:25.912] } [18:41:25.912] NAMES <- toupper(added) [18:41:25.912] for (kk in seq_along(NAMES)) { [18:41:25.912] name <- added[[kk]] [18:41:25.912] NAME <- NAMES[[kk]] [18:41:25.912] if (name != NAME && is.element(NAME, old_names)) [18:41:25.912] next [18:41:25.912] args[[name]] <- "" [18:41:25.912] } [18:41:25.912] NAMES <- toupper(removed) [18:41:25.912] for (kk in seq_along(NAMES)) { [18:41:25.912] name <- removed[[kk]] [18:41:25.912] NAME <- NAMES[[kk]] [18:41:25.912] if (name != NAME && is.element(NAME, old_names)) [18:41:25.912] next [18:41:25.912] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:25.912] } [18:41:25.912] if (length(args) > 0) [18:41:25.912] base::do.call(base::Sys.setenv, args = args) [18:41:25.912] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:25.912] } [18:41:25.912] else { [18:41:25.912] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:25.912] } [18:41:25.912] { [18:41:25.912] if (base::length(...future.futureOptionsAdded) > [18:41:25.912] 0L) { [18:41:25.912] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:25.912] base::names(opts) <- ...future.futureOptionsAdded [18:41:25.912] base::options(opts) [18:41:25.912] } [18:41:25.912] { [18:41:25.912] { [18:41:25.912] base::options(mc.cores = ...future.mc.cores.old) [18:41:25.912] NULL [18:41:25.912] } [18:41:25.912] options(future.plan = NULL) [18:41:25.912] if (is.na(NA_character_)) [18:41:25.912] Sys.unsetenv("R_FUTURE_PLAN") [18:41:25.912] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:25.912] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:25.912] .init = FALSE) [18:41:25.912] } [18:41:25.912] } [18:41:25.912] } [18:41:25.912] }) [18:41:25.912] if (TRUE) { [18:41:25.912] base::sink(type = "output", split = FALSE) [18:41:25.912] if (TRUE) { [18:41:25.912] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:25.912] } [18:41:25.912] else { [18:41:25.912] ...future.result["stdout"] <- base::list(NULL) [18:41:25.912] } [18:41:25.912] base::close(...future.stdout) [18:41:25.912] ...future.stdout <- NULL [18:41:25.912] } [18:41:25.912] ...future.result$conditions <- ...future.conditions [18:41:25.912] ...future.result$finished <- base::Sys.time() [18:41:25.912] ...future.result [18:41:25.912] } [18:41:25.917] Exporting 5 global objects (1.20 KiB) to cluster node #1 ... [18:41:25.917] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... [18:41:25.921] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... DONE [18:41:25.921] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... [18:41:25.921] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... DONE [18:41:25.922] Exporting '...future.elements_ii' (127 bytes) to cluster node #1 ... [18:41:25.922] Exporting '...future.elements_ii' (127 bytes) to cluster node #1 ... DONE [18:41:25.922] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:25.923] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:25.923] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:25.923] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:25.924] Exporting 5 global objects (1.20 KiB) to cluster node #1 ... DONE [18:41:25.924] MultisessionFuture started [18:41:25.924] - Launch lazy future ... done [18:41:25.925] run() for 'MultisessionFuture' ... done [18:41:25.925] Created future: [18:41:25.941] receiveMessageFromWorker() for ClusterFuture ... [18:41:25.942] - Validating connection of MultisessionFuture [18:41:25.942] - received message: FutureResult [18:41:25.942] - Received FutureResult [18:41:25.942] - Erased future from FutureRegistry [18:41:25.943] result() for ClusterFuture ... [18:41:25.943] - result already collected: FutureResult [18:41:25.943] result() for ClusterFuture ... done [18:41:25.943] receiveMessageFromWorker() for ClusterFuture ... done [18:41:25.925] MultisessionFuture: [18:41:25.925] Label: 'future_lapply-1' [18:41:25.925] Expression: [18:41:25.925] { [18:41:25.925] do.call(function(...) { [18:41:25.925] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:25.925] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:25.925] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:25.925] on.exit(options(oopts), add = TRUE) [18:41:25.925] } [18:41:25.925] { [18:41:25.925] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:25.925] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:25.925] ...future.FUN(...future.X_jj, ...) [18:41:25.925] }) [18:41:25.925] } [18:41:25.925] }, args = future.call.arguments) [18:41:25.925] } [18:41:25.925] Lazy evaluation: FALSE [18:41:25.925] Asynchronous evaluation: TRUE [18:41:25.925] Local evaluation: TRUE [18:41:25.925] Environment: R_GlobalEnv [18:41:25.925] Capture standard output: TRUE [18:41:25.925] Capture condition classes: 'condition' (excluding 'nothing') [18:41:25.925] Globals: 5 objects totaling 789 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 127 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:25.925] Packages: [18:41:25.925] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:25.925] Resolved: TRUE [18:41:25.925] Value: [18:41:25.925] Conditions captured: [18:41:25.925] Early signaling: FALSE [18:41:25.925] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:25.925] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:25.944] Chunk #1 of 2 ... DONE [18:41:25.944] Chunk #2 of 2 ... [18:41:25.944] - Finding globals in 'X' for chunk #2 ... [18:41:25.944] getGlobalsAndPackages() ... [18:41:25.944] Searching for globals... [18:41:25.945] [18:41:25.945] Searching for globals ... DONE [18:41:25.945] - globals: [0] [18:41:25.945] getGlobalsAndPackages() ... DONE [18:41:25.945] + additional globals found: [n=0] [18:41:25.946] + additional namespaces needed: [n=0] [18:41:25.946] - Finding globals in 'X' for chunk #2 ... DONE [18:41:25.946] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:25.946] - seeds: [18:41:25.946] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:25.946] getGlobalsAndPackages() ... [18:41:25.947] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:25.947] Resolving globals: FALSE [18:41:25.947] Tweak future expression to call with '...' arguments ... [18:41:25.947] { [18:41:25.947] do.call(function(...) { [18:41:25.947] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:25.947] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:25.947] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:25.947] on.exit(options(oopts), add = TRUE) [18:41:25.947] } [18:41:25.947] { [18:41:25.947] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:25.947] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:25.947] ...future.FUN(...future.X_jj, ...) [18:41:25.947] }) [18:41:25.947] } [18:41:25.947] }, args = future.call.arguments) [18:41:25.947] } [18:41:25.948] Tweak future expression to call with '...' arguments ... DONE [18:41:25.948] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:25.948] [18:41:25.948] getGlobalsAndPackages() ... DONE [18:41:25.949] run() for 'Future' ... [18:41:25.949] - state: 'created' [18:41:25.949] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:25.965] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:25.965] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:25.965] - Field: 'node' [18:41:25.965] - Field: 'label' [18:41:25.965] - Field: 'local' [18:41:25.966] - Field: 'owner' [18:41:25.966] - Field: 'envir' [18:41:25.966] - Field: 'workers' [18:41:25.966] - Field: 'packages' [18:41:25.966] - Field: 'gc' [18:41:25.967] - Field: 'conditions' [18:41:25.967] - Field: 'persistent' [18:41:25.967] - Field: 'expr' [18:41:25.967] - Field: 'uuid' [18:41:25.967] - Field: 'seed' [18:41:25.967] - Field: 'version' [18:41:25.968] - Field: 'result' [18:41:25.968] - Field: 'asynchronous' [18:41:25.968] - Field: 'calls' [18:41:25.968] - Field: 'globals' [18:41:25.968] - Field: 'stdout' [18:41:25.969] - Field: 'earlySignal' [18:41:25.969] - Field: 'lazy' [18:41:25.969] - Field: 'state' [18:41:25.969] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:25.969] - Launch lazy future ... [18:41:25.970] Packages needed by the future expression (n = 0): [18:41:25.970] Packages needed by future strategies (n = 0): [18:41:25.970] { [18:41:25.970] { [18:41:25.970] { [18:41:25.970] ...future.startTime <- base::Sys.time() [18:41:25.970] { [18:41:25.970] { [18:41:25.970] { [18:41:25.970] { [18:41:25.970] base::local({ [18:41:25.970] has_future <- base::requireNamespace("future", [18:41:25.970] quietly = TRUE) [18:41:25.970] if (has_future) { [18:41:25.970] ns <- base::getNamespace("future") [18:41:25.970] version <- ns[[".package"]][["version"]] [18:41:25.970] if (is.null(version)) [18:41:25.970] version <- utils::packageVersion("future") [18:41:25.970] } [18:41:25.970] else { [18:41:25.970] version <- NULL [18:41:25.970] } [18:41:25.970] if (!has_future || version < "1.8.0") { [18:41:25.970] info <- base::c(r_version = base::gsub("R version ", [18:41:25.970] "", base::R.version$version.string), [18:41:25.970] platform = base::sprintf("%s (%s-bit)", [18:41:25.970] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:25.970] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:25.970] "release", "version")], collapse = " "), [18:41:25.970] hostname = base::Sys.info()[["nodename"]]) [18:41:25.970] info <- base::sprintf("%s: %s", base::names(info), [18:41:25.970] info) [18:41:25.970] info <- base::paste(info, collapse = "; ") [18:41:25.970] if (!has_future) { [18:41:25.970] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:25.970] info) [18:41:25.970] } [18:41:25.970] else { [18:41:25.970] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:25.970] info, version) [18:41:25.970] } [18:41:25.970] base::stop(msg) [18:41:25.970] } [18:41:25.970] }) [18:41:25.970] } [18:41:25.970] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:25.970] base::options(mc.cores = 1L) [18:41:25.970] } [18:41:25.970] ...future.strategy.old <- future::plan("list") [18:41:25.970] options(future.plan = NULL) [18:41:25.970] Sys.unsetenv("R_FUTURE_PLAN") [18:41:25.970] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:25.970] } [18:41:25.970] ...future.workdir <- getwd() [18:41:25.970] } [18:41:25.970] ...future.oldOptions <- base::as.list(base::.Options) [18:41:25.970] ...future.oldEnvVars <- base::Sys.getenv() [18:41:25.970] } [18:41:25.970] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:25.970] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:25.970] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:25.970] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:25.970] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:25.970] future.stdout.windows.reencode = NULL, width = 80L) [18:41:25.970] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:25.970] base::names(...future.oldOptions)) [18:41:25.970] } [18:41:25.970] if (FALSE) { [18:41:25.970] } [18:41:25.970] else { [18:41:25.970] if (TRUE) { [18:41:25.970] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:25.970] open = "w") [18:41:25.970] } [18:41:25.970] else { [18:41:25.970] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:25.970] windows = "NUL", "/dev/null"), open = "w") [18:41:25.970] } [18:41:25.970] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:25.970] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:25.970] base::sink(type = "output", split = FALSE) [18:41:25.970] base::close(...future.stdout) [18:41:25.970] }, add = TRUE) [18:41:25.970] } [18:41:25.970] ...future.frame <- base::sys.nframe() [18:41:25.970] ...future.conditions <- base::list() [18:41:25.970] ...future.rng <- base::globalenv()$.Random.seed [18:41:25.970] if (FALSE) { [18:41:25.970] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:25.970] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:25.970] } [18:41:25.970] ...future.result <- base::tryCatch({ [18:41:25.970] base::withCallingHandlers({ [18:41:25.970] ...future.value <- base::withVisible(base::local({ [18:41:25.970] ...future.makeSendCondition <- base::local({ [18:41:25.970] sendCondition <- NULL [18:41:25.970] function(frame = 1L) { [18:41:25.970] if (is.function(sendCondition)) [18:41:25.970] return(sendCondition) [18:41:25.970] ns <- getNamespace("parallel") [18:41:25.970] if (exists("sendData", mode = "function", [18:41:25.970] envir = ns)) { [18:41:25.970] parallel_sendData <- get("sendData", mode = "function", [18:41:25.970] envir = ns) [18:41:25.970] envir <- sys.frame(frame) [18:41:25.970] master <- NULL [18:41:25.970] while (!identical(envir, .GlobalEnv) && [18:41:25.970] !identical(envir, emptyenv())) { [18:41:25.970] if (exists("master", mode = "list", envir = envir, [18:41:25.970] inherits = FALSE)) { [18:41:25.970] master <- get("master", mode = "list", [18:41:25.970] envir = envir, inherits = FALSE) [18:41:25.970] if (inherits(master, c("SOCKnode", [18:41:25.970] "SOCK0node"))) { [18:41:25.970] sendCondition <<- function(cond) { [18:41:25.970] data <- list(type = "VALUE", value = cond, [18:41:25.970] success = TRUE) [18:41:25.970] parallel_sendData(master, data) [18:41:25.970] } [18:41:25.970] return(sendCondition) [18:41:25.970] } [18:41:25.970] } [18:41:25.970] frame <- frame + 1L [18:41:25.970] envir <- sys.frame(frame) [18:41:25.970] } [18:41:25.970] } [18:41:25.970] sendCondition <<- function(cond) NULL [18:41:25.970] } [18:41:25.970] }) [18:41:25.970] withCallingHandlers({ [18:41:25.970] { [18:41:25.970] do.call(function(...) { [18:41:25.970] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:25.970] if (!identical(...future.globals.maxSize.org, [18:41:25.970] ...future.globals.maxSize)) { [18:41:25.970] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:25.970] on.exit(options(oopts), add = TRUE) [18:41:25.970] } [18:41:25.970] { [18:41:25.970] lapply(seq_along(...future.elements_ii), [18:41:25.970] FUN = function(jj) { [18:41:25.970] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:25.970] ...future.FUN(...future.X_jj, ...) [18:41:25.970] }) [18:41:25.970] } [18:41:25.970] }, args = future.call.arguments) [18:41:25.970] } [18:41:25.970] }, immediateCondition = function(cond) { [18:41:25.970] sendCondition <- ...future.makeSendCondition() [18:41:25.970] sendCondition(cond) [18:41:25.970] muffleCondition <- function (cond, pattern = "^muffle") [18:41:25.970] { [18:41:25.970] inherits <- base::inherits [18:41:25.970] invokeRestart <- base::invokeRestart [18:41:25.970] is.null <- base::is.null [18:41:25.970] muffled <- FALSE [18:41:25.970] if (inherits(cond, "message")) { [18:41:25.970] muffled <- grepl(pattern, "muffleMessage") [18:41:25.970] if (muffled) [18:41:25.970] invokeRestart("muffleMessage") [18:41:25.970] } [18:41:25.970] else if (inherits(cond, "warning")) { [18:41:25.970] muffled <- grepl(pattern, "muffleWarning") [18:41:25.970] if (muffled) [18:41:25.970] invokeRestart("muffleWarning") [18:41:25.970] } [18:41:25.970] else if (inherits(cond, "condition")) { [18:41:25.970] if (!is.null(pattern)) { [18:41:25.970] computeRestarts <- base::computeRestarts [18:41:25.970] grepl <- base::grepl [18:41:25.970] restarts <- computeRestarts(cond) [18:41:25.970] for (restart in restarts) { [18:41:25.970] name <- restart$name [18:41:25.970] if (is.null(name)) [18:41:25.970] next [18:41:25.970] if (!grepl(pattern, name)) [18:41:25.970] next [18:41:25.970] invokeRestart(restart) [18:41:25.970] muffled <- TRUE [18:41:25.970] break [18:41:25.970] } [18:41:25.970] } [18:41:25.970] } [18:41:25.970] invisible(muffled) [18:41:25.970] } [18:41:25.970] muffleCondition(cond) [18:41:25.970] }) [18:41:25.970] })) [18:41:25.970] future::FutureResult(value = ...future.value$value, [18:41:25.970] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:25.970] ...future.rng), globalenv = if (FALSE) [18:41:25.970] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:25.970] ...future.globalenv.names)) [18:41:25.970] else NULL, started = ...future.startTime, version = "1.8") [18:41:25.970] }, condition = base::local({ [18:41:25.970] c <- base::c [18:41:25.970] inherits <- base::inherits [18:41:25.970] invokeRestart <- base::invokeRestart [18:41:25.970] length <- base::length [18:41:25.970] list <- base::list [18:41:25.970] seq.int <- base::seq.int [18:41:25.970] signalCondition <- base::signalCondition [18:41:25.970] sys.calls <- base::sys.calls [18:41:25.970] `[[` <- base::`[[` [18:41:25.970] `+` <- base::`+` [18:41:25.970] `<<-` <- base::`<<-` [18:41:25.970] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:25.970] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:25.970] 3L)] [18:41:25.970] } [18:41:25.970] function(cond) { [18:41:25.970] is_error <- inherits(cond, "error") [18:41:25.970] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:25.970] NULL) [18:41:25.970] if (is_error) { [18:41:25.970] sessionInformation <- function() { [18:41:25.970] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:25.970] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:25.970] search = base::search(), system = base::Sys.info()) [18:41:25.970] } [18:41:25.970] ...future.conditions[[length(...future.conditions) + [18:41:25.970] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:25.970] cond$call), session = sessionInformation(), [18:41:25.970] timestamp = base::Sys.time(), signaled = 0L) [18:41:25.970] signalCondition(cond) [18:41:25.970] } [18:41:25.970] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:25.970] "immediateCondition"))) { [18:41:25.970] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:25.970] ...future.conditions[[length(...future.conditions) + [18:41:25.970] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:25.970] if (TRUE && !signal) { [18:41:25.970] muffleCondition <- function (cond, pattern = "^muffle") [18:41:25.970] { [18:41:25.970] inherits <- base::inherits [18:41:25.970] invokeRestart <- base::invokeRestart [18:41:25.970] is.null <- base::is.null [18:41:25.970] muffled <- FALSE [18:41:25.970] if (inherits(cond, "message")) { [18:41:25.970] muffled <- grepl(pattern, "muffleMessage") [18:41:25.970] if (muffled) [18:41:25.970] invokeRestart("muffleMessage") [18:41:25.970] } [18:41:25.970] else if (inherits(cond, "warning")) { [18:41:25.970] muffled <- grepl(pattern, "muffleWarning") [18:41:25.970] if (muffled) [18:41:25.970] invokeRestart("muffleWarning") [18:41:25.970] } [18:41:25.970] else if (inherits(cond, "condition")) { [18:41:25.970] if (!is.null(pattern)) { [18:41:25.970] computeRestarts <- base::computeRestarts [18:41:25.970] grepl <- base::grepl [18:41:25.970] restarts <- computeRestarts(cond) [18:41:25.970] for (restart in restarts) { [18:41:25.970] name <- restart$name [18:41:25.970] if (is.null(name)) [18:41:25.970] next [18:41:25.970] if (!grepl(pattern, name)) [18:41:25.970] next [18:41:25.970] invokeRestart(restart) [18:41:25.970] muffled <- TRUE [18:41:25.970] break [18:41:25.970] } [18:41:25.970] } [18:41:25.970] } [18:41:25.970] invisible(muffled) [18:41:25.970] } [18:41:25.970] muffleCondition(cond, pattern = "^muffle") [18:41:25.970] } [18:41:25.970] } [18:41:25.970] else { [18:41:25.970] if (TRUE) { [18:41:25.970] muffleCondition <- function (cond, pattern = "^muffle") [18:41:25.970] { [18:41:25.970] inherits <- base::inherits [18:41:25.970] invokeRestart <- base::invokeRestart [18:41:25.970] is.null <- base::is.null [18:41:25.970] muffled <- FALSE [18:41:25.970] if (inherits(cond, "message")) { [18:41:25.970] muffled <- grepl(pattern, "muffleMessage") [18:41:25.970] if (muffled) [18:41:25.970] invokeRestart("muffleMessage") [18:41:25.970] } [18:41:25.970] else if (inherits(cond, "warning")) { [18:41:25.970] muffled <- grepl(pattern, "muffleWarning") [18:41:25.970] if (muffled) [18:41:25.970] invokeRestart("muffleWarning") [18:41:25.970] } [18:41:25.970] else if (inherits(cond, "condition")) { [18:41:25.970] if (!is.null(pattern)) { [18:41:25.970] computeRestarts <- base::computeRestarts [18:41:25.970] grepl <- base::grepl [18:41:25.970] restarts <- computeRestarts(cond) [18:41:25.970] for (restart in restarts) { [18:41:25.970] name <- restart$name [18:41:25.970] if (is.null(name)) [18:41:25.970] next [18:41:25.970] if (!grepl(pattern, name)) [18:41:25.970] next [18:41:25.970] invokeRestart(restart) [18:41:25.970] muffled <- TRUE [18:41:25.970] break [18:41:25.970] } [18:41:25.970] } [18:41:25.970] } [18:41:25.970] invisible(muffled) [18:41:25.970] } [18:41:25.970] muffleCondition(cond, pattern = "^muffle") [18:41:25.970] } [18:41:25.970] } [18:41:25.970] } [18:41:25.970] })) [18:41:25.970] }, error = function(ex) { [18:41:25.970] base::structure(base::list(value = NULL, visible = NULL, [18:41:25.970] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:25.970] ...future.rng), started = ...future.startTime, [18:41:25.970] finished = Sys.time(), session_uuid = NA_character_, [18:41:25.970] version = "1.8"), class = "FutureResult") [18:41:25.970] }, finally = { [18:41:25.970] if (!identical(...future.workdir, getwd())) [18:41:25.970] setwd(...future.workdir) [18:41:25.970] { [18:41:25.970] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:25.970] ...future.oldOptions$nwarnings <- NULL [18:41:25.970] } [18:41:25.970] base::options(...future.oldOptions) [18:41:25.970] if (.Platform$OS.type == "windows") { [18:41:25.970] old_names <- names(...future.oldEnvVars) [18:41:25.970] envs <- base::Sys.getenv() [18:41:25.970] names <- names(envs) [18:41:25.970] common <- intersect(names, old_names) [18:41:25.970] added <- setdiff(names, old_names) [18:41:25.970] removed <- setdiff(old_names, names) [18:41:25.970] changed <- common[...future.oldEnvVars[common] != [18:41:25.970] envs[common]] [18:41:25.970] NAMES <- toupper(changed) [18:41:25.970] args <- list() [18:41:25.970] for (kk in seq_along(NAMES)) { [18:41:25.970] name <- changed[[kk]] [18:41:25.970] NAME <- NAMES[[kk]] [18:41:25.970] if (name != NAME && is.element(NAME, old_names)) [18:41:25.970] next [18:41:25.970] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:25.970] } [18:41:25.970] NAMES <- toupper(added) [18:41:25.970] for (kk in seq_along(NAMES)) { [18:41:25.970] name <- added[[kk]] [18:41:25.970] NAME <- NAMES[[kk]] [18:41:25.970] if (name != NAME && is.element(NAME, old_names)) [18:41:25.970] next [18:41:25.970] args[[name]] <- "" [18:41:25.970] } [18:41:25.970] NAMES <- toupper(removed) [18:41:25.970] for (kk in seq_along(NAMES)) { [18:41:25.970] name <- removed[[kk]] [18:41:25.970] NAME <- NAMES[[kk]] [18:41:25.970] if (name != NAME && is.element(NAME, old_names)) [18:41:25.970] next [18:41:25.970] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:25.970] } [18:41:25.970] if (length(args) > 0) [18:41:25.970] base::do.call(base::Sys.setenv, args = args) [18:41:25.970] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:25.970] } [18:41:25.970] else { [18:41:25.970] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:25.970] } [18:41:25.970] { [18:41:25.970] if (base::length(...future.futureOptionsAdded) > [18:41:25.970] 0L) { [18:41:25.970] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:25.970] base::names(opts) <- ...future.futureOptionsAdded [18:41:25.970] base::options(opts) [18:41:25.970] } [18:41:25.970] { [18:41:25.970] { [18:41:25.970] base::options(mc.cores = ...future.mc.cores.old) [18:41:25.970] NULL [18:41:25.970] } [18:41:25.970] options(future.plan = NULL) [18:41:25.970] if (is.na(NA_character_)) [18:41:25.970] Sys.unsetenv("R_FUTURE_PLAN") [18:41:25.970] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:25.970] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:25.970] .init = FALSE) [18:41:25.970] } [18:41:25.970] } [18:41:25.970] } [18:41:25.970] }) [18:41:25.970] if (TRUE) { [18:41:25.970] base::sink(type = "output", split = FALSE) [18:41:25.970] if (TRUE) { [18:41:25.970] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:25.970] } [18:41:25.970] else { [18:41:25.970] ...future.result["stdout"] <- base::list(NULL) [18:41:25.970] } [18:41:25.970] base::close(...future.stdout) [18:41:25.970] ...future.stdout <- NULL [18:41:25.970] } [18:41:25.970] ...future.result$conditions <- ...future.conditions [18:41:25.970] ...future.result$finished <- base::Sys.time() [18:41:25.970] ...future.result [18:41:25.970] } [18:41:25.976] Exporting 5 global objects (1.20 KiB) to cluster node #1 ... [18:41:25.976] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... [18:41:25.976] Exporting '...future.FUN' (456 bytes) to cluster node #1 ... DONE [18:41:25.977] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... [18:41:25.977] Exporting 'future.call.arguments' (152 bytes) to cluster node #1 ... DONE [18:41:25.977] Exporting '...future.elements_ii' (128 bytes) to cluster node #1 ... [18:41:25.977] Exporting '...future.elements_ii' (128 bytes) to cluster node #1 ... DONE [18:41:25.978] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:25.978] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:25.978] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:25.979] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:25.979] Exporting 5 global objects (1.20 KiB) to cluster node #1 ... DONE [18:41:25.979] MultisessionFuture started [18:41:25.980] - Launch lazy future ... done [18:41:25.980] run() for 'MultisessionFuture' ... done [18:41:25.980] Created future: [18:41:25.996] receiveMessageFromWorker() for ClusterFuture ... [18:41:25.996] - Validating connection of MultisessionFuture [18:41:25.996] - received message: FutureResult [18:41:25.996] - Received FutureResult [18:41:25.997] - Erased future from FutureRegistry [18:41:25.997] result() for ClusterFuture ... [18:41:25.997] - result already collected: FutureResult [18:41:25.997] result() for ClusterFuture ... done [18:41:25.997] receiveMessageFromWorker() for ClusterFuture ... done [18:41:25.980] MultisessionFuture: [18:41:25.980] Label: 'future_lapply-2' [18:41:25.980] Expression: [18:41:25.980] { [18:41:25.980] do.call(function(...) { [18:41:25.980] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:25.980] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:25.980] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:25.980] on.exit(options(oopts), add = TRUE) [18:41:25.980] } [18:41:25.980] { [18:41:25.980] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:25.980] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:25.980] ...future.FUN(...future.X_jj, ...) [18:41:25.980] }) [18:41:25.980] } [18:41:25.980] }, args = future.call.arguments) [18:41:25.980] } [18:41:25.980] Lazy evaluation: FALSE [18:41:25.980] Asynchronous evaluation: TRUE [18:41:25.980] Local evaluation: TRUE [18:41:25.980] Environment: R_GlobalEnv [18:41:25.980] Capture standard output: TRUE [18:41:25.980] Capture condition classes: 'condition' (excluding 'nothing') [18:41:25.980] Globals: 5 objects totaling 790 bytes (function '...future.FUN' of 456 bytes, DotDotDotList 'future.call.arguments' of 152 bytes, list '...future.elements_ii' of 128 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:25.980] Packages: [18:41:25.980] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:25.980] Resolved: TRUE [18:41:25.980] Value: [18:41:25.980] Conditions captured: [18:41:25.980] Early signaling: FALSE [18:41:25.980] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:25.980] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:25.998] Chunk #2 of 2 ... DONE [18:41:25.998] Launching 2 futures (chunks) ... DONE [18:41:25.998] Resolving 2 futures (chunks) ... [18:41:25.998] resolve() on list ... [18:41:25.998] recursive: 0 [18:41:25.998] length: 2 [18:41:25.999] [18:41:25.999] Future #1 [18:41:25.999] result() for ClusterFuture ... [18:41:25.999] - result already collected: FutureResult [18:41:25.999] result() for ClusterFuture ... done [18:41:25.999] result() for ClusterFuture ... [18:41:26.000] - result already collected: FutureResult [18:41:26.000] result() for ClusterFuture ... done [18:41:26.000] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:26.000] - nx: 2 [18:41:26.000] - relay: TRUE [18:41:26.000] - stdout: TRUE [18:41:26.000] - signal: TRUE [18:41:26.001] - resignal: FALSE [18:41:26.001] - force: TRUE [18:41:26.001] - relayed: [n=2] FALSE, FALSE [18:41:26.001] - queued futures: [n=2] FALSE, FALSE [18:41:26.001] - until=1 [18:41:26.001] - relaying element #1 [18:41:26.002] result() for ClusterFuture ... [18:41:26.002] - result already collected: FutureResult [18:41:26.002] result() for ClusterFuture ... done [18:41:26.002] result() for ClusterFuture ... [18:41:26.002] - result already collected: FutureResult [18:41:26.002] result() for ClusterFuture ... done [18:41:26.003] result() for ClusterFuture ... [18:41:26.003] - result already collected: FutureResult [18:41:26.003] result() for ClusterFuture ... done [18:41:26.003] result() for ClusterFuture ... [18:41:26.003] - result already collected: FutureResult [18:41:26.003] result() for ClusterFuture ... done [18:41:26.004] - relayed: [n=2] TRUE, FALSE [18:41:26.004] - queued futures: [n=2] TRUE, FALSE [18:41:26.004] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:26.004] length: 1 (resolved future 1) [18:41:26.004] Future #2 [18:41:26.004] result() for ClusterFuture ... [18:41:26.005] - result already collected: FutureResult [18:41:26.005] result() for ClusterFuture ... done [18:41:26.005] result() for ClusterFuture ... [18:41:26.005] - result already collected: FutureResult [18:41:26.005] result() for ClusterFuture ... done [18:41:26.005] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:26.005] - nx: 2 [18:41:26.006] - relay: TRUE [18:41:26.006] - stdout: TRUE [18:41:26.006] - signal: TRUE [18:41:26.006] - resignal: FALSE [18:41:26.006] - force: TRUE [18:41:26.006] - relayed: [n=2] TRUE, FALSE [18:41:26.007] - queued futures: [n=2] TRUE, FALSE [18:41:26.007] - until=2 [18:41:26.007] - relaying element #2 [18:41:26.007] result() for ClusterFuture ... [18:41:26.007] - result already collected: FutureResult [18:41:26.007] result() for ClusterFuture ... done [18:41:26.008] result() for ClusterFuture ... [18:41:26.008] - result already collected: FutureResult [18:41:26.008] result() for ClusterFuture ... done [18:41:26.008] result() for ClusterFuture ... [18:41:26.008] - result already collected: FutureResult [18:41:26.008] result() for ClusterFuture ... done [18:41:26.009] result() for ClusterFuture ... [18:41:26.009] - result already collected: FutureResult [18:41:26.009] result() for ClusterFuture ... done [18:41:26.009] - relayed: [n=2] TRUE, TRUE [18:41:26.009] - queued futures: [n=2] TRUE, TRUE [18:41:26.009] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:26.009] length: 0 (resolved future 2) [18:41:26.010] Relaying remaining futures [18:41:26.010] signalConditionsASAP(NULL, pos=0) ... [18:41:26.010] - nx: 2 [18:41:26.010] - relay: TRUE [18:41:26.010] - stdout: TRUE [18:41:26.010] - signal: TRUE [18:41:26.010] - resignal: FALSE [18:41:26.011] - force: TRUE [18:41:26.011] - relayed: [n=2] TRUE, TRUE [18:41:26.011] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:26.011] - relayed: [n=2] TRUE, TRUE [18:41:26.011] - queued futures: [n=2] TRUE, TRUE [18:41:26.012] signalConditionsASAP(NULL, pos=0) ... done [18:41:26.012] resolve() on list ... DONE [18:41:26.012] result() for ClusterFuture ... [18:41:26.012] - result already collected: FutureResult [18:41:26.012] result() for ClusterFuture ... done [18:41:26.012] result() for ClusterFuture ... [18:41:26.012] - result already collected: FutureResult [18:41:26.013] result() for ClusterFuture ... done [18:41:26.013] result() for ClusterFuture ... [18:41:26.013] - result already collected: FutureResult [18:41:26.013] result() for ClusterFuture ... done [18:41:26.013] result() for ClusterFuture ... [18:41:26.013] - result already collected: FutureResult [18:41:26.014] result() for ClusterFuture ... done [18:41:26.014] - Number of value chunks collected: 2 [18:41:26.014] Resolving 2 futures (chunks) ... DONE [18:41:26.014] Reducing values from 2 chunks ... [18:41:26.014] - Number of values collected after concatenation: 4 [18:41:26.014] - Number of values expected: 4 [18:41:26.015] Reverse index remapping (attribute 'ordering'): [n = 4] 4, 3, 2, 1 [18:41:26.015] Reducing values from 2 chunks ... DONE [18:41:26.015] future_lapply() ... DONE List of 1 $ y:List of 4 ..$ a: int [1:2] 0 0 ..$ b: num [1:2] 0 0 ..$ c: chr [1:2] "" "" ..$ c:List of 2 .. ..$ : NULL .. ..$ : NULL - future_lapply(x, FUN = future:::hpaste, ...) ... [18:41:26.018] future_lapply() ... [18:41:26.028] Number of chunks: 1 [18:41:26.028] getGlobalsAndPackagesXApply() ... [18:41:26.029] - future.globals: TRUE [18:41:26.029] getGlobalsAndPackages() ... [18:41:26.029] Searching for globals... [18:41:26.039] - globals found: [22] 'FUN', 'if', 'missing', 'is.finite', '{', 'is.null', '<-', 'paste', 'length', '==', 'return', '>', '+', '[', 'seq_len', 'rev', 'c', '&&', '!', ':', '(', '-' [18:41:26.039] Searching for globals ... DONE [18:41:26.039] Resolving globals: FALSE [18:41:26.040] The total size of the 1 globals is 7.17 KiB (7342 bytes) [18:41:26.041] The total size of the 1 globals exported for future expression ('FUN(collapse = "; ", maxHead = 3L)') is 7.17 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (7.17 KiB of class 'function') [18:41:26.041] - globals: [1] 'FUN' [18:41:26.041] - packages: [1] 'future' [18:41:26.042] getGlobalsAndPackages() ... DONE [18:41:26.042] - globals found/used: [n=1] 'FUN' [18:41:26.042] - needed namespaces: [n=1] 'future' [18:41:26.042] Finding globals ... DONE [18:41:26.042] - use_args: TRUE [18:41:26.042] - Getting '...' globals ... [18:41:26.043] resolve() on list ... [18:41:26.043] recursive: 0 [18:41:26.043] length: 1 [18:41:26.043] elements: '...' [18:41:26.044] length: 0 (resolved future 1) [18:41:26.044] resolve() on list ... DONE [18:41:26.044] - '...' content: [n=2] 'collapse', 'maxHead' [18:41:26.044] List of 1 [18:41:26.044] $ ...:List of 2 [18:41:26.044] ..$ collapse: chr "; " [18:41:26.044] ..$ maxHead : int 3 [18:41:26.044] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:26.044] - attr(*, "where")=List of 1 [18:41:26.044] ..$ ...: [18:41:26.044] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:26.044] - attr(*, "resolved")= logi TRUE [18:41:26.044] - attr(*, "total_size")= num NA [18:41:26.048] - Getting '...' globals ... DONE [18:41:26.048] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:26.048] List of 2 [18:41:26.048] $ ...future.FUN:function (..., sep = "", collapse = ", ", lastCollapse = NULL, maxHead = if (missing(lastCollapse)) 3 else Inf, [18:41:26.048] maxTail = if (is.finite(maxHead)) 1 else Inf, abbreviate = "...") [18:41:26.048] $ ... :List of 2 [18:41:26.048] ..$ collapse: chr "; " [18:41:26.048] ..$ maxHead : int 3 [18:41:26.048] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:26.048] - attr(*, "where")=List of 2 [18:41:26.048] ..$ ...future.FUN: [18:41:26.048] ..$ ... : [18:41:26.048] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:26.048] - attr(*, "resolved")= logi FALSE [18:41:26.048] - attr(*, "total_size")= int 20741 [18:41:26.052] Packages to be attached in all futures: [n=1] 'future' [18:41:26.053] getGlobalsAndPackagesXApply() ... DONE [18:41:26.053] Number of futures (= number of chunks): 1 [18:41:26.053] Launching 1 futures (chunks) ... [18:41:26.053] Chunk #1 of 1 ... [18:41:26.053] - Finding globals in 'X' for chunk #1 ... [18:41:26.054] getGlobalsAndPackages() ... [18:41:26.054] Searching for globals... [18:41:26.054] [18:41:26.054] Searching for globals ... DONE [18:41:26.054] - globals: [0] [18:41:26.055] getGlobalsAndPackages() ... DONE [18:41:26.055] + additional globals found: [n=0] [18:41:26.055] + additional namespaces needed: [n=0] [18:41:26.055] - Finding globals in 'X' for chunk #1 ... DONE [18:41:26.055] - seeds: [18:41:26.055] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:26.056] getGlobalsAndPackages() ... [18:41:26.056] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:26.056] Resolving globals: FALSE [18:41:26.056] Tweak future expression to call with '...' arguments ... [18:41:26.056] { [18:41:26.056] do.call(function(...) { [18:41:26.056] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:26.056] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:26.056] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:26.056] on.exit(options(oopts), add = TRUE) [18:41:26.056] } [18:41:26.056] { [18:41:26.056] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:26.056] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:26.056] ...future.FUN(...future.X_jj, ...) [18:41:26.056] }) [18:41:26.056] } [18:41:26.056] }, args = future.call.arguments) [18:41:26.056] } [18:41:26.057] Tweak future expression to call with '...' arguments ... DONE [18:41:26.057] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:26.057] - packages: [1] 'future' [18:41:26.058] getGlobalsAndPackages() ... DONE [18:41:26.058] run() for 'Future' ... [18:41:26.058] - state: 'created' [18:41:26.058] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:26.074] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:26.074] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:26.074] - Field: 'node' [18:41:26.074] - Field: 'label' [18:41:26.074] - Field: 'local' [18:41:26.075] - Field: 'owner' [18:41:26.075] - Field: 'envir' [18:41:26.075] - Field: 'workers' [18:41:26.075] - Field: 'packages' [18:41:26.075] - Field: 'gc' [18:41:26.076] - Field: 'conditions' [18:41:26.076] - Field: 'persistent' [18:41:26.076] - Field: 'expr' [18:41:26.076] - Field: 'uuid' [18:41:26.076] - Field: 'seed' [18:41:26.076] - Field: 'version' [18:41:26.077] - Field: 'result' [18:41:26.077] - Field: 'asynchronous' [18:41:26.077] - Field: 'calls' [18:41:26.077] - Field: 'globals' [18:41:26.077] - Field: 'stdout' [18:41:26.077] - Field: 'earlySignal' [18:41:26.078] - Field: 'lazy' [18:41:26.078] - Field: 'state' [18:41:26.078] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:26.078] - Launch lazy future ... [18:41:26.078] Packages needed by the future expression (n = 1): 'future' [18:41:26.079] Packages needed by future strategies (n = 0): [18:41:26.079] { [18:41:26.079] { [18:41:26.079] { [18:41:26.079] ...future.startTime <- base::Sys.time() [18:41:26.079] { [18:41:26.079] { [18:41:26.079] { [18:41:26.079] { [18:41:26.079] { [18:41:26.079] base::local({ [18:41:26.079] has_future <- base::requireNamespace("future", [18:41:26.079] quietly = TRUE) [18:41:26.079] if (has_future) { [18:41:26.079] ns <- base::getNamespace("future") [18:41:26.079] version <- ns[[".package"]][["version"]] [18:41:26.079] if (is.null(version)) [18:41:26.079] version <- utils::packageVersion("future") [18:41:26.079] } [18:41:26.079] else { [18:41:26.079] version <- NULL [18:41:26.079] } [18:41:26.079] if (!has_future || version < "1.8.0") { [18:41:26.079] info <- base::c(r_version = base::gsub("R version ", [18:41:26.079] "", base::R.version$version.string), [18:41:26.079] platform = base::sprintf("%s (%s-bit)", [18:41:26.079] base::R.version$platform, 8 * [18:41:26.079] base::.Machine$sizeof.pointer), [18:41:26.079] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:26.079] "release", "version")], collapse = " "), [18:41:26.079] hostname = base::Sys.info()[["nodename"]]) [18:41:26.079] info <- base::sprintf("%s: %s", base::names(info), [18:41:26.079] info) [18:41:26.079] info <- base::paste(info, collapse = "; ") [18:41:26.079] if (!has_future) { [18:41:26.079] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:26.079] info) [18:41:26.079] } [18:41:26.079] else { [18:41:26.079] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:26.079] info, version) [18:41:26.079] } [18:41:26.079] base::stop(msg) [18:41:26.079] } [18:41:26.079] }) [18:41:26.079] } [18:41:26.079] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:26.079] base::options(mc.cores = 1L) [18:41:26.079] } [18:41:26.079] base::local({ [18:41:26.079] for (pkg in "future") { [18:41:26.079] base::loadNamespace(pkg) [18:41:26.079] base::library(pkg, character.only = TRUE) [18:41:26.079] } [18:41:26.079] }) [18:41:26.079] } [18:41:26.079] ...future.strategy.old <- future::plan("list") [18:41:26.079] options(future.plan = NULL) [18:41:26.079] Sys.unsetenv("R_FUTURE_PLAN") [18:41:26.079] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:26.079] } [18:41:26.079] ...future.workdir <- getwd() [18:41:26.079] } [18:41:26.079] ...future.oldOptions <- base::as.list(base::.Options) [18:41:26.079] ...future.oldEnvVars <- base::Sys.getenv() [18:41:26.079] } [18:41:26.079] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:26.079] future.globals.maxSize = NULL, future.globals.method = NULL, [18:41:26.079] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:26.079] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:26.079] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:26.079] future.stdout.windows.reencode = NULL, width = 80L) [18:41:26.079] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:26.079] base::names(...future.oldOptions)) [18:41:26.079] } [18:41:26.079] if (FALSE) { [18:41:26.079] } [18:41:26.079] else { [18:41:26.079] if (TRUE) { [18:41:26.079] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:26.079] open = "w") [18:41:26.079] } [18:41:26.079] else { [18:41:26.079] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:26.079] windows = "NUL", "/dev/null"), open = "w") [18:41:26.079] } [18:41:26.079] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:26.079] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:26.079] base::sink(type = "output", split = FALSE) [18:41:26.079] base::close(...future.stdout) [18:41:26.079] }, add = TRUE) [18:41:26.079] } [18:41:26.079] ...future.frame <- base::sys.nframe() [18:41:26.079] ...future.conditions <- base::list() [18:41:26.079] ...future.rng <- base::globalenv()$.Random.seed [18:41:26.079] if (FALSE) { [18:41:26.079] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:26.079] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:26.079] } [18:41:26.079] ...future.result <- base::tryCatch({ [18:41:26.079] base::withCallingHandlers({ [18:41:26.079] ...future.value <- base::withVisible(base::local({ [18:41:26.079] ...future.makeSendCondition <- base::local({ [18:41:26.079] sendCondition <- NULL [18:41:26.079] function(frame = 1L) { [18:41:26.079] if (is.function(sendCondition)) [18:41:26.079] return(sendCondition) [18:41:26.079] ns <- getNamespace("parallel") [18:41:26.079] if (exists("sendData", mode = "function", [18:41:26.079] envir = ns)) { [18:41:26.079] parallel_sendData <- get("sendData", mode = "function", [18:41:26.079] envir = ns) [18:41:26.079] envir <- sys.frame(frame) [18:41:26.079] master <- NULL [18:41:26.079] while (!identical(envir, .GlobalEnv) && [18:41:26.079] !identical(envir, emptyenv())) { [18:41:26.079] if (exists("master", mode = "list", envir = envir, [18:41:26.079] inherits = FALSE)) { [18:41:26.079] master <- get("master", mode = "list", [18:41:26.079] envir = envir, inherits = FALSE) [18:41:26.079] if (inherits(master, c("SOCKnode", [18:41:26.079] "SOCK0node"))) { [18:41:26.079] sendCondition <<- function(cond) { [18:41:26.079] data <- list(type = "VALUE", value = cond, [18:41:26.079] success = TRUE) [18:41:26.079] parallel_sendData(master, data) [18:41:26.079] } [18:41:26.079] return(sendCondition) [18:41:26.079] } [18:41:26.079] } [18:41:26.079] frame <- frame + 1L [18:41:26.079] envir <- sys.frame(frame) [18:41:26.079] } [18:41:26.079] } [18:41:26.079] sendCondition <<- function(cond) NULL [18:41:26.079] } [18:41:26.079] }) [18:41:26.079] withCallingHandlers({ [18:41:26.079] { [18:41:26.079] do.call(function(...) { [18:41:26.079] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:26.079] if (!identical(...future.globals.maxSize.org, [18:41:26.079] ...future.globals.maxSize)) { [18:41:26.079] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:26.079] on.exit(options(oopts), add = TRUE) [18:41:26.079] } [18:41:26.079] { [18:41:26.079] lapply(seq_along(...future.elements_ii), [18:41:26.079] FUN = function(jj) { [18:41:26.079] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:26.079] ...future.FUN(...future.X_jj, ...) [18:41:26.079] }) [18:41:26.079] } [18:41:26.079] }, args = future.call.arguments) [18:41:26.079] } [18:41:26.079] }, immediateCondition = function(cond) { [18:41:26.079] sendCondition <- ...future.makeSendCondition() [18:41:26.079] sendCondition(cond) [18:41:26.079] muffleCondition <- function (cond, pattern = "^muffle") [18:41:26.079] { [18:41:26.079] inherits <- base::inherits [18:41:26.079] invokeRestart <- base::invokeRestart [18:41:26.079] is.null <- base::is.null [18:41:26.079] muffled <- FALSE [18:41:26.079] if (inherits(cond, "message")) { [18:41:26.079] muffled <- grepl(pattern, "muffleMessage") [18:41:26.079] if (muffled) [18:41:26.079] invokeRestart("muffleMessage") [18:41:26.079] } [18:41:26.079] else if (inherits(cond, "warning")) { [18:41:26.079] muffled <- grepl(pattern, "muffleWarning") [18:41:26.079] if (muffled) [18:41:26.079] invokeRestart("muffleWarning") [18:41:26.079] } [18:41:26.079] else if (inherits(cond, "condition")) { [18:41:26.079] if (!is.null(pattern)) { [18:41:26.079] computeRestarts <- base::computeRestarts [18:41:26.079] grepl <- base::grepl [18:41:26.079] restarts <- computeRestarts(cond) [18:41:26.079] for (restart in restarts) { [18:41:26.079] name <- restart$name [18:41:26.079] if (is.null(name)) [18:41:26.079] next [18:41:26.079] if (!grepl(pattern, name)) [18:41:26.079] next [18:41:26.079] invokeRestart(restart) [18:41:26.079] muffled <- TRUE [18:41:26.079] break [18:41:26.079] } [18:41:26.079] } [18:41:26.079] } [18:41:26.079] invisible(muffled) [18:41:26.079] } [18:41:26.079] muffleCondition(cond) [18:41:26.079] }) [18:41:26.079] })) [18:41:26.079] future::FutureResult(value = ...future.value$value, [18:41:26.079] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:26.079] ...future.rng), globalenv = if (FALSE) [18:41:26.079] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:26.079] ...future.globalenv.names)) [18:41:26.079] else NULL, started = ...future.startTime, version = "1.8") [18:41:26.079] }, condition = base::local({ [18:41:26.079] c <- base::c [18:41:26.079] inherits <- base::inherits [18:41:26.079] invokeRestart <- base::invokeRestart [18:41:26.079] length <- base::length [18:41:26.079] list <- base::list [18:41:26.079] seq.int <- base::seq.int [18:41:26.079] signalCondition <- base::signalCondition [18:41:26.079] sys.calls <- base::sys.calls [18:41:26.079] `[[` <- base::`[[` [18:41:26.079] `+` <- base::`+` [18:41:26.079] `<<-` <- base::`<<-` [18:41:26.079] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:26.079] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:26.079] 3L)] [18:41:26.079] } [18:41:26.079] function(cond) { [18:41:26.079] is_error <- inherits(cond, "error") [18:41:26.079] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:26.079] NULL) [18:41:26.079] if (is_error) { [18:41:26.079] sessionInformation <- function() { [18:41:26.079] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:26.079] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:26.079] search = base::search(), system = base::Sys.info()) [18:41:26.079] } [18:41:26.079] ...future.conditions[[length(...future.conditions) + [18:41:26.079] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:26.079] cond$call), session = sessionInformation(), [18:41:26.079] timestamp = base::Sys.time(), signaled = 0L) [18:41:26.079] signalCondition(cond) [18:41:26.079] } [18:41:26.079] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:26.079] "immediateCondition"))) { [18:41:26.079] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:26.079] ...future.conditions[[length(...future.conditions) + [18:41:26.079] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:26.079] if (TRUE && !signal) { [18:41:26.079] muffleCondition <- function (cond, pattern = "^muffle") [18:41:26.079] { [18:41:26.079] inherits <- base::inherits [18:41:26.079] invokeRestart <- base::invokeRestart [18:41:26.079] is.null <- base::is.null [18:41:26.079] muffled <- FALSE [18:41:26.079] if (inherits(cond, "message")) { [18:41:26.079] muffled <- grepl(pattern, "muffleMessage") [18:41:26.079] if (muffled) [18:41:26.079] invokeRestart("muffleMessage") [18:41:26.079] } [18:41:26.079] else if (inherits(cond, "warning")) { [18:41:26.079] muffled <- grepl(pattern, "muffleWarning") [18:41:26.079] if (muffled) [18:41:26.079] invokeRestart("muffleWarning") [18:41:26.079] } [18:41:26.079] else if (inherits(cond, "condition")) { [18:41:26.079] if (!is.null(pattern)) { [18:41:26.079] computeRestarts <- base::computeRestarts [18:41:26.079] grepl <- base::grepl [18:41:26.079] restarts <- computeRestarts(cond) [18:41:26.079] for (restart in restarts) { [18:41:26.079] name <- restart$name [18:41:26.079] if (is.null(name)) [18:41:26.079] next [18:41:26.079] if (!grepl(pattern, name)) [18:41:26.079] next [18:41:26.079] invokeRestart(restart) [18:41:26.079] muffled <- TRUE [18:41:26.079] break [18:41:26.079] } [18:41:26.079] } [18:41:26.079] } [18:41:26.079] invisible(muffled) [18:41:26.079] } [18:41:26.079] muffleCondition(cond, pattern = "^muffle") [18:41:26.079] } [18:41:26.079] } [18:41:26.079] else { [18:41:26.079] if (TRUE) { [18:41:26.079] muffleCondition <- function (cond, pattern = "^muffle") [18:41:26.079] { [18:41:26.079] inherits <- base::inherits [18:41:26.079] invokeRestart <- base::invokeRestart [18:41:26.079] is.null <- base::is.null [18:41:26.079] muffled <- FALSE [18:41:26.079] if (inherits(cond, "message")) { [18:41:26.079] muffled <- grepl(pattern, "muffleMessage") [18:41:26.079] if (muffled) [18:41:26.079] invokeRestart("muffleMessage") [18:41:26.079] } [18:41:26.079] else if (inherits(cond, "warning")) { [18:41:26.079] muffled <- grepl(pattern, "muffleWarning") [18:41:26.079] if (muffled) [18:41:26.079] invokeRestart("muffleWarning") [18:41:26.079] } [18:41:26.079] else if (inherits(cond, "condition")) { [18:41:26.079] if (!is.null(pattern)) { [18:41:26.079] computeRestarts <- base::computeRestarts [18:41:26.079] grepl <- base::grepl [18:41:26.079] restarts <- computeRestarts(cond) [18:41:26.079] for (restart in restarts) { [18:41:26.079] name <- restart$name [18:41:26.079] if (is.null(name)) [18:41:26.079] next [18:41:26.079] if (!grepl(pattern, name)) [18:41:26.079] next [18:41:26.079] invokeRestart(restart) [18:41:26.079] muffled <- TRUE [18:41:26.079] break [18:41:26.079] } [18:41:26.079] } [18:41:26.079] } [18:41:26.079] invisible(muffled) [18:41:26.079] } [18:41:26.079] muffleCondition(cond, pattern = "^muffle") [18:41:26.079] } [18:41:26.079] } [18:41:26.079] } [18:41:26.079] })) [18:41:26.079] }, error = function(ex) { [18:41:26.079] base::structure(base::list(value = NULL, visible = NULL, [18:41:26.079] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:26.079] ...future.rng), started = ...future.startTime, [18:41:26.079] finished = Sys.time(), session_uuid = NA_character_, [18:41:26.079] version = "1.8"), class = "FutureResult") [18:41:26.079] }, finally = { [18:41:26.079] if (!identical(...future.workdir, getwd())) [18:41:26.079] setwd(...future.workdir) [18:41:26.079] { [18:41:26.079] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:26.079] ...future.oldOptions$nwarnings <- NULL [18:41:26.079] } [18:41:26.079] base::options(...future.oldOptions) [18:41:26.079] if (.Platform$OS.type == "windows") { [18:41:26.079] old_names <- names(...future.oldEnvVars) [18:41:26.079] envs <- base::Sys.getenv() [18:41:26.079] names <- names(envs) [18:41:26.079] common <- intersect(names, old_names) [18:41:26.079] added <- setdiff(names, old_names) [18:41:26.079] removed <- setdiff(old_names, names) [18:41:26.079] changed <- common[...future.oldEnvVars[common] != [18:41:26.079] envs[common]] [18:41:26.079] NAMES <- toupper(changed) [18:41:26.079] args <- list() [18:41:26.079] for (kk in seq_along(NAMES)) { [18:41:26.079] name <- changed[[kk]] [18:41:26.079] NAME <- NAMES[[kk]] [18:41:26.079] if (name != NAME && is.element(NAME, old_names)) [18:41:26.079] next [18:41:26.079] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:26.079] } [18:41:26.079] NAMES <- toupper(added) [18:41:26.079] for (kk in seq_along(NAMES)) { [18:41:26.079] name <- added[[kk]] [18:41:26.079] NAME <- NAMES[[kk]] [18:41:26.079] if (name != NAME && is.element(NAME, old_names)) [18:41:26.079] next [18:41:26.079] args[[name]] <- "" [18:41:26.079] } [18:41:26.079] NAMES <- toupper(removed) [18:41:26.079] for (kk in seq_along(NAMES)) { [18:41:26.079] name <- removed[[kk]] [18:41:26.079] NAME <- NAMES[[kk]] [18:41:26.079] if (name != NAME && is.element(NAME, old_names)) [18:41:26.079] next [18:41:26.079] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:26.079] } [18:41:26.079] if (length(args) > 0) [18:41:26.079] base::do.call(base::Sys.setenv, args = args) [18:41:26.079] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:26.079] } [18:41:26.079] else { [18:41:26.079] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:26.079] } [18:41:26.079] { [18:41:26.079] if (base::length(...future.futureOptionsAdded) > [18:41:26.079] 0L) { [18:41:26.079] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:26.079] base::names(opts) <- ...future.futureOptionsAdded [18:41:26.079] base::options(opts) [18:41:26.079] } [18:41:26.079] { [18:41:26.079] { [18:41:26.079] base::options(mc.cores = ...future.mc.cores.old) [18:41:26.079] NULL [18:41:26.079] } [18:41:26.079] options(future.plan = NULL) [18:41:26.079] if (is.na(NA_character_)) [18:41:26.079] Sys.unsetenv("R_FUTURE_PLAN") [18:41:26.079] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:26.079] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:26.079] .init = FALSE) [18:41:26.079] } [18:41:26.079] } [18:41:26.079] } [18:41:26.079] }) [18:41:26.079] if (TRUE) { [18:41:26.079] base::sink(type = "output", split = FALSE) [18:41:26.079] if (TRUE) { [18:41:26.079] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:26.079] } [18:41:26.079] else { [18:41:26.079] ...future.result["stdout"] <- base::list(NULL) [18:41:26.079] } [18:41:26.079] base::close(...future.stdout) [18:41:26.079] ...future.stdout <- NULL [18:41:26.079] } [18:41:26.079] ...future.result$conditions <- ...future.conditions [18:41:26.079] ...future.result$finished <- base::Sys.time() [18:41:26.079] ...future.result [18:41:26.079] } [18:41:26.085] Exporting 5 global objects (9.99 KiB) to cluster node #1 ... [18:41:26.085] Exporting '...future.FUN' (7.17 KiB) to cluster node #1 ... [18:41:26.089] Exporting '...future.FUN' (7.17 KiB) to cluster node #1 ... DONE [18:41:26.089] Exporting 'future.call.arguments' (187 bytes) to cluster node #1 ... [18:41:26.089] Exporting 'future.call.arguments' (187 bytes) to cluster node #1 ... DONE [18:41:26.089] Exporting '...future.elements_ii' (2.15 KiB) to cluster node #1 ... [18:41:26.090] Exporting '...future.elements_ii' (2.15 KiB) to cluster node #1 ... DONE [18:41:26.090] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:26.091] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:26.091] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:26.091] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:26.091] Exporting 5 global objects (9.99 KiB) to cluster node #1 ... DONE [18:41:26.092] MultisessionFuture started [18:41:26.092] - Launch lazy future ... done [18:41:26.092] run() for 'MultisessionFuture' ... done [18:41:26.092] Created future: [18:41:26.109] receiveMessageFromWorker() for ClusterFuture ... [18:41:26.109] - Validating connection of MultisessionFuture [18:41:26.110] - received message: FutureResult [18:41:26.110] - Received FutureResult [18:41:26.110] - Erased future from FutureRegistry [18:41:26.110] result() for ClusterFuture ... [18:41:26.110] - result already collected: FutureResult [18:41:26.111] result() for ClusterFuture ... done [18:41:26.111] receiveMessageFromWorker() for ClusterFuture ... done [18:41:26.093] MultisessionFuture: [18:41:26.093] Label: 'future_lapply-1' [18:41:26.093] Expression: [18:41:26.093] { [18:41:26.093] do.call(function(...) { [18:41:26.093] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:26.093] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:26.093] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:26.093] on.exit(options(oopts), add = TRUE) [18:41:26.093] } [18:41:26.093] { [18:41:26.093] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:26.093] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:26.093] ...future.FUN(...future.X_jj, ...) [18:41:26.093] }) [18:41:26.093] } [18:41:26.093] }, args = future.call.arguments) [18:41:26.093] } [18:41:26.093] Lazy evaluation: FALSE [18:41:26.093] Asynchronous evaluation: TRUE [18:41:26.093] Local evaluation: TRUE [18:41:26.093] Environment: R_GlobalEnv [18:41:26.093] Capture standard output: TRUE [18:41:26.093] Capture condition classes: 'condition' (excluding 'nothing') [18:41:26.093] Globals: 5 objects totaling 9.56 KiB (function '...future.FUN' of 7.17 KiB, DotDotDotList 'future.call.arguments' of 187 bytes, list '...future.elements_ii' of 2.15 KiB, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:26.093] Packages: 1 packages ('future') [18:41:26.093] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:26.093] Resolved: TRUE [18:41:26.093] Value: [18:41:26.093] Conditions captured: [18:41:26.093] Early signaling: FALSE [18:41:26.093] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:26.093] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:26.111] Chunk #1 of 1 ... DONE [18:41:26.111] Launching 1 futures (chunks) ... DONE [18:41:26.111] Resolving 1 futures (chunks) ... [18:41:26.112] resolve() on list ... [18:41:26.112] recursive: 0 [18:41:26.112] length: 1 [18:41:26.112] [18:41:26.112] Future #1 [18:41:26.112] result() for ClusterFuture ... [18:41:26.113] - result already collected: FutureResult [18:41:26.113] result() for ClusterFuture ... done [18:41:26.113] result() for ClusterFuture ... [18:41:26.113] - result already collected: FutureResult [18:41:26.113] result() for ClusterFuture ... done [18:41:26.113] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:26.114] - nx: 1 [18:41:26.114] - relay: TRUE [18:41:26.114] - stdout: TRUE [18:41:26.114] - signal: TRUE [18:41:26.114] - resignal: FALSE [18:41:26.114] - force: TRUE [18:41:26.114] - relayed: [n=1] FALSE [18:41:26.115] - queued futures: [n=1] FALSE [18:41:26.115] - until=1 [18:41:26.115] - relaying element #1 [18:41:26.115] result() for ClusterFuture ... [18:41:26.115] - result already collected: FutureResult [18:41:26.115] result() for ClusterFuture ... done [18:41:26.116] result() for ClusterFuture ... [18:41:26.116] - result already collected: FutureResult [18:41:26.116] result() for ClusterFuture ... done [18:41:26.116] result() for ClusterFuture ... [18:41:26.116] - result already collected: FutureResult [18:41:26.116] result() for ClusterFuture ... done [18:41:26.117] result() for ClusterFuture ... [18:41:26.117] - result already collected: FutureResult [18:41:26.117] result() for ClusterFuture ... done [18:41:26.117] - relayed: [n=1] TRUE [18:41:26.117] - queued futures: [n=1] TRUE [18:41:26.117] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:26.117] length: 0 (resolved future 1) [18:41:26.118] Relaying remaining futures [18:41:26.118] signalConditionsASAP(NULL, pos=0) ... [18:41:26.118] - nx: 1 [18:41:26.118] - relay: TRUE [18:41:26.118] - stdout: TRUE [18:41:26.118] - signal: TRUE [18:41:26.119] - resignal: FALSE [18:41:26.119] - force: TRUE [18:41:26.119] - relayed: [n=1] TRUE [18:41:26.119] - queued futures: [n=1] TRUE - flush all [18:41:26.119] - relayed: [n=1] TRUE [18:41:26.119] - queued futures: [n=1] TRUE [18:41:26.120] signalConditionsASAP(NULL, pos=0) ... done [18:41:26.120] resolve() on list ... DONE [18:41:26.120] result() for ClusterFuture ... [18:41:26.120] - result already collected: FutureResult [18:41:26.120] result() for ClusterFuture ... done [18:41:26.120] result() for ClusterFuture ... [18:41:26.120] - result already collected: FutureResult [18:41:26.121] result() for ClusterFuture ... done [18:41:26.121] - Number of value chunks collected: 1 [18:41:26.121] Resolving 1 futures (chunks) ... DONE [18:41:26.121] Reducing values from 1 chunks ... [18:41:26.121] - Number of values collected after concatenation: 1 [18:41:26.121] - Number of values expected: 1 [18:41:26.122] Reducing values from 1 chunks ... DONE [18:41:26.122] future_lapply() ... DONE List of 1 $ y:List of 1 ..$ a: chr "hello; 1; 2; ...; 100" - future_lapply(x, FUN = listenv::listenv, ...) ... [18:41:26.123] future_lapply() ... [18:41:26.126] Number of chunks: 2 [18:41:26.126] Index remapping (attribute 'ordering'): [n = 2] 2, 1 [18:41:26.126] getGlobalsAndPackagesXApply() ... [18:41:26.126] - future.globals: TRUE [18:41:26.127] getGlobalsAndPackages() ... [18:41:26.127] Searching for globals... [18:41:26.128] - globals found: [4] 'FUN', '{', 'get', 'parent.env' [18:41:26.128] Searching for globals ... DONE [18:41:26.129] Resolving globals: FALSE [18:41:26.129] The total size of the 1 globals is 911 bytes (911 bytes) [18:41:26.130] The total size of the 1 globals exported for future expression ('FUN()') is 911 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (911 bytes of class 'function') [18:41:26.130] - globals: [1] 'FUN' [18:41:26.130] - packages: [1] 'listenv' [18:41:26.130] getGlobalsAndPackages() ... DONE [18:41:26.130] - globals found/used: [n=1] 'FUN' [18:41:26.131] - needed namespaces: [n=1] 'listenv' [18:41:26.131] Finding globals ... DONE [18:41:26.131] - use_args: TRUE [18:41:26.131] - Getting '...' globals ... [18:41:26.132] resolve() on list ... [18:41:26.132] recursive: 0 [18:41:26.132] length: 1 [18:41:26.132] elements: '...' [18:41:26.132] length: 0 (resolved future 1) [18:41:26.132] resolve() on list ... DONE [18:41:26.133] - '...' content: [n=0] [18:41:26.133] List of 1 [18:41:26.133] $ ...: list() [18:41:26.133] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:26.133] - attr(*, "where")=List of 1 [18:41:26.133] ..$ ...: [18:41:26.133] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:26.133] - attr(*, "resolved")= logi TRUE [18:41:26.133] - attr(*, "total_size")= num NA [18:41:26.136] - Getting '...' globals ... DONE [18:41:26.136] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:26.136] List of 2 [18:41:26.136] $ ...future.FUN:function (x, ...) [18:41:26.136] $ ... : list() [18:41:26.136] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:26.136] - attr(*, "where")=List of 2 [18:41:26.136] ..$ ...future.FUN: [18:41:26.136] ..$ ... : [18:41:26.136] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:26.136] - attr(*, "resolved")= logi FALSE [18:41:26.136] - attr(*, "total_size")= int 8620 [18:41:26.140] Packages to be attached in all futures: [n=1] 'listenv' [18:41:26.140] getGlobalsAndPackagesXApply() ... DONE [18:41:26.140] Number of futures (= number of chunks): 2 [18:41:26.140] Launching 2 futures (chunks) ... [18:41:26.140] Chunk #1 of 2 ... [18:41:26.141] - Finding globals in 'X' for chunk #1 ... [18:41:26.141] getGlobalsAndPackages() ... [18:41:26.141] Searching for globals... [18:41:26.141] [18:41:26.142] Searching for globals ... DONE [18:41:26.142] - globals: [0] [18:41:26.142] getGlobalsAndPackages() ... DONE [18:41:26.142] + additional globals found: [n=0] [18:41:26.142] + additional namespaces needed: [n=0] [18:41:26.142] - Finding globals in 'X' for chunk #1 ... DONE [18:41:26.143] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:26.143] - seeds: [18:41:26.143] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:26.143] getGlobalsAndPackages() ... [18:41:26.143] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:26.144] Resolving globals: FALSE [18:41:26.144] Tweak future expression to call with '...' arguments ... [18:41:26.144] { [18:41:26.144] do.call(function(...) { [18:41:26.144] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:26.144] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:26.144] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:26.144] on.exit(options(oopts), add = TRUE) [18:41:26.144] } [18:41:26.144] { [18:41:26.144] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:26.144] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:26.144] ...future.FUN(...future.X_jj, ...) [18:41:26.144] }) [18:41:26.144] } [18:41:26.144] }, args = future.call.arguments) [18:41:26.144] } [18:41:26.144] Tweak future expression to call with '...' arguments ... DONE [18:41:26.145] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:26.145] - packages: [1] 'listenv' [18:41:26.145] getGlobalsAndPackages() ... DONE [18:41:26.146] run() for 'Future' ... [18:41:26.146] - state: 'created' [18:41:26.146] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:26.162] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:26.163] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:26.163] - Field: 'node' [18:41:26.163] - Field: 'label' [18:41:26.163] - Field: 'local' [18:41:26.163] - Field: 'owner' [18:41:26.163] - Field: 'envir' [18:41:26.164] - Field: 'workers' [18:41:26.164] - Field: 'packages' [18:41:26.164] - Field: 'gc' [18:41:26.164] - Field: 'conditions' [18:41:26.164] - Field: 'persistent' [18:41:26.165] - Field: 'expr' [18:41:26.165] - Field: 'uuid' [18:41:26.165] - Field: 'seed' [18:41:26.165] - Field: 'version' [18:41:26.165] - Field: 'result' [18:41:26.165] - Field: 'asynchronous' [18:41:26.166] - Field: 'calls' [18:41:26.166] - Field: 'globals' [18:41:26.166] - Field: 'stdout' [18:41:26.166] - Field: 'earlySignal' [18:41:26.166] - Field: 'lazy' [18:41:26.166] - Field: 'state' [18:41:26.167] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:26.167] - Launch lazy future ... [18:41:26.167] Packages needed by the future expression (n = 1): 'listenv' [18:41:26.167] Packages needed by future strategies (n = 0): [18:41:26.168] { [18:41:26.168] { [18:41:26.168] { [18:41:26.168] ...future.startTime <- base::Sys.time() [18:41:26.168] { [18:41:26.168] { [18:41:26.168] { [18:41:26.168] { [18:41:26.168] { [18:41:26.168] base::local({ [18:41:26.168] has_future <- base::requireNamespace("future", [18:41:26.168] quietly = TRUE) [18:41:26.168] if (has_future) { [18:41:26.168] ns <- base::getNamespace("future") [18:41:26.168] version <- ns[[".package"]][["version"]] [18:41:26.168] if (is.null(version)) [18:41:26.168] version <- utils::packageVersion("future") [18:41:26.168] } [18:41:26.168] else { [18:41:26.168] version <- NULL [18:41:26.168] } [18:41:26.168] if (!has_future || version < "1.8.0") { [18:41:26.168] info <- base::c(r_version = base::gsub("R version ", [18:41:26.168] "", base::R.version$version.string), [18:41:26.168] platform = base::sprintf("%s (%s-bit)", [18:41:26.168] base::R.version$platform, 8 * [18:41:26.168] base::.Machine$sizeof.pointer), [18:41:26.168] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:26.168] "release", "version")], collapse = " "), [18:41:26.168] hostname = base::Sys.info()[["nodename"]]) [18:41:26.168] info <- base::sprintf("%s: %s", base::names(info), [18:41:26.168] info) [18:41:26.168] info <- base::paste(info, collapse = "; ") [18:41:26.168] if (!has_future) { [18:41:26.168] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:26.168] info) [18:41:26.168] } [18:41:26.168] else { [18:41:26.168] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:26.168] info, version) [18:41:26.168] } [18:41:26.168] base::stop(msg) [18:41:26.168] } [18:41:26.168] }) [18:41:26.168] } [18:41:26.168] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:26.168] base::options(mc.cores = 1L) [18:41:26.168] } [18:41:26.168] base::local({ [18:41:26.168] for (pkg in "listenv") { [18:41:26.168] base::loadNamespace(pkg) [18:41:26.168] base::library(pkg, character.only = TRUE) [18:41:26.168] } [18:41:26.168] }) [18:41:26.168] } [18:41:26.168] ...future.strategy.old <- future::plan("list") [18:41:26.168] options(future.plan = NULL) [18:41:26.168] Sys.unsetenv("R_FUTURE_PLAN") [18:41:26.168] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:26.168] } [18:41:26.168] ...future.workdir <- getwd() [18:41:26.168] } [18:41:26.168] ...future.oldOptions <- base::as.list(base::.Options) [18:41:26.168] ...future.oldEnvVars <- base::Sys.getenv() [18:41:26.168] } [18:41:26.168] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:26.168] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:26.168] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:26.168] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:26.168] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:26.168] future.stdout.windows.reencode = NULL, width = 80L) [18:41:26.168] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:26.168] base::names(...future.oldOptions)) [18:41:26.168] } [18:41:26.168] if (FALSE) { [18:41:26.168] } [18:41:26.168] else { [18:41:26.168] if (TRUE) { [18:41:26.168] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:26.168] open = "w") [18:41:26.168] } [18:41:26.168] else { [18:41:26.168] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:26.168] windows = "NUL", "/dev/null"), open = "w") [18:41:26.168] } [18:41:26.168] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:26.168] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:26.168] base::sink(type = "output", split = FALSE) [18:41:26.168] base::close(...future.stdout) [18:41:26.168] }, add = TRUE) [18:41:26.168] } [18:41:26.168] ...future.frame <- base::sys.nframe() [18:41:26.168] ...future.conditions <- base::list() [18:41:26.168] ...future.rng <- base::globalenv()$.Random.seed [18:41:26.168] if (FALSE) { [18:41:26.168] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:26.168] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:26.168] } [18:41:26.168] ...future.result <- base::tryCatch({ [18:41:26.168] base::withCallingHandlers({ [18:41:26.168] ...future.value <- base::withVisible(base::local({ [18:41:26.168] ...future.makeSendCondition <- base::local({ [18:41:26.168] sendCondition <- NULL [18:41:26.168] function(frame = 1L) { [18:41:26.168] if (is.function(sendCondition)) [18:41:26.168] return(sendCondition) [18:41:26.168] ns <- getNamespace("parallel") [18:41:26.168] if (exists("sendData", mode = "function", [18:41:26.168] envir = ns)) { [18:41:26.168] parallel_sendData <- get("sendData", mode = "function", [18:41:26.168] envir = ns) [18:41:26.168] envir <- sys.frame(frame) [18:41:26.168] master <- NULL [18:41:26.168] while (!identical(envir, .GlobalEnv) && [18:41:26.168] !identical(envir, emptyenv())) { [18:41:26.168] if (exists("master", mode = "list", envir = envir, [18:41:26.168] inherits = FALSE)) { [18:41:26.168] master <- get("master", mode = "list", [18:41:26.168] envir = envir, inherits = FALSE) [18:41:26.168] if (inherits(master, c("SOCKnode", [18:41:26.168] "SOCK0node"))) { [18:41:26.168] sendCondition <<- function(cond) { [18:41:26.168] data <- list(type = "VALUE", value = cond, [18:41:26.168] success = TRUE) [18:41:26.168] parallel_sendData(master, data) [18:41:26.168] } [18:41:26.168] return(sendCondition) [18:41:26.168] } [18:41:26.168] } [18:41:26.168] frame <- frame + 1L [18:41:26.168] envir <- sys.frame(frame) [18:41:26.168] } [18:41:26.168] } [18:41:26.168] sendCondition <<- function(cond) NULL [18:41:26.168] } [18:41:26.168] }) [18:41:26.168] withCallingHandlers({ [18:41:26.168] { [18:41:26.168] do.call(function(...) { [18:41:26.168] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:26.168] if (!identical(...future.globals.maxSize.org, [18:41:26.168] ...future.globals.maxSize)) { [18:41:26.168] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:26.168] on.exit(options(oopts), add = TRUE) [18:41:26.168] } [18:41:26.168] { [18:41:26.168] lapply(seq_along(...future.elements_ii), [18:41:26.168] FUN = function(jj) { [18:41:26.168] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:26.168] ...future.FUN(...future.X_jj, ...) [18:41:26.168] }) [18:41:26.168] } [18:41:26.168] }, args = future.call.arguments) [18:41:26.168] } [18:41:26.168] }, immediateCondition = function(cond) { [18:41:26.168] sendCondition <- ...future.makeSendCondition() [18:41:26.168] sendCondition(cond) [18:41:26.168] muffleCondition <- function (cond, pattern = "^muffle") [18:41:26.168] { [18:41:26.168] inherits <- base::inherits [18:41:26.168] invokeRestart <- base::invokeRestart [18:41:26.168] is.null <- base::is.null [18:41:26.168] muffled <- FALSE [18:41:26.168] if (inherits(cond, "message")) { [18:41:26.168] muffled <- grepl(pattern, "muffleMessage") [18:41:26.168] if (muffled) [18:41:26.168] invokeRestart("muffleMessage") [18:41:26.168] } [18:41:26.168] else if (inherits(cond, "warning")) { [18:41:26.168] muffled <- grepl(pattern, "muffleWarning") [18:41:26.168] if (muffled) [18:41:26.168] invokeRestart("muffleWarning") [18:41:26.168] } [18:41:26.168] else if (inherits(cond, "condition")) { [18:41:26.168] if (!is.null(pattern)) { [18:41:26.168] computeRestarts <- base::computeRestarts [18:41:26.168] grepl <- base::grepl [18:41:26.168] restarts <- computeRestarts(cond) [18:41:26.168] for (restart in restarts) { [18:41:26.168] name <- restart$name [18:41:26.168] if (is.null(name)) [18:41:26.168] next [18:41:26.168] if (!grepl(pattern, name)) [18:41:26.168] next [18:41:26.168] invokeRestart(restart) [18:41:26.168] muffled <- TRUE [18:41:26.168] break [18:41:26.168] } [18:41:26.168] } [18:41:26.168] } [18:41:26.168] invisible(muffled) [18:41:26.168] } [18:41:26.168] muffleCondition(cond) [18:41:26.168] }) [18:41:26.168] })) [18:41:26.168] future::FutureResult(value = ...future.value$value, [18:41:26.168] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:26.168] ...future.rng), globalenv = if (FALSE) [18:41:26.168] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:26.168] ...future.globalenv.names)) [18:41:26.168] else NULL, started = ...future.startTime, version = "1.8") [18:41:26.168] }, condition = base::local({ [18:41:26.168] c <- base::c [18:41:26.168] inherits <- base::inherits [18:41:26.168] invokeRestart <- base::invokeRestart [18:41:26.168] length <- base::length [18:41:26.168] list <- base::list [18:41:26.168] seq.int <- base::seq.int [18:41:26.168] signalCondition <- base::signalCondition [18:41:26.168] sys.calls <- base::sys.calls [18:41:26.168] `[[` <- base::`[[` [18:41:26.168] `+` <- base::`+` [18:41:26.168] `<<-` <- base::`<<-` [18:41:26.168] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:26.168] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:26.168] 3L)] [18:41:26.168] } [18:41:26.168] function(cond) { [18:41:26.168] is_error <- inherits(cond, "error") [18:41:26.168] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:26.168] NULL) [18:41:26.168] if (is_error) { [18:41:26.168] sessionInformation <- function() { [18:41:26.168] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:26.168] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:26.168] search = base::search(), system = base::Sys.info()) [18:41:26.168] } [18:41:26.168] ...future.conditions[[length(...future.conditions) + [18:41:26.168] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:26.168] cond$call), session = sessionInformation(), [18:41:26.168] timestamp = base::Sys.time(), signaled = 0L) [18:41:26.168] signalCondition(cond) [18:41:26.168] } [18:41:26.168] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:26.168] "immediateCondition"))) { [18:41:26.168] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:26.168] ...future.conditions[[length(...future.conditions) + [18:41:26.168] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:26.168] if (TRUE && !signal) { [18:41:26.168] muffleCondition <- function (cond, pattern = "^muffle") [18:41:26.168] { [18:41:26.168] inherits <- base::inherits [18:41:26.168] invokeRestart <- base::invokeRestart [18:41:26.168] is.null <- base::is.null [18:41:26.168] muffled <- FALSE [18:41:26.168] if (inherits(cond, "message")) { [18:41:26.168] muffled <- grepl(pattern, "muffleMessage") [18:41:26.168] if (muffled) [18:41:26.168] invokeRestart("muffleMessage") [18:41:26.168] } [18:41:26.168] else if (inherits(cond, "warning")) { [18:41:26.168] muffled <- grepl(pattern, "muffleWarning") [18:41:26.168] if (muffled) [18:41:26.168] invokeRestart("muffleWarning") [18:41:26.168] } [18:41:26.168] else if (inherits(cond, "condition")) { [18:41:26.168] if (!is.null(pattern)) { [18:41:26.168] computeRestarts <- base::computeRestarts [18:41:26.168] grepl <- base::grepl [18:41:26.168] restarts <- computeRestarts(cond) [18:41:26.168] for (restart in restarts) { [18:41:26.168] name <- restart$name [18:41:26.168] if (is.null(name)) [18:41:26.168] next [18:41:26.168] if (!grepl(pattern, name)) [18:41:26.168] next [18:41:26.168] invokeRestart(restart) [18:41:26.168] muffled <- TRUE [18:41:26.168] break [18:41:26.168] } [18:41:26.168] } [18:41:26.168] } [18:41:26.168] invisible(muffled) [18:41:26.168] } [18:41:26.168] muffleCondition(cond, pattern = "^muffle") [18:41:26.168] } [18:41:26.168] } [18:41:26.168] else { [18:41:26.168] if (TRUE) { [18:41:26.168] muffleCondition <- function (cond, pattern = "^muffle") [18:41:26.168] { [18:41:26.168] inherits <- base::inherits [18:41:26.168] invokeRestart <- base::invokeRestart [18:41:26.168] is.null <- base::is.null [18:41:26.168] muffled <- FALSE [18:41:26.168] if (inherits(cond, "message")) { [18:41:26.168] muffled <- grepl(pattern, "muffleMessage") [18:41:26.168] if (muffled) [18:41:26.168] invokeRestart("muffleMessage") [18:41:26.168] } [18:41:26.168] else if (inherits(cond, "warning")) { [18:41:26.168] muffled <- grepl(pattern, "muffleWarning") [18:41:26.168] if (muffled) [18:41:26.168] invokeRestart("muffleWarning") [18:41:26.168] } [18:41:26.168] else if (inherits(cond, "condition")) { [18:41:26.168] if (!is.null(pattern)) { [18:41:26.168] computeRestarts <- base::computeRestarts [18:41:26.168] grepl <- base::grepl [18:41:26.168] restarts <- computeRestarts(cond) [18:41:26.168] for (restart in restarts) { [18:41:26.168] name <- restart$name [18:41:26.168] if (is.null(name)) [18:41:26.168] next [18:41:26.168] if (!grepl(pattern, name)) [18:41:26.168] next [18:41:26.168] invokeRestart(restart) [18:41:26.168] muffled <- TRUE [18:41:26.168] break [18:41:26.168] } [18:41:26.168] } [18:41:26.168] } [18:41:26.168] invisible(muffled) [18:41:26.168] } [18:41:26.168] muffleCondition(cond, pattern = "^muffle") [18:41:26.168] } [18:41:26.168] } [18:41:26.168] } [18:41:26.168] })) [18:41:26.168] }, error = function(ex) { [18:41:26.168] base::structure(base::list(value = NULL, visible = NULL, [18:41:26.168] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:26.168] ...future.rng), started = ...future.startTime, [18:41:26.168] finished = Sys.time(), session_uuid = NA_character_, [18:41:26.168] version = "1.8"), class = "FutureResult") [18:41:26.168] }, finally = { [18:41:26.168] if (!identical(...future.workdir, getwd())) [18:41:26.168] setwd(...future.workdir) [18:41:26.168] { [18:41:26.168] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:26.168] ...future.oldOptions$nwarnings <- NULL [18:41:26.168] } [18:41:26.168] base::options(...future.oldOptions) [18:41:26.168] if (.Platform$OS.type == "windows") { [18:41:26.168] old_names <- names(...future.oldEnvVars) [18:41:26.168] envs <- base::Sys.getenv() [18:41:26.168] names <- names(envs) [18:41:26.168] common <- intersect(names, old_names) [18:41:26.168] added <- setdiff(names, old_names) [18:41:26.168] removed <- setdiff(old_names, names) [18:41:26.168] changed <- common[...future.oldEnvVars[common] != [18:41:26.168] envs[common]] [18:41:26.168] NAMES <- toupper(changed) [18:41:26.168] args <- list() [18:41:26.168] for (kk in seq_along(NAMES)) { [18:41:26.168] name <- changed[[kk]] [18:41:26.168] NAME <- NAMES[[kk]] [18:41:26.168] if (name != NAME && is.element(NAME, old_names)) [18:41:26.168] next [18:41:26.168] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:26.168] } [18:41:26.168] NAMES <- toupper(added) [18:41:26.168] for (kk in seq_along(NAMES)) { [18:41:26.168] name <- added[[kk]] [18:41:26.168] NAME <- NAMES[[kk]] [18:41:26.168] if (name != NAME && is.element(NAME, old_names)) [18:41:26.168] next [18:41:26.168] args[[name]] <- "" [18:41:26.168] } [18:41:26.168] NAMES <- toupper(removed) [18:41:26.168] for (kk in seq_along(NAMES)) { [18:41:26.168] name <- removed[[kk]] [18:41:26.168] NAME <- NAMES[[kk]] [18:41:26.168] if (name != NAME && is.element(NAME, old_names)) [18:41:26.168] next [18:41:26.168] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:26.168] } [18:41:26.168] if (length(args) > 0) [18:41:26.168] base::do.call(base::Sys.setenv, args = args) [18:41:26.168] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:26.168] } [18:41:26.168] else { [18:41:26.168] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:26.168] } [18:41:26.168] { [18:41:26.168] if (base::length(...future.futureOptionsAdded) > [18:41:26.168] 0L) { [18:41:26.168] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:26.168] base::names(opts) <- ...future.futureOptionsAdded [18:41:26.168] base::options(opts) [18:41:26.168] } [18:41:26.168] { [18:41:26.168] { [18:41:26.168] base::options(mc.cores = ...future.mc.cores.old) [18:41:26.168] NULL [18:41:26.168] } [18:41:26.168] options(future.plan = NULL) [18:41:26.168] if (is.na(NA_character_)) [18:41:26.168] Sys.unsetenv("R_FUTURE_PLAN") [18:41:26.168] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:26.168] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:26.168] .init = FALSE) [18:41:26.168] } [18:41:26.168] } [18:41:26.168] } [18:41:26.168] }) [18:41:26.168] if (TRUE) { [18:41:26.168] base::sink(type = "output", split = FALSE) [18:41:26.168] if (TRUE) { [18:41:26.168] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:26.168] } [18:41:26.168] else { [18:41:26.168] ...future.result["stdout"] <- base::list(NULL) [18:41:26.168] } [18:41:26.168] base::close(...future.stdout) [18:41:26.168] ...future.stdout <- NULL [18:41:26.168] } [18:41:26.168] ...future.result$conditions <- ...future.conditions [18:41:26.168] ...future.result$finished <- base::Sys.time() [18:41:26.168] ...future.result [18:41:26.168] } [18:41:26.173] Exporting 5 global objects (4.14 KiB) to cluster node #1 ... [18:41:26.174] Exporting '...future.FUN' (911 bytes) to cluster node #1 ... [18:41:26.174] Exporting '...future.FUN' (911 bytes) to cluster node #1 ... DONE [18:41:26.174] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:26.175] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:26.175] Exporting '...future.elements_ii' (2.67 KiB) to cluster node #1 ... [18:41:26.175] Exporting '...future.elements_ii' (2.67 KiB) to cluster node #1 ... DONE [18:41:26.175] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:26.176] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:26.176] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:26.176] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:26.177] Exporting 5 global objects (4.14 KiB) to cluster node #1 ... DONE [18:41:26.177] MultisessionFuture started [18:41:26.177] - Launch lazy future ... done [18:41:26.177] run() for 'MultisessionFuture' ... done [18:41:26.178] Created future: [18:41:26.193] receiveMessageFromWorker() for ClusterFuture ... [18:41:26.193] - Validating connection of MultisessionFuture [18:41:26.193] - received message: FutureResult [18:41:26.193] - Received FutureResult [18:41:26.194] - Erased future from FutureRegistry [18:41:26.194] result() for ClusterFuture ... [18:41:26.194] - result already collected: FutureResult [18:41:26.194] result() for ClusterFuture ... done [18:41:26.194] receiveMessageFromWorker() for ClusterFuture ... done [18:41:26.178] MultisessionFuture: [18:41:26.178] Label: 'future_lapply-1' [18:41:26.178] Expression: [18:41:26.178] { [18:41:26.178] do.call(function(...) { [18:41:26.178] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:26.178] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:26.178] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:26.178] on.exit(options(oopts), add = TRUE) [18:41:26.178] } [18:41:26.178] { [18:41:26.178] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:26.178] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:26.178] ...future.FUN(...future.X_jj, ...) [18:41:26.178] }) [18:41:26.178] } [18:41:26.178] }, args = future.call.arguments) [18:41:26.178] } [18:41:26.178] Lazy evaluation: FALSE [18:41:26.178] Asynchronous evaluation: TRUE [18:41:26.178] Local evaluation: TRUE [18:41:26.178] Environment: R_GlobalEnv [18:41:26.178] Capture standard output: TRUE [18:41:26.178] Capture condition classes: 'condition' (excluding 'nothing') [18:41:26.178] Globals: 5 objects totaling 3.71 KiB (function '...future.FUN' of 911 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 2.67 KiB, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:26.178] Packages: 1 packages ('listenv') [18:41:26.178] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:26.178] Resolved: TRUE [18:41:26.178] Value: [18:41:26.178] Conditions captured: [18:41:26.178] Early signaling: FALSE [18:41:26.178] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:26.178] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:26.195] Chunk #1 of 2 ... DONE [18:41:26.195] Chunk #2 of 2 ... [18:41:26.195] - Finding globals in 'X' for chunk #2 ... [18:41:26.195] getGlobalsAndPackages() ... [18:41:26.195] Searching for globals... [18:41:26.196] [18:41:26.196] Searching for globals ... DONE [18:41:26.196] - globals: [0] [18:41:26.196] getGlobalsAndPackages() ... DONE [18:41:26.197] + additional globals found: [n=0] [18:41:26.197] + additional namespaces needed: [n=0] [18:41:26.197] - Finding globals in 'X' for chunk #2 ... DONE [18:41:26.197] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:26.197] - seeds: [18:41:26.197] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:26.198] getGlobalsAndPackages() ... [18:41:26.198] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:26.198] Resolving globals: FALSE [18:41:26.198] Tweak future expression to call with '...' arguments ... [18:41:26.198] { [18:41:26.198] do.call(function(...) { [18:41:26.198] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:26.198] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:26.198] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:26.198] on.exit(options(oopts), add = TRUE) [18:41:26.198] } [18:41:26.198] { [18:41:26.198] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:26.198] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:26.198] ...future.FUN(...future.X_jj, ...) [18:41:26.198] }) [18:41:26.198] } [18:41:26.198] }, args = future.call.arguments) [18:41:26.198] } [18:41:26.199] Tweak future expression to call with '...' arguments ... DONE [18:41:26.199] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:26.199] - packages: [1] 'listenv' [18:41:26.200] getGlobalsAndPackages() ... DONE [18:41:26.200] run() for 'Future' ... [18:41:26.200] - state: 'created' [18:41:26.200] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:26.216] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:26.216] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:26.216] - Field: 'node' [18:41:26.217] - Field: 'label' [18:41:26.217] - Field: 'local' [18:41:26.217] - Field: 'owner' [18:41:26.217] - Field: 'envir' [18:41:26.217] - Field: 'workers' [18:41:26.217] - Field: 'packages' [18:41:26.218] - Field: 'gc' [18:41:26.218] - Field: 'conditions' [18:41:26.218] - Field: 'persistent' [18:41:26.218] - Field: 'expr' [18:41:26.218] - Field: 'uuid' [18:41:26.219] - Field: 'seed' [18:41:26.219] - Field: 'version' [18:41:26.219] - Field: 'result' [18:41:26.219] - Field: 'asynchronous' [18:41:26.219] - Field: 'calls' [18:41:26.219] - Field: 'globals' [18:41:26.220] - Field: 'stdout' [18:41:26.220] - Field: 'earlySignal' [18:41:26.220] - Field: 'lazy' [18:41:26.220] - Field: 'state' [18:41:26.220] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:26.220] - Launch lazy future ... [18:41:26.221] Packages needed by the future expression (n = 1): 'listenv' [18:41:26.221] Packages needed by future strategies (n = 0): [18:41:26.222] { [18:41:26.222] { [18:41:26.222] { [18:41:26.222] ...future.startTime <- base::Sys.time() [18:41:26.222] { [18:41:26.222] { [18:41:26.222] { [18:41:26.222] { [18:41:26.222] { [18:41:26.222] base::local({ [18:41:26.222] has_future <- base::requireNamespace("future", [18:41:26.222] quietly = TRUE) [18:41:26.222] if (has_future) { [18:41:26.222] ns <- base::getNamespace("future") [18:41:26.222] version <- ns[[".package"]][["version"]] [18:41:26.222] if (is.null(version)) [18:41:26.222] version <- utils::packageVersion("future") [18:41:26.222] } [18:41:26.222] else { [18:41:26.222] version <- NULL [18:41:26.222] } [18:41:26.222] if (!has_future || version < "1.8.0") { [18:41:26.222] info <- base::c(r_version = base::gsub("R version ", [18:41:26.222] "", base::R.version$version.string), [18:41:26.222] platform = base::sprintf("%s (%s-bit)", [18:41:26.222] base::R.version$platform, 8 * [18:41:26.222] base::.Machine$sizeof.pointer), [18:41:26.222] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:26.222] "release", "version")], collapse = " "), [18:41:26.222] hostname = base::Sys.info()[["nodename"]]) [18:41:26.222] info <- base::sprintf("%s: %s", base::names(info), [18:41:26.222] info) [18:41:26.222] info <- base::paste(info, collapse = "; ") [18:41:26.222] if (!has_future) { [18:41:26.222] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:26.222] info) [18:41:26.222] } [18:41:26.222] else { [18:41:26.222] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:26.222] info, version) [18:41:26.222] } [18:41:26.222] base::stop(msg) [18:41:26.222] } [18:41:26.222] }) [18:41:26.222] } [18:41:26.222] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:26.222] base::options(mc.cores = 1L) [18:41:26.222] } [18:41:26.222] base::local({ [18:41:26.222] for (pkg in "listenv") { [18:41:26.222] base::loadNamespace(pkg) [18:41:26.222] base::library(pkg, character.only = TRUE) [18:41:26.222] } [18:41:26.222] }) [18:41:26.222] } [18:41:26.222] ...future.strategy.old <- future::plan("list") [18:41:26.222] options(future.plan = NULL) [18:41:26.222] Sys.unsetenv("R_FUTURE_PLAN") [18:41:26.222] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:26.222] } [18:41:26.222] ...future.workdir <- getwd() [18:41:26.222] } [18:41:26.222] ...future.oldOptions <- base::as.list(base::.Options) [18:41:26.222] ...future.oldEnvVars <- base::Sys.getenv() [18:41:26.222] } [18:41:26.222] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:26.222] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:26.222] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:26.222] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:26.222] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:26.222] future.stdout.windows.reencode = NULL, width = 80L) [18:41:26.222] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:26.222] base::names(...future.oldOptions)) [18:41:26.222] } [18:41:26.222] if (FALSE) { [18:41:26.222] } [18:41:26.222] else { [18:41:26.222] if (TRUE) { [18:41:26.222] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:26.222] open = "w") [18:41:26.222] } [18:41:26.222] else { [18:41:26.222] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:26.222] windows = "NUL", "/dev/null"), open = "w") [18:41:26.222] } [18:41:26.222] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:26.222] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:26.222] base::sink(type = "output", split = FALSE) [18:41:26.222] base::close(...future.stdout) [18:41:26.222] }, add = TRUE) [18:41:26.222] } [18:41:26.222] ...future.frame <- base::sys.nframe() [18:41:26.222] ...future.conditions <- base::list() [18:41:26.222] ...future.rng <- base::globalenv()$.Random.seed [18:41:26.222] if (FALSE) { [18:41:26.222] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:26.222] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:26.222] } [18:41:26.222] ...future.result <- base::tryCatch({ [18:41:26.222] base::withCallingHandlers({ [18:41:26.222] ...future.value <- base::withVisible(base::local({ [18:41:26.222] ...future.makeSendCondition <- base::local({ [18:41:26.222] sendCondition <- NULL [18:41:26.222] function(frame = 1L) { [18:41:26.222] if (is.function(sendCondition)) [18:41:26.222] return(sendCondition) [18:41:26.222] ns <- getNamespace("parallel") [18:41:26.222] if (exists("sendData", mode = "function", [18:41:26.222] envir = ns)) { [18:41:26.222] parallel_sendData <- get("sendData", mode = "function", [18:41:26.222] envir = ns) [18:41:26.222] envir <- sys.frame(frame) [18:41:26.222] master <- NULL [18:41:26.222] while (!identical(envir, .GlobalEnv) && [18:41:26.222] !identical(envir, emptyenv())) { [18:41:26.222] if (exists("master", mode = "list", envir = envir, [18:41:26.222] inherits = FALSE)) { [18:41:26.222] master <- get("master", mode = "list", [18:41:26.222] envir = envir, inherits = FALSE) [18:41:26.222] if (inherits(master, c("SOCKnode", [18:41:26.222] "SOCK0node"))) { [18:41:26.222] sendCondition <<- function(cond) { [18:41:26.222] data <- list(type = "VALUE", value = cond, [18:41:26.222] success = TRUE) [18:41:26.222] parallel_sendData(master, data) [18:41:26.222] } [18:41:26.222] return(sendCondition) [18:41:26.222] } [18:41:26.222] } [18:41:26.222] frame <- frame + 1L [18:41:26.222] envir <- sys.frame(frame) [18:41:26.222] } [18:41:26.222] } [18:41:26.222] sendCondition <<- function(cond) NULL [18:41:26.222] } [18:41:26.222] }) [18:41:26.222] withCallingHandlers({ [18:41:26.222] { [18:41:26.222] do.call(function(...) { [18:41:26.222] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:26.222] if (!identical(...future.globals.maxSize.org, [18:41:26.222] ...future.globals.maxSize)) { [18:41:26.222] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:26.222] on.exit(options(oopts), add = TRUE) [18:41:26.222] } [18:41:26.222] { [18:41:26.222] lapply(seq_along(...future.elements_ii), [18:41:26.222] FUN = function(jj) { [18:41:26.222] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:26.222] ...future.FUN(...future.X_jj, ...) [18:41:26.222] }) [18:41:26.222] } [18:41:26.222] }, args = future.call.arguments) [18:41:26.222] } [18:41:26.222] }, immediateCondition = function(cond) { [18:41:26.222] sendCondition <- ...future.makeSendCondition() [18:41:26.222] sendCondition(cond) [18:41:26.222] muffleCondition <- function (cond, pattern = "^muffle") [18:41:26.222] { [18:41:26.222] inherits <- base::inherits [18:41:26.222] invokeRestart <- base::invokeRestart [18:41:26.222] is.null <- base::is.null [18:41:26.222] muffled <- FALSE [18:41:26.222] if (inherits(cond, "message")) { [18:41:26.222] muffled <- grepl(pattern, "muffleMessage") [18:41:26.222] if (muffled) [18:41:26.222] invokeRestart("muffleMessage") [18:41:26.222] } [18:41:26.222] else if (inherits(cond, "warning")) { [18:41:26.222] muffled <- grepl(pattern, "muffleWarning") [18:41:26.222] if (muffled) [18:41:26.222] invokeRestart("muffleWarning") [18:41:26.222] } [18:41:26.222] else if (inherits(cond, "condition")) { [18:41:26.222] if (!is.null(pattern)) { [18:41:26.222] computeRestarts <- base::computeRestarts [18:41:26.222] grepl <- base::grepl [18:41:26.222] restarts <- computeRestarts(cond) [18:41:26.222] for (restart in restarts) { [18:41:26.222] name <- restart$name [18:41:26.222] if (is.null(name)) [18:41:26.222] next [18:41:26.222] if (!grepl(pattern, name)) [18:41:26.222] next [18:41:26.222] invokeRestart(restart) [18:41:26.222] muffled <- TRUE [18:41:26.222] break [18:41:26.222] } [18:41:26.222] } [18:41:26.222] } [18:41:26.222] invisible(muffled) [18:41:26.222] } [18:41:26.222] muffleCondition(cond) [18:41:26.222] }) [18:41:26.222] })) [18:41:26.222] future::FutureResult(value = ...future.value$value, [18:41:26.222] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:26.222] ...future.rng), globalenv = if (FALSE) [18:41:26.222] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:26.222] ...future.globalenv.names)) [18:41:26.222] else NULL, started = ...future.startTime, version = "1.8") [18:41:26.222] }, condition = base::local({ [18:41:26.222] c <- base::c [18:41:26.222] inherits <- base::inherits [18:41:26.222] invokeRestart <- base::invokeRestart [18:41:26.222] length <- base::length [18:41:26.222] list <- base::list [18:41:26.222] seq.int <- base::seq.int [18:41:26.222] signalCondition <- base::signalCondition [18:41:26.222] sys.calls <- base::sys.calls [18:41:26.222] `[[` <- base::`[[` [18:41:26.222] `+` <- base::`+` [18:41:26.222] `<<-` <- base::`<<-` [18:41:26.222] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:26.222] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:26.222] 3L)] [18:41:26.222] } [18:41:26.222] function(cond) { [18:41:26.222] is_error <- inherits(cond, "error") [18:41:26.222] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:26.222] NULL) [18:41:26.222] if (is_error) { [18:41:26.222] sessionInformation <- function() { [18:41:26.222] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:26.222] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:26.222] search = base::search(), system = base::Sys.info()) [18:41:26.222] } [18:41:26.222] ...future.conditions[[length(...future.conditions) + [18:41:26.222] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:26.222] cond$call), session = sessionInformation(), [18:41:26.222] timestamp = base::Sys.time(), signaled = 0L) [18:41:26.222] signalCondition(cond) [18:41:26.222] } [18:41:26.222] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:26.222] "immediateCondition"))) { [18:41:26.222] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:26.222] ...future.conditions[[length(...future.conditions) + [18:41:26.222] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:26.222] if (TRUE && !signal) { [18:41:26.222] muffleCondition <- function (cond, pattern = "^muffle") [18:41:26.222] { [18:41:26.222] inherits <- base::inherits [18:41:26.222] invokeRestart <- base::invokeRestart [18:41:26.222] is.null <- base::is.null [18:41:26.222] muffled <- FALSE [18:41:26.222] if (inherits(cond, "message")) { [18:41:26.222] muffled <- grepl(pattern, "muffleMessage") [18:41:26.222] if (muffled) [18:41:26.222] invokeRestart("muffleMessage") [18:41:26.222] } [18:41:26.222] else if (inherits(cond, "warning")) { [18:41:26.222] muffled <- grepl(pattern, "muffleWarning") [18:41:26.222] if (muffled) [18:41:26.222] invokeRestart("muffleWarning") [18:41:26.222] } [18:41:26.222] else if (inherits(cond, "condition")) { [18:41:26.222] if (!is.null(pattern)) { [18:41:26.222] computeRestarts <- base::computeRestarts [18:41:26.222] grepl <- base::grepl [18:41:26.222] restarts <- computeRestarts(cond) [18:41:26.222] for (restart in restarts) { [18:41:26.222] name <- restart$name [18:41:26.222] if (is.null(name)) [18:41:26.222] next [18:41:26.222] if (!grepl(pattern, name)) [18:41:26.222] next [18:41:26.222] invokeRestart(restart) [18:41:26.222] muffled <- TRUE [18:41:26.222] break [18:41:26.222] } [18:41:26.222] } [18:41:26.222] } [18:41:26.222] invisible(muffled) [18:41:26.222] } [18:41:26.222] muffleCondition(cond, pattern = "^muffle") [18:41:26.222] } [18:41:26.222] } [18:41:26.222] else { [18:41:26.222] if (TRUE) { [18:41:26.222] muffleCondition <- function (cond, pattern = "^muffle") [18:41:26.222] { [18:41:26.222] inherits <- base::inherits [18:41:26.222] invokeRestart <- base::invokeRestart [18:41:26.222] is.null <- base::is.null [18:41:26.222] muffled <- FALSE [18:41:26.222] if (inherits(cond, "message")) { [18:41:26.222] muffled <- grepl(pattern, "muffleMessage") [18:41:26.222] if (muffled) [18:41:26.222] invokeRestart("muffleMessage") [18:41:26.222] } [18:41:26.222] else if (inherits(cond, "warning")) { [18:41:26.222] muffled <- grepl(pattern, "muffleWarning") [18:41:26.222] if (muffled) [18:41:26.222] invokeRestart("muffleWarning") [18:41:26.222] } [18:41:26.222] else if (inherits(cond, "condition")) { [18:41:26.222] if (!is.null(pattern)) { [18:41:26.222] computeRestarts <- base::computeRestarts [18:41:26.222] grepl <- base::grepl [18:41:26.222] restarts <- computeRestarts(cond) [18:41:26.222] for (restart in restarts) { [18:41:26.222] name <- restart$name [18:41:26.222] if (is.null(name)) [18:41:26.222] next [18:41:26.222] if (!grepl(pattern, name)) [18:41:26.222] next [18:41:26.222] invokeRestart(restart) [18:41:26.222] muffled <- TRUE [18:41:26.222] break [18:41:26.222] } [18:41:26.222] } [18:41:26.222] } [18:41:26.222] invisible(muffled) [18:41:26.222] } [18:41:26.222] muffleCondition(cond, pattern = "^muffle") [18:41:26.222] } [18:41:26.222] } [18:41:26.222] } [18:41:26.222] })) [18:41:26.222] }, error = function(ex) { [18:41:26.222] base::structure(base::list(value = NULL, visible = NULL, [18:41:26.222] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:26.222] ...future.rng), started = ...future.startTime, [18:41:26.222] finished = Sys.time(), session_uuid = NA_character_, [18:41:26.222] version = "1.8"), class = "FutureResult") [18:41:26.222] }, finally = { [18:41:26.222] if (!identical(...future.workdir, getwd())) [18:41:26.222] setwd(...future.workdir) [18:41:26.222] { [18:41:26.222] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:26.222] ...future.oldOptions$nwarnings <- NULL [18:41:26.222] } [18:41:26.222] base::options(...future.oldOptions) [18:41:26.222] if (.Platform$OS.type == "windows") { [18:41:26.222] old_names <- names(...future.oldEnvVars) [18:41:26.222] envs <- base::Sys.getenv() [18:41:26.222] names <- names(envs) [18:41:26.222] common <- intersect(names, old_names) [18:41:26.222] added <- setdiff(names, old_names) [18:41:26.222] removed <- setdiff(old_names, names) [18:41:26.222] changed <- common[...future.oldEnvVars[common] != [18:41:26.222] envs[common]] [18:41:26.222] NAMES <- toupper(changed) [18:41:26.222] args <- list() [18:41:26.222] for (kk in seq_along(NAMES)) { [18:41:26.222] name <- changed[[kk]] [18:41:26.222] NAME <- NAMES[[kk]] [18:41:26.222] if (name != NAME && is.element(NAME, old_names)) [18:41:26.222] next [18:41:26.222] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:26.222] } [18:41:26.222] NAMES <- toupper(added) [18:41:26.222] for (kk in seq_along(NAMES)) { [18:41:26.222] name <- added[[kk]] [18:41:26.222] NAME <- NAMES[[kk]] [18:41:26.222] if (name != NAME && is.element(NAME, old_names)) [18:41:26.222] next [18:41:26.222] args[[name]] <- "" [18:41:26.222] } [18:41:26.222] NAMES <- toupper(removed) [18:41:26.222] for (kk in seq_along(NAMES)) { [18:41:26.222] name <- removed[[kk]] [18:41:26.222] NAME <- NAMES[[kk]] [18:41:26.222] if (name != NAME && is.element(NAME, old_names)) [18:41:26.222] next [18:41:26.222] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:26.222] } [18:41:26.222] if (length(args) > 0) [18:41:26.222] base::do.call(base::Sys.setenv, args = args) [18:41:26.222] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:26.222] } [18:41:26.222] else { [18:41:26.222] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:26.222] } [18:41:26.222] { [18:41:26.222] if (base::length(...future.futureOptionsAdded) > [18:41:26.222] 0L) { [18:41:26.222] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:26.222] base::names(opts) <- ...future.futureOptionsAdded [18:41:26.222] base::options(opts) [18:41:26.222] } [18:41:26.222] { [18:41:26.222] { [18:41:26.222] base::options(mc.cores = ...future.mc.cores.old) [18:41:26.222] NULL [18:41:26.222] } [18:41:26.222] options(future.plan = NULL) [18:41:26.222] if (is.na(NA_character_)) [18:41:26.222] Sys.unsetenv("R_FUTURE_PLAN") [18:41:26.222] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:26.222] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:26.222] .init = FALSE) [18:41:26.222] } [18:41:26.222] } [18:41:26.222] } [18:41:26.222] }) [18:41:26.222] if (TRUE) { [18:41:26.222] base::sink(type = "output", split = FALSE) [18:41:26.222] if (TRUE) { [18:41:26.222] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:26.222] } [18:41:26.222] else { [18:41:26.222] ...future.result["stdout"] <- base::list(NULL) [18:41:26.222] } [18:41:26.222] base::close(...future.stdout) [18:41:26.222] ...future.stdout <- NULL [18:41:26.222] } [18:41:26.222] ...future.result$conditions <- ...future.conditions [18:41:26.222] ...future.result$finished <- base::Sys.time() [18:41:26.222] ...future.result [18:41:26.222] } [18:41:26.227] Exporting 5 global objects (2.02 KiB) to cluster node #1 ... [18:41:26.227] Exporting '...future.FUN' (911 bytes) to cluster node #1 ... [18:41:26.228] Exporting '...future.FUN' (911 bytes) to cluster node #1 ... DONE [18:41:26.228] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:26.228] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:26.229] Exporting '...future.elements_ii' (569 bytes) to cluster node #1 ... [18:41:26.229] Exporting '...future.elements_ii' (569 bytes) to cluster node #1 ... DONE [18:41:26.229] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:26.230] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:26.230] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:26.230] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:26.230] Exporting 5 global objects (2.02 KiB) to cluster node #1 ... DONE [18:41:26.231] MultisessionFuture started [18:41:26.231] - Launch lazy future ... done [18:41:26.231] run() for 'MultisessionFuture' ... done [18:41:26.232] Created future: [18:41:26.248] receiveMessageFromWorker() for ClusterFuture ... [18:41:26.248] - Validating connection of MultisessionFuture [18:41:26.248] - received message: FutureResult [18:41:26.249] - Received FutureResult [18:41:26.249] - Erased future from FutureRegistry [18:41:26.249] result() for ClusterFuture ... [18:41:26.249] - result already collected: FutureResult [18:41:26.249] result() for ClusterFuture ... done [18:41:26.250] receiveMessageFromWorker() for ClusterFuture ... done [18:41:26.232] MultisessionFuture: [18:41:26.232] Label: 'future_lapply-2' [18:41:26.232] Expression: [18:41:26.232] { [18:41:26.232] do.call(function(...) { [18:41:26.232] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:26.232] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:26.232] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:26.232] on.exit(options(oopts), add = TRUE) [18:41:26.232] } [18:41:26.232] { [18:41:26.232] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:26.232] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:26.232] ...future.FUN(...future.X_jj, ...) [18:41:26.232] }) [18:41:26.232] } [18:41:26.232] }, args = future.call.arguments) [18:41:26.232] } [18:41:26.232] Lazy evaluation: FALSE [18:41:26.232] Asynchronous evaluation: TRUE [18:41:26.232] Local evaluation: TRUE [18:41:26.232] Environment: R_GlobalEnv [18:41:26.232] Capture standard output: TRUE [18:41:26.232] Capture condition classes: 'condition' (excluding 'nothing') [18:41:26.232] Globals: 5 objects totaling 1.59 KiB (function '...future.FUN' of 911 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 569 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:26.232] Packages: 1 packages ('listenv') [18:41:26.232] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:26.232] Resolved: TRUE [18:41:26.232] Value: [18:41:26.232] Conditions captured: [18:41:26.232] Early signaling: FALSE [18:41:26.232] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:26.232] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:26.250] Chunk #2 of 2 ... DONE [18:41:26.250] Launching 2 futures (chunks) ... DONE [18:41:26.250] Resolving 2 futures (chunks) ... [18:41:26.251] resolve() on list ... [18:41:26.251] recursive: 0 [18:41:26.251] length: 2 [18:41:26.251] [18:41:26.251] Future #1 [18:41:26.251] result() for ClusterFuture ... [18:41:26.251] - result already collected: FutureResult [18:41:26.252] result() for ClusterFuture ... done [18:41:26.252] result() for ClusterFuture ... [18:41:26.252] - result already collected: FutureResult [18:41:26.252] result() for ClusterFuture ... done [18:41:26.252] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:26.252] - nx: 2 [18:41:26.253] - relay: TRUE [18:41:26.253] - stdout: TRUE [18:41:26.253] - signal: TRUE [18:41:26.253] - resignal: FALSE [18:41:26.253] - force: TRUE [18:41:26.253] - relayed: [n=2] FALSE, FALSE [18:41:26.254] - queued futures: [n=2] FALSE, FALSE [18:41:26.254] - until=1 [18:41:26.254] - relaying element #1 [18:41:26.254] result() for ClusterFuture ... [18:41:26.254] - result already collected: FutureResult [18:41:26.254] result() for ClusterFuture ... done [18:41:26.255] result() for ClusterFuture ... [18:41:26.255] - result already collected: FutureResult [18:41:26.255] result() for ClusterFuture ... done [18:41:26.255] result() for ClusterFuture ... [18:41:26.255] - result already collected: FutureResult [18:41:26.255] result() for ClusterFuture ... done [18:41:26.256] result() for ClusterFuture ... [18:41:26.256] - result already collected: FutureResult [18:41:26.256] result() for ClusterFuture ... done [18:41:26.256] - relayed: [n=2] TRUE, FALSE [18:41:26.256] - queued futures: [n=2] TRUE, FALSE [18:41:26.256] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:26.257] length: 1 (resolved future 1) [18:41:26.257] Future #2 [18:41:26.257] result() for ClusterFuture ... [18:41:26.257] - result already collected: FutureResult [18:41:26.257] result() for ClusterFuture ... done [18:41:26.257] result() for ClusterFuture ... [18:41:26.258] - result already collected: FutureResult [18:41:26.258] result() for ClusterFuture ... done [18:41:26.258] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:26.258] - nx: 2 [18:41:26.258] - relay: TRUE [18:41:26.258] - stdout: TRUE [18:41:26.259] - signal: TRUE [18:41:26.259] - resignal: FALSE [18:41:26.259] - force: TRUE [18:41:26.259] - relayed: [n=2] TRUE, FALSE [18:41:26.259] - queued futures: [n=2] TRUE, FALSE [18:41:26.259] - until=2 [18:41:26.259] - relaying element #2 [18:41:26.260] result() for ClusterFuture ... [18:41:26.260] - result already collected: FutureResult [18:41:26.260] result() for ClusterFuture ... done [18:41:26.260] result() for ClusterFuture ... [18:41:26.260] - result already collected: FutureResult [18:41:26.260] result() for ClusterFuture ... done [18:41:26.261] result() for ClusterFuture ... [18:41:26.261] - result already collected: FutureResult [18:41:26.261] result() for ClusterFuture ... done [18:41:26.261] result() for ClusterFuture ... [18:41:26.261] - result already collected: FutureResult [18:41:26.261] result() for ClusterFuture ... done [18:41:26.262] - relayed: [n=2] TRUE, TRUE [18:41:26.262] - queued futures: [n=2] TRUE, TRUE [18:41:26.262] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:26.262] length: 0 (resolved future 2) [18:41:26.262] Relaying remaining futures [18:41:26.262] signalConditionsASAP(NULL, pos=0) ... [18:41:26.263] - nx: 2 [18:41:26.263] - relay: TRUE [18:41:26.263] - stdout: TRUE [18:41:26.263] - signal: TRUE [18:41:26.263] - resignal: FALSE [18:41:26.263] - force: TRUE [18:41:26.263] - relayed: [n=2] TRUE, TRUE [18:41:26.264] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:26.264] - relayed: [n=2] TRUE, TRUE [18:41:26.264] - queued futures: [n=2] TRUE, TRUE [18:41:26.264] signalConditionsASAP(NULL, pos=0) ... done [18:41:26.264] resolve() on list ... DONE [18:41:26.264] result() for ClusterFuture ... [18:41:26.265] - result already collected: FutureResult [18:41:26.265] result() for ClusterFuture ... done [18:41:26.265] result() for ClusterFuture ... [18:41:26.265] - result already collected: FutureResult [18:41:26.265] result() for ClusterFuture ... done [18:41:26.265] result() for ClusterFuture ... [18:41:26.266] - result already collected: FutureResult [18:41:26.266] result() for ClusterFuture ... done [18:41:26.266] result() for ClusterFuture ... [18:41:26.266] - result already collected: FutureResult [18:41:26.266] result() for ClusterFuture ... done [18:41:26.266] - Number of value chunks collected: 2 [18:41:26.267] Resolving 2 futures (chunks) ... DONE [18:41:26.267] Reducing values from 2 chunks ... [18:41:26.267] - Number of values collected after concatenation: 2 [18:41:26.267] - Number of values expected: 2 [18:41:26.267] Reverse index remapping (attribute 'ordering'): [n = 2] 2, 1 [18:41:26.267] Reducing values from 2 chunks ... DONE [18:41:26.268] future_lapply() ... DONE List of 1 $ y:List of 2 ..$ a: Named chr "A" .. ..- attr(*, "names")= chr "A" ..$ b: Named chr [1:2] "A" "B" .. ..- attr(*, "names")= chr [1:2] "A" "B" - future_lapply(x, FUN, ...) for large length(x) ... [18:41:26.270] future_lapply() ... [18:41:26.273] Number of chunks: 2 [18:41:26.274] getGlobalsAndPackagesXApply() ... [18:41:26.274] - future.globals: TRUE [18:41:26.274] getGlobalsAndPackages() ... [18:41:26.274] Searching for globals... [18:41:26.276] - globals found: [4] 'FUN', 'sqrt', '+', 'a' [18:41:26.276] Searching for globals ... DONE [18:41:26.276] Resolving globals: FALSE [18:41:26.277] The total size of the 2 globals is 438 bytes (438 bytes) [18:41:26.277] The total size of the 2 globals exported for future expression ('FUN()') is 438 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There are two globals: 'FUN' (399 bytes of class 'function') and 'a' (39 bytes of class 'numeric') [18:41:26.277] - globals: [2] 'FUN', 'a' [18:41:26.278] [18:41:26.278] getGlobalsAndPackages() ... DONE [18:41:26.278] - globals found/used: [n=2] 'FUN', 'a' [18:41:26.281] - needed namespaces: [n=0] [18:41:26.281] Finding globals ... DONE [18:41:26.282] - use_args: TRUE [18:41:26.282] - Getting '...' globals ... [18:41:26.282] resolve() on list ... [18:41:26.282] recursive: 0 [18:41:26.283] length: 1 [18:41:26.283] elements: '...' [18:41:26.283] length: 0 (resolved future 1) [18:41:26.283] resolve() on list ... DONE [18:41:26.283] - '...' content: [n=0] [18:41:26.284] List of 1 [18:41:26.284] $ ...: list() [18:41:26.284] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:26.284] - attr(*, "where")=List of 1 [18:41:26.284] ..$ ...: [18:41:26.284] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:26.284] - attr(*, "resolved")= logi TRUE [18:41:26.284] - attr(*, "total_size")= num NA [18:41:26.287] - Getting '...' globals ... DONE [18:41:26.287] Globals to be used in all futures (chunks): [n=3] '...future.FUN', 'a', '...' [18:41:26.287] List of 3 [18:41:26.287] $ ...future.FUN:function (z) [18:41:26.287] $ a : num 3.14 [18:41:26.287] $ ... : list() [18:41:26.287] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:26.287] - attr(*, "where")=List of 3 [18:41:26.287] ..$ ...future.FUN: [18:41:26.287] ..$ a : [18:41:26.287] ..$ ... : [18:41:26.287] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:26.287] - attr(*, "resolved")= logi FALSE [18:41:26.287] - attr(*, "total_size")= int 4016 [18:41:26.291] Packages to be attached in all futures: [n=0] [18:41:26.291] getGlobalsAndPackagesXApply() ... DONE [18:41:26.291] Number of futures (= number of chunks): 2 [18:41:26.292] Launching 2 futures (chunks) ... [18:41:26.292] Chunk #1 of 2 ... [18:41:26.293] - Finding globals in 'X' for chunk #1 ... [18:41:26.293] getGlobalsAndPackages() ... [18:41:26.293] Searching for globals... [18:41:26.296] [18:41:26.297] Searching for globals ... DONE [18:41:26.297] - globals: [0] [18:41:26.297] getGlobalsAndPackages() ... DONE [18:41:26.297] + additional globals found: [n=0] [18:41:26.297] + additional namespaces needed: [n=0] [18:41:26.297] - Finding globals in 'X' for chunk #1 ... DONE [18:41:26.298] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:26.298] - seeds: [18:41:26.298] - All globals exported: [n=6] '...future.FUN', 'a', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:26.298] getGlobalsAndPackages() ... [18:41:26.298] - globals passed as-is: [6] '...future.FUN', 'a', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:26.298] Resolving globals: FALSE [18:41:26.299] Tweak future expression to call with '...' arguments ... [18:41:26.299] { [18:41:26.299] do.call(function(...) { [18:41:26.299] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:26.299] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:26.299] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:26.299] on.exit(options(oopts), add = TRUE) [18:41:26.299] } [18:41:26.299] { [18:41:26.299] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:26.299] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:26.299] ...future.FUN(...future.X_jj, ...) [18:41:26.299] }) [18:41:26.299] } [18:41:26.299] }, args = future.call.arguments) [18:41:26.299] } [18:41:26.299] Tweak future expression to call with '...' arguments ... DONE [18:41:26.300] - globals: [6] '...future.FUN', 'a', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:26.300] [18:41:26.300] getGlobalsAndPackages() ... DONE [18:41:26.301] run() for 'Future' ... [18:41:26.301] - state: 'created' [18:41:26.301] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:26.316] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:26.316] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:26.317] - Field: 'node' [18:41:26.317] - Field: 'label' [18:41:26.317] - Field: 'local' [18:41:26.317] - Field: 'owner' [18:41:26.317] - Field: 'envir' [18:41:26.317] - Field: 'workers' [18:41:26.318] - Field: 'packages' [18:41:26.318] - Field: 'gc' [18:41:26.318] - Field: 'conditions' [18:41:26.318] - Field: 'persistent' [18:41:26.318] - Field: 'expr' [18:41:26.318] - Field: 'uuid' [18:41:26.319] - Field: 'seed' [18:41:26.319] - Field: 'version' [18:41:26.319] - Field: 'result' [18:41:26.319] - Field: 'asynchronous' [18:41:26.319] - Field: 'calls' [18:41:26.320] - Field: 'globals' [18:41:26.320] - Field: 'stdout' [18:41:26.320] - Field: 'earlySignal' [18:41:26.320] - Field: 'lazy' [18:41:26.320] - Field: 'state' [18:41:26.320] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:26.321] - Launch lazy future ... [18:41:26.321] Packages needed by the future expression (n = 0): [18:41:26.321] Packages needed by future strategies (n = 0): [18:41:26.322] { [18:41:26.322] { [18:41:26.322] { [18:41:26.322] ...future.startTime <- base::Sys.time() [18:41:26.322] { [18:41:26.322] { [18:41:26.322] { [18:41:26.322] { [18:41:26.322] base::local({ [18:41:26.322] has_future <- base::requireNamespace("future", [18:41:26.322] quietly = TRUE) [18:41:26.322] if (has_future) { [18:41:26.322] ns <- base::getNamespace("future") [18:41:26.322] version <- ns[[".package"]][["version"]] [18:41:26.322] if (is.null(version)) [18:41:26.322] version <- utils::packageVersion("future") [18:41:26.322] } [18:41:26.322] else { [18:41:26.322] version <- NULL [18:41:26.322] } [18:41:26.322] if (!has_future || version < "1.8.0") { [18:41:26.322] info <- base::c(r_version = base::gsub("R version ", [18:41:26.322] "", base::R.version$version.string), [18:41:26.322] platform = base::sprintf("%s (%s-bit)", [18:41:26.322] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:26.322] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:26.322] "release", "version")], collapse = " "), [18:41:26.322] hostname = base::Sys.info()[["nodename"]]) [18:41:26.322] info <- base::sprintf("%s: %s", base::names(info), [18:41:26.322] info) [18:41:26.322] info <- base::paste(info, collapse = "; ") [18:41:26.322] if (!has_future) { [18:41:26.322] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:26.322] info) [18:41:26.322] } [18:41:26.322] else { [18:41:26.322] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:26.322] info, version) [18:41:26.322] } [18:41:26.322] base::stop(msg) [18:41:26.322] } [18:41:26.322] }) [18:41:26.322] } [18:41:26.322] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:26.322] base::options(mc.cores = 1L) [18:41:26.322] } [18:41:26.322] ...future.strategy.old <- future::plan("list") [18:41:26.322] options(future.plan = NULL) [18:41:26.322] Sys.unsetenv("R_FUTURE_PLAN") [18:41:26.322] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:26.322] } [18:41:26.322] ...future.workdir <- getwd() [18:41:26.322] } [18:41:26.322] ...future.oldOptions <- base::as.list(base::.Options) [18:41:26.322] ...future.oldEnvVars <- base::Sys.getenv() [18:41:26.322] } [18:41:26.322] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:26.322] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:26.322] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:26.322] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:26.322] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:26.322] future.stdout.windows.reencode = NULL, width = 80L) [18:41:26.322] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:26.322] base::names(...future.oldOptions)) [18:41:26.322] } [18:41:26.322] if (FALSE) { [18:41:26.322] } [18:41:26.322] else { [18:41:26.322] if (TRUE) { [18:41:26.322] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:26.322] open = "w") [18:41:26.322] } [18:41:26.322] else { [18:41:26.322] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:26.322] windows = "NUL", "/dev/null"), open = "w") [18:41:26.322] } [18:41:26.322] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:26.322] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:26.322] base::sink(type = "output", split = FALSE) [18:41:26.322] base::close(...future.stdout) [18:41:26.322] }, add = TRUE) [18:41:26.322] } [18:41:26.322] ...future.frame <- base::sys.nframe() [18:41:26.322] ...future.conditions <- base::list() [18:41:26.322] ...future.rng <- base::globalenv()$.Random.seed [18:41:26.322] if (FALSE) { [18:41:26.322] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:26.322] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:26.322] } [18:41:26.322] ...future.result <- base::tryCatch({ [18:41:26.322] base::withCallingHandlers({ [18:41:26.322] ...future.value <- base::withVisible(base::local({ [18:41:26.322] ...future.makeSendCondition <- base::local({ [18:41:26.322] sendCondition <- NULL [18:41:26.322] function(frame = 1L) { [18:41:26.322] if (is.function(sendCondition)) [18:41:26.322] return(sendCondition) [18:41:26.322] ns <- getNamespace("parallel") [18:41:26.322] if (exists("sendData", mode = "function", [18:41:26.322] envir = ns)) { [18:41:26.322] parallel_sendData <- get("sendData", mode = "function", [18:41:26.322] envir = ns) [18:41:26.322] envir <- sys.frame(frame) [18:41:26.322] master <- NULL [18:41:26.322] while (!identical(envir, .GlobalEnv) && [18:41:26.322] !identical(envir, emptyenv())) { [18:41:26.322] if (exists("master", mode = "list", envir = envir, [18:41:26.322] inherits = FALSE)) { [18:41:26.322] master <- get("master", mode = "list", [18:41:26.322] envir = envir, inherits = FALSE) [18:41:26.322] if (inherits(master, c("SOCKnode", [18:41:26.322] "SOCK0node"))) { [18:41:26.322] sendCondition <<- function(cond) { [18:41:26.322] data <- list(type = "VALUE", value = cond, [18:41:26.322] success = TRUE) [18:41:26.322] parallel_sendData(master, data) [18:41:26.322] } [18:41:26.322] return(sendCondition) [18:41:26.322] } [18:41:26.322] } [18:41:26.322] frame <- frame + 1L [18:41:26.322] envir <- sys.frame(frame) [18:41:26.322] } [18:41:26.322] } [18:41:26.322] sendCondition <<- function(cond) NULL [18:41:26.322] } [18:41:26.322] }) [18:41:26.322] withCallingHandlers({ [18:41:26.322] { [18:41:26.322] do.call(function(...) { [18:41:26.322] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:26.322] if (!identical(...future.globals.maxSize.org, [18:41:26.322] ...future.globals.maxSize)) { [18:41:26.322] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:26.322] on.exit(options(oopts), add = TRUE) [18:41:26.322] } [18:41:26.322] { [18:41:26.322] lapply(seq_along(...future.elements_ii), [18:41:26.322] FUN = function(jj) { [18:41:26.322] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:26.322] ...future.FUN(...future.X_jj, ...) [18:41:26.322] }) [18:41:26.322] } [18:41:26.322] }, args = future.call.arguments) [18:41:26.322] } [18:41:26.322] }, immediateCondition = function(cond) { [18:41:26.322] sendCondition <- ...future.makeSendCondition() [18:41:26.322] sendCondition(cond) [18:41:26.322] muffleCondition <- function (cond, pattern = "^muffle") [18:41:26.322] { [18:41:26.322] inherits <- base::inherits [18:41:26.322] invokeRestart <- base::invokeRestart [18:41:26.322] is.null <- base::is.null [18:41:26.322] muffled <- FALSE [18:41:26.322] if (inherits(cond, "message")) { [18:41:26.322] muffled <- grepl(pattern, "muffleMessage") [18:41:26.322] if (muffled) [18:41:26.322] invokeRestart("muffleMessage") [18:41:26.322] } [18:41:26.322] else if (inherits(cond, "warning")) { [18:41:26.322] muffled <- grepl(pattern, "muffleWarning") [18:41:26.322] if (muffled) [18:41:26.322] invokeRestart("muffleWarning") [18:41:26.322] } [18:41:26.322] else if (inherits(cond, "condition")) { [18:41:26.322] if (!is.null(pattern)) { [18:41:26.322] computeRestarts <- base::computeRestarts [18:41:26.322] grepl <- base::grepl [18:41:26.322] restarts <- computeRestarts(cond) [18:41:26.322] for (restart in restarts) { [18:41:26.322] name <- restart$name [18:41:26.322] if (is.null(name)) [18:41:26.322] next [18:41:26.322] if (!grepl(pattern, name)) [18:41:26.322] next [18:41:26.322] invokeRestart(restart) [18:41:26.322] muffled <- TRUE [18:41:26.322] break [18:41:26.322] } [18:41:26.322] } [18:41:26.322] } [18:41:26.322] invisible(muffled) [18:41:26.322] } [18:41:26.322] muffleCondition(cond) [18:41:26.322] }) [18:41:26.322] })) [18:41:26.322] future::FutureResult(value = ...future.value$value, [18:41:26.322] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:26.322] ...future.rng), globalenv = if (FALSE) [18:41:26.322] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:26.322] ...future.globalenv.names)) [18:41:26.322] else NULL, started = ...future.startTime, version = "1.8") [18:41:26.322] }, condition = base::local({ [18:41:26.322] c <- base::c [18:41:26.322] inherits <- base::inherits [18:41:26.322] invokeRestart <- base::invokeRestart [18:41:26.322] length <- base::length [18:41:26.322] list <- base::list [18:41:26.322] seq.int <- base::seq.int [18:41:26.322] signalCondition <- base::signalCondition [18:41:26.322] sys.calls <- base::sys.calls [18:41:26.322] `[[` <- base::`[[` [18:41:26.322] `+` <- base::`+` [18:41:26.322] `<<-` <- base::`<<-` [18:41:26.322] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:26.322] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:26.322] 3L)] [18:41:26.322] } [18:41:26.322] function(cond) { [18:41:26.322] is_error <- inherits(cond, "error") [18:41:26.322] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:26.322] NULL) [18:41:26.322] if (is_error) { [18:41:26.322] sessionInformation <- function() { [18:41:26.322] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:26.322] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:26.322] search = base::search(), system = base::Sys.info()) [18:41:26.322] } [18:41:26.322] ...future.conditions[[length(...future.conditions) + [18:41:26.322] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:26.322] cond$call), session = sessionInformation(), [18:41:26.322] timestamp = base::Sys.time(), signaled = 0L) [18:41:26.322] signalCondition(cond) [18:41:26.322] } [18:41:26.322] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:26.322] "immediateCondition"))) { [18:41:26.322] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:26.322] ...future.conditions[[length(...future.conditions) + [18:41:26.322] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:26.322] if (TRUE && !signal) { [18:41:26.322] muffleCondition <- function (cond, pattern = "^muffle") [18:41:26.322] { [18:41:26.322] inherits <- base::inherits [18:41:26.322] invokeRestart <- base::invokeRestart [18:41:26.322] is.null <- base::is.null [18:41:26.322] muffled <- FALSE [18:41:26.322] if (inherits(cond, "message")) { [18:41:26.322] muffled <- grepl(pattern, "muffleMessage") [18:41:26.322] if (muffled) [18:41:26.322] invokeRestart("muffleMessage") [18:41:26.322] } [18:41:26.322] else if (inherits(cond, "warning")) { [18:41:26.322] muffled <- grepl(pattern, "muffleWarning") [18:41:26.322] if (muffled) [18:41:26.322] invokeRestart("muffleWarning") [18:41:26.322] } [18:41:26.322] else if (inherits(cond, "condition")) { [18:41:26.322] if (!is.null(pattern)) { [18:41:26.322] computeRestarts <- base::computeRestarts [18:41:26.322] grepl <- base::grepl [18:41:26.322] restarts <- computeRestarts(cond) [18:41:26.322] for (restart in restarts) { [18:41:26.322] name <- restart$name [18:41:26.322] if (is.null(name)) [18:41:26.322] next [18:41:26.322] if (!grepl(pattern, name)) [18:41:26.322] next [18:41:26.322] invokeRestart(restart) [18:41:26.322] muffled <- TRUE [18:41:26.322] break [18:41:26.322] } [18:41:26.322] } [18:41:26.322] } [18:41:26.322] invisible(muffled) [18:41:26.322] } [18:41:26.322] muffleCondition(cond, pattern = "^muffle") [18:41:26.322] } [18:41:26.322] } [18:41:26.322] else { [18:41:26.322] if (TRUE) { [18:41:26.322] muffleCondition <- function (cond, pattern = "^muffle") [18:41:26.322] { [18:41:26.322] inherits <- base::inherits [18:41:26.322] invokeRestart <- base::invokeRestart [18:41:26.322] is.null <- base::is.null [18:41:26.322] muffled <- FALSE [18:41:26.322] if (inherits(cond, "message")) { [18:41:26.322] muffled <- grepl(pattern, "muffleMessage") [18:41:26.322] if (muffled) [18:41:26.322] invokeRestart("muffleMessage") [18:41:26.322] } [18:41:26.322] else if (inherits(cond, "warning")) { [18:41:26.322] muffled <- grepl(pattern, "muffleWarning") [18:41:26.322] if (muffled) [18:41:26.322] invokeRestart("muffleWarning") [18:41:26.322] } [18:41:26.322] else if (inherits(cond, "condition")) { [18:41:26.322] if (!is.null(pattern)) { [18:41:26.322] computeRestarts <- base::computeRestarts [18:41:26.322] grepl <- base::grepl [18:41:26.322] restarts <- computeRestarts(cond) [18:41:26.322] for (restart in restarts) { [18:41:26.322] name <- restart$name [18:41:26.322] if (is.null(name)) [18:41:26.322] next [18:41:26.322] if (!grepl(pattern, name)) [18:41:26.322] next [18:41:26.322] invokeRestart(restart) [18:41:26.322] muffled <- TRUE [18:41:26.322] break [18:41:26.322] } [18:41:26.322] } [18:41:26.322] } [18:41:26.322] invisible(muffled) [18:41:26.322] } [18:41:26.322] muffleCondition(cond, pattern = "^muffle") [18:41:26.322] } [18:41:26.322] } [18:41:26.322] } [18:41:26.322] })) [18:41:26.322] }, error = function(ex) { [18:41:26.322] base::structure(base::list(value = NULL, visible = NULL, [18:41:26.322] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:26.322] ...future.rng), started = ...future.startTime, [18:41:26.322] finished = Sys.time(), session_uuid = NA_character_, [18:41:26.322] version = "1.8"), class = "FutureResult") [18:41:26.322] }, finally = { [18:41:26.322] if (!identical(...future.workdir, getwd())) [18:41:26.322] setwd(...future.workdir) [18:41:26.322] { [18:41:26.322] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:26.322] ...future.oldOptions$nwarnings <- NULL [18:41:26.322] } [18:41:26.322] base::options(...future.oldOptions) [18:41:26.322] if (.Platform$OS.type == "windows") { [18:41:26.322] old_names <- names(...future.oldEnvVars) [18:41:26.322] envs <- base::Sys.getenv() [18:41:26.322] names <- names(envs) [18:41:26.322] common <- intersect(names, old_names) [18:41:26.322] added <- setdiff(names, old_names) [18:41:26.322] removed <- setdiff(old_names, names) [18:41:26.322] changed <- common[...future.oldEnvVars[common] != [18:41:26.322] envs[common]] [18:41:26.322] NAMES <- toupper(changed) [18:41:26.322] args <- list() [18:41:26.322] for (kk in seq_along(NAMES)) { [18:41:26.322] name <- changed[[kk]] [18:41:26.322] NAME <- NAMES[[kk]] [18:41:26.322] if (name != NAME && is.element(NAME, old_names)) [18:41:26.322] next [18:41:26.322] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:26.322] } [18:41:26.322] NAMES <- toupper(added) [18:41:26.322] for (kk in seq_along(NAMES)) { [18:41:26.322] name <- added[[kk]] [18:41:26.322] NAME <- NAMES[[kk]] [18:41:26.322] if (name != NAME && is.element(NAME, old_names)) [18:41:26.322] next [18:41:26.322] args[[name]] <- "" [18:41:26.322] } [18:41:26.322] NAMES <- toupper(removed) [18:41:26.322] for (kk in seq_along(NAMES)) { [18:41:26.322] name <- removed[[kk]] [18:41:26.322] NAME <- NAMES[[kk]] [18:41:26.322] if (name != NAME && is.element(NAME, old_names)) [18:41:26.322] next [18:41:26.322] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:26.322] } [18:41:26.322] if (length(args) > 0) [18:41:26.322] base::do.call(base::Sys.setenv, args = args) [18:41:26.322] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:26.322] } [18:41:26.322] else { [18:41:26.322] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:26.322] } [18:41:26.322] { [18:41:26.322] if (base::length(...future.futureOptionsAdded) > [18:41:26.322] 0L) { [18:41:26.322] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:26.322] base::names(opts) <- ...future.futureOptionsAdded [18:41:26.322] base::options(opts) [18:41:26.322] } [18:41:26.322] { [18:41:26.322] { [18:41:26.322] base::options(mc.cores = ...future.mc.cores.old) [18:41:26.322] NULL [18:41:26.322] } [18:41:26.322] options(future.plan = NULL) [18:41:26.322] if (is.na(NA_character_)) [18:41:26.322] Sys.unsetenv("R_FUTURE_PLAN") [18:41:26.322] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:26.322] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:26.322] .init = FALSE) [18:41:26.322] } [18:41:26.322] } [18:41:26.322] } [18:41:26.322] }) [18:41:26.322] if (TRUE) { [18:41:26.322] base::sink(type = "output", split = FALSE) [18:41:26.322] if (TRUE) { [18:41:26.322] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:26.322] } [18:41:26.322] else { [18:41:26.322] ...future.result["stdout"] <- base::list(NULL) [18:41:26.322] } [18:41:26.322] base::close(...future.stdout) [18:41:26.322] ...future.stdout <- NULL [18:41:26.322] } [18:41:26.322] ...future.result$conditions <- ...future.conditions [18:41:26.322] ...future.result$finished <- base::Sys.time() [18:41:26.322] ...future.result [18:41:26.322] } [18:41:26.327] Exporting 6 global objects (59.65 KiB) to cluster node #1 ... [18:41:26.327] Exporting '...future.FUN' (399 bytes) to cluster node #1 ... [18:41:26.328] Exporting '...future.FUN' (399 bytes) to cluster node #1 ... DONE [18:41:26.328] Exporting 'a' (39 bytes) to cluster node #1 ... [18:41:26.328] Exporting 'a' (39 bytes) to cluster node #1 ... DONE [18:41:26.329] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:26.329] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:26.329] Exporting '...future.elements_ii' (58.62 KiB) to cluster node #1 ... [18:41:26.330] Exporting '...future.elements_ii' (58.62 KiB) to cluster node #1 ... DONE [18:41:26.330] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:26.331] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:26.331] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:26.331] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:26.331] Exporting 6 global objects (59.65 KiB) to cluster node #1 ... DONE [18:41:26.332] MultisessionFuture started [18:41:26.332] - Launch lazy future ... done [18:41:26.332] run() for 'MultisessionFuture' ... done [18:41:26.332] Created future: [18:41:26.359] receiveMessageFromWorker() for ClusterFuture ... [18:41:26.360] - Validating connection of MultisessionFuture [18:41:26.360] - received message: FutureResult [18:41:26.361] - Received FutureResult [18:41:26.361] - Erased future from FutureRegistry [18:41:26.361] result() for ClusterFuture ... [18:41:26.361] - result already collected: FutureResult [18:41:26.361] result() for ClusterFuture ... done [18:41:26.361] receiveMessageFromWorker() for ClusterFuture ... done [18:41:26.333] MultisessionFuture: [18:41:26.333] Label: 'future_lapply-1' [18:41:26.333] Expression: [18:41:26.333] { [18:41:26.333] do.call(function(...) { [18:41:26.333] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:26.333] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:26.333] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:26.333] on.exit(options(oopts), add = TRUE) [18:41:26.333] } [18:41:26.333] { [18:41:26.333] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:26.333] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:26.333] ...future.FUN(...future.X_jj, ...) [18:41:26.333] }) [18:41:26.333] } [18:41:26.333] }, args = future.call.arguments) [18:41:26.333] } [18:41:26.333] Lazy evaluation: FALSE [18:41:26.333] Asynchronous evaluation: TRUE [18:41:26.333] Local evaluation: TRUE [18:41:26.333] Environment: R_GlobalEnv [18:41:26.333] Capture standard output: TRUE [18:41:26.333] Capture condition classes: 'condition' (excluding 'nothing') [18:41:26.333] Globals: 6 objects totaling 59.20 KiB (function '...future.FUN' of 399 bytes, numeric 'a' of 39 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 58.62 KiB, NULL '...future.seeds_ii' of 27 bytes, ...) [18:41:26.333] Packages: [18:41:26.333] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:26.333] Resolved: TRUE [18:41:26.333] Value: [18:41:26.333] Conditions captured: [18:41:26.333] Early signaling: FALSE [18:41:26.333] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:26.333] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:26.362] Chunk #1 of 2 ... DONE [18:41:26.362] Chunk #2 of 2 ... [18:41:26.363] - Finding globals in 'X' for chunk #2 ... [18:41:26.363] getGlobalsAndPackages() ... [18:41:26.363] Searching for globals... [18:41:26.367] [18:41:26.367] Searching for globals ... DONE [18:41:26.367] - globals: [0] [18:41:26.367] getGlobalsAndPackages() ... DONE [18:41:26.367] + additional globals found: [n=0] [18:41:26.367] + additional namespaces needed: [n=0] [18:41:26.368] - Finding globals in 'X' for chunk #2 ... DONE [18:41:26.368] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:26.368] - seeds: [18:41:26.368] - All globals exported: [n=6] '...future.FUN', 'a', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:26.368] getGlobalsAndPackages() ... [18:41:26.368] - globals passed as-is: [6] '...future.FUN', 'a', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:26.369] Resolving globals: FALSE [18:41:26.369] Tweak future expression to call with '...' arguments ... [18:41:26.369] { [18:41:26.369] do.call(function(...) { [18:41:26.369] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:26.369] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:26.369] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:26.369] on.exit(options(oopts), add = TRUE) [18:41:26.369] } [18:41:26.369] { [18:41:26.369] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:26.369] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:26.369] ...future.FUN(...future.X_jj, ...) [18:41:26.369] }) [18:41:26.369] } [18:41:26.369] }, args = future.call.arguments) [18:41:26.369] } [18:41:26.369] Tweak future expression to call with '...' arguments ... DONE [18:41:26.370] - globals: [6] '...future.FUN', 'a', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:26.370] [18:41:26.370] getGlobalsAndPackages() ... DONE [18:41:26.371] run() for 'Future' ... [18:41:26.371] - state: 'created' [18:41:26.371] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:26.386] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:26.387] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:26.387] - Field: 'node' [18:41:26.387] - Field: 'label' [18:41:26.387] - Field: 'local' [18:41:26.387] - Field: 'owner' [18:41:26.388] - Field: 'envir' [18:41:26.388] - Field: 'workers' [18:41:26.388] - Field: 'packages' [18:41:26.388] - Field: 'gc' [18:41:26.388] - Field: 'conditions' [18:41:26.388] - Field: 'persistent' [18:41:26.389] - Field: 'expr' [18:41:26.389] - Field: 'uuid' [18:41:26.389] - Field: 'seed' [18:41:26.389] - Field: 'version' [18:41:26.389] - Field: 'result' [18:41:26.389] - Field: 'asynchronous' [18:41:26.390] - Field: 'calls' [18:41:26.390] - Field: 'globals' [18:41:26.390] - Field: 'stdout' [18:41:26.390] - Field: 'earlySignal' [18:41:26.390] - Field: 'lazy' [18:41:26.390] - Field: 'state' [18:41:26.391] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:26.391] - Launch lazy future ... [18:41:26.391] Packages needed by the future expression (n = 0): [18:41:26.391] Packages needed by future strategies (n = 0): [18:41:26.392] { [18:41:26.392] { [18:41:26.392] { [18:41:26.392] ...future.startTime <- base::Sys.time() [18:41:26.392] { [18:41:26.392] { [18:41:26.392] { [18:41:26.392] { [18:41:26.392] base::local({ [18:41:26.392] has_future <- base::requireNamespace("future", [18:41:26.392] quietly = TRUE) [18:41:26.392] if (has_future) { [18:41:26.392] ns <- base::getNamespace("future") [18:41:26.392] version <- ns[[".package"]][["version"]] [18:41:26.392] if (is.null(version)) [18:41:26.392] version <- utils::packageVersion("future") [18:41:26.392] } [18:41:26.392] else { [18:41:26.392] version <- NULL [18:41:26.392] } [18:41:26.392] if (!has_future || version < "1.8.0") { [18:41:26.392] info <- base::c(r_version = base::gsub("R version ", [18:41:26.392] "", base::R.version$version.string), [18:41:26.392] platform = base::sprintf("%s (%s-bit)", [18:41:26.392] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:26.392] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:26.392] "release", "version")], collapse = " "), [18:41:26.392] hostname = base::Sys.info()[["nodename"]]) [18:41:26.392] info <- base::sprintf("%s: %s", base::names(info), [18:41:26.392] info) [18:41:26.392] info <- base::paste(info, collapse = "; ") [18:41:26.392] if (!has_future) { [18:41:26.392] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:26.392] info) [18:41:26.392] } [18:41:26.392] else { [18:41:26.392] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:26.392] info, version) [18:41:26.392] } [18:41:26.392] base::stop(msg) [18:41:26.392] } [18:41:26.392] }) [18:41:26.392] } [18:41:26.392] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:26.392] base::options(mc.cores = 1L) [18:41:26.392] } [18:41:26.392] ...future.strategy.old <- future::plan("list") [18:41:26.392] options(future.plan = NULL) [18:41:26.392] Sys.unsetenv("R_FUTURE_PLAN") [18:41:26.392] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:26.392] } [18:41:26.392] ...future.workdir <- getwd() [18:41:26.392] } [18:41:26.392] ...future.oldOptions <- base::as.list(base::.Options) [18:41:26.392] ...future.oldEnvVars <- base::Sys.getenv() [18:41:26.392] } [18:41:26.392] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:26.392] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:26.392] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:26.392] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:26.392] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:26.392] future.stdout.windows.reencode = NULL, width = 80L) [18:41:26.392] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:26.392] base::names(...future.oldOptions)) [18:41:26.392] } [18:41:26.392] if (FALSE) { [18:41:26.392] } [18:41:26.392] else { [18:41:26.392] if (TRUE) { [18:41:26.392] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:26.392] open = "w") [18:41:26.392] } [18:41:26.392] else { [18:41:26.392] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:26.392] windows = "NUL", "/dev/null"), open = "w") [18:41:26.392] } [18:41:26.392] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:26.392] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:26.392] base::sink(type = "output", split = FALSE) [18:41:26.392] base::close(...future.stdout) [18:41:26.392] }, add = TRUE) [18:41:26.392] } [18:41:26.392] ...future.frame <- base::sys.nframe() [18:41:26.392] ...future.conditions <- base::list() [18:41:26.392] ...future.rng <- base::globalenv()$.Random.seed [18:41:26.392] if (FALSE) { [18:41:26.392] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:26.392] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:26.392] } [18:41:26.392] ...future.result <- base::tryCatch({ [18:41:26.392] base::withCallingHandlers({ [18:41:26.392] ...future.value <- base::withVisible(base::local({ [18:41:26.392] ...future.makeSendCondition <- base::local({ [18:41:26.392] sendCondition <- NULL [18:41:26.392] function(frame = 1L) { [18:41:26.392] if (is.function(sendCondition)) [18:41:26.392] return(sendCondition) [18:41:26.392] ns <- getNamespace("parallel") [18:41:26.392] if (exists("sendData", mode = "function", [18:41:26.392] envir = ns)) { [18:41:26.392] parallel_sendData <- get("sendData", mode = "function", [18:41:26.392] envir = ns) [18:41:26.392] envir <- sys.frame(frame) [18:41:26.392] master <- NULL [18:41:26.392] while (!identical(envir, .GlobalEnv) && [18:41:26.392] !identical(envir, emptyenv())) { [18:41:26.392] if (exists("master", mode = "list", envir = envir, [18:41:26.392] inherits = FALSE)) { [18:41:26.392] master <- get("master", mode = "list", [18:41:26.392] envir = envir, inherits = FALSE) [18:41:26.392] if (inherits(master, c("SOCKnode", [18:41:26.392] "SOCK0node"))) { [18:41:26.392] sendCondition <<- function(cond) { [18:41:26.392] data <- list(type = "VALUE", value = cond, [18:41:26.392] success = TRUE) [18:41:26.392] parallel_sendData(master, data) [18:41:26.392] } [18:41:26.392] return(sendCondition) [18:41:26.392] } [18:41:26.392] } [18:41:26.392] frame <- frame + 1L [18:41:26.392] envir <- sys.frame(frame) [18:41:26.392] } [18:41:26.392] } [18:41:26.392] sendCondition <<- function(cond) NULL [18:41:26.392] } [18:41:26.392] }) [18:41:26.392] withCallingHandlers({ [18:41:26.392] { [18:41:26.392] do.call(function(...) { [18:41:26.392] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:26.392] if (!identical(...future.globals.maxSize.org, [18:41:26.392] ...future.globals.maxSize)) { [18:41:26.392] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:26.392] on.exit(options(oopts), add = TRUE) [18:41:26.392] } [18:41:26.392] { [18:41:26.392] lapply(seq_along(...future.elements_ii), [18:41:26.392] FUN = function(jj) { [18:41:26.392] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:26.392] ...future.FUN(...future.X_jj, ...) [18:41:26.392] }) [18:41:26.392] } [18:41:26.392] }, args = future.call.arguments) [18:41:26.392] } [18:41:26.392] }, immediateCondition = function(cond) { [18:41:26.392] sendCondition <- ...future.makeSendCondition() [18:41:26.392] sendCondition(cond) [18:41:26.392] muffleCondition <- function (cond, pattern = "^muffle") [18:41:26.392] { [18:41:26.392] inherits <- base::inherits [18:41:26.392] invokeRestart <- base::invokeRestart [18:41:26.392] is.null <- base::is.null [18:41:26.392] muffled <- FALSE [18:41:26.392] if (inherits(cond, "message")) { [18:41:26.392] muffled <- grepl(pattern, "muffleMessage") [18:41:26.392] if (muffled) [18:41:26.392] invokeRestart("muffleMessage") [18:41:26.392] } [18:41:26.392] else if (inherits(cond, "warning")) { [18:41:26.392] muffled <- grepl(pattern, "muffleWarning") [18:41:26.392] if (muffled) [18:41:26.392] invokeRestart("muffleWarning") [18:41:26.392] } [18:41:26.392] else if (inherits(cond, "condition")) { [18:41:26.392] if (!is.null(pattern)) { [18:41:26.392] computeRestarts <- base::computeRestarts [18:41:26.392] grepl <- base::grepl [18:41:26.392] restarts <- computeRestarts(cond) [18:41:26.392] for (restart in restarts) { [18:41:26.392] name <- restart$name [18:41:26.392] if (is.null(name)) [18:41:26.392] next [18:41:26.392] if (!grepl(pattern, name)) [18:41:26.392] next [18:41:26.392] invokeRestart(restart) [18:41:26.392] muffled <- TRUE [18:41:26.392] break [18:41:26.392] } [18:41:26.392] } [18:41:26.392] } [18:41:26.392] invisible(muffled) [18:41:26.392] } [18:41:26.392] muffleCondition(cond) [18:41:26.392] }) [18:41:26.392] })) [18:41:26.392] future::FutureResult(value = ...future.value$value, [18:41:26.392] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:26.392] ...future.rng), globalenv = if (FALSE) [18:41:26.392] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:26.392] ...future.globalenv.names)) [18:41:26.392] else NULL, started = ...future.startTime, version = "1.8") [18:41:26.392] }, condition = base::local({ [18:41:26.392] c <- base::c [18:41:26.392] inherits <- base::inherits [18:41:26.392] invokeRestart <- base::invokeRestart [18:41:26.392] length <- base::length [18:41:26.392] list <- base::list [18:41:26.392] seq.int <- base::seq.int [18:41:26.392] signalCondition <- base::signalCondition [18:41:26.392] sys.calls <- base::sys.calls [18:41:26.392] `[[` <- base::`[[` [18:41:26.392] `+` <- base::`+` [18:41:26.392] `<<-` <- base::`<<-` [18:41:26.392] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:26.392] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:26.392] 3L)] [18:41:26.392] } [18:41:26.392] function(cond) { [18:41:26.392] is_error <- inherits(cond, "error") [18:41:26.392] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:26.392] NULL) [18:41:26.392] if (is_error) { [18:41:26.392] sessionInformation <- function() { [18:41:26.392] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:26.392] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:26.392] search = base::search(), system = base::Sys.info()) [18:41:26.392] } [18:41:26.392] ...future.conditions[[length(...future.conditions) + [18:41:26.392] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:26.392] cond$call), session = sessionInformation(), [18:41:26.392] timestamp = base::Sys.time(), signaled = 0L) [18:41:26.392] signalCondition(cond) [18:41:26.392] } [18:41:26.392] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:26.392] "immediateCondition"))) { [18:41:26.392] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:26.392] ...future.conditions[[length(...future.conditions) + [18:41:26.392] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:26.392] if (TRUE && !signal) { [18:41:26.392] muffleCondition <- function (cond, pattern = "^muffle") [18:41:26.392] { [18:41:26.392] inherits <- base::inherits [18:41:26.392] invokeRestart <- base::invokeRestart [18:41:26.392] is.null <- base::is.null [18:41:26.392] muffled <- FALSE [18:41:26.392] if (inherits(cond, "message")) { [18:41:26.392] muffled <- grepl(pattern, "muffleMessage") [18:41:26.392] if (muffled) [18:41:26.392] invokeRestart("muffleMessage") [18:41:26.392] } [18:41:26.392] else if (inherits(cond, "warning")) { [18:41:26.392] muffled <- grepl(pattern, "muffleWarning") [18:41:26.392] if (muffled) [18:41:26.392] invokeRestart("muffleWarning") [18:41:26.392] } [18:41:26.392] else if (inherits(cond, "condition")) { [18:41:26.392] if (!is.null(pattern)) { [18:41:26.392] computeRestarts <- base::computeRestarts [18:41:26.392] grepl <- base::grepl [18:41:26.392] restarts <- computeRestarts(cond) [18:41:26.392] for (restart in restarts) { [18:41:26.392] name <- restart$name [18:41:26.392] if (is.null(name)) [18:41:26.392] next [18:41:26.392] if (!grepl(pattern, name)) [18:41:26.392] next [18:41:26.392] invokeRestart(restart) [18:41:26.392] muffled <- TRUE [18:41:26.392] break [18:41:26.392] } [18:41:26.392] } [18:41:26.392] } [18:41:26.392] invisible(muffled) [18:41:26.392] } [18:41:26.392] muffleCondition(cond, pattern = "^muffle") [18:41:26.392] } [18:41:26.392] } [18:41:26.392] else { [18:41:26.392] if (TRUE) { [18:41:26.392] muffleCondition <- function (cond, pattern = "^muffle") [18:41:26.392] { [18:41:26.392] inherits <- base::inherits [18:41:26.392] invokeRestart <- base::invokeRestart [18:41:26.392] is.null <- base::is.null [18:41:26.392] muffled <- FALSE [18:41:26.392] if (inherits(cond, "message")) { [18:41:26.392] muffled <- grepl(pattern, "muffleMessage") [18:41:26.392] if (muffled) [18:41:26.392] invokeRestart("muffleMessage") [18:41:26.392] } [18:41:26.392] else if (inherits(cond, "warning")) { [18:41:26.392] muffled <- grepl(pattern, "muffleWarning") [18:41:26.392] if (muffled) [18:41:26.392] invokeRestart("muffleWarning") [18:41:26.392] } [18:41:26.392] else if (inherits(cond, "condition")) { [18:41:26.392] if (!is.null(pattern)) { [18:41:26.392] computeRestarts <- base::computeRestarts [18:41:26.392] grepl <- base::grepl [18:41:26.392] restarts <- computeRestarts(cond) [18:41:26.392] for (restart in restarts) { [18:41:26.392] name <- restart$name [18:41:26.392] if (is.null(name)) [18:41:26.392] next [18:41:26.392] if (!grepl(pattern, name)) [18:41:26.392] next [18:41:26.392] invokeRestart(restart) [18:41:26.392] muffled <- TRUE [18:41:26.392] break [18:41:26.392] } [18:41:26.392] } [18:41:26.392] } [18:41:26.392] invisible(muffled) [18:41:26.392] } [18:41:26.392] muffleCondition(cond, pattern = "^muffle") [18:41:26.392] } [18:41:26.392] } [18:41:26.392] } [18:41:26.392] })) [18:41:26.392] }, error = function(ex) { [18:41:26.392] base::structure(base::list(value = NULL, visible = NULL, [18:41:26.392] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:26.392] ...future.rng), started = ...future.startTime, [18:41:26.392] finished = Sys.time(), session_uuid = NA_character_, [18:41:26.392] version = "1.8"), class = "FutureResult") [18:41:26.392] }, finally = { [18:41:26.392] if (!identical(...future.workdir, getwd())) [18:41:26.392] setwd(...future.workdir) [18:41:26.392] { [18:41:26.392] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:26.392] ...future.oldOptions$nwarnings <- NULL [18:41:26.392] } [18:41:26.392] base::options(...future.oldOptions) [18:41:26.392] if (.Platform$OS.type == "windows") { [18:41:26.392] old_names <- names(...future.oldEnvVars) [18:41:26.392] envs <- base::Sys.getenv() [18:41:26.392] names <- names(envs) [18:41:26.392] common <- intersect(names, old_names) [18:41:26.392] added <- setdiff(names, old_names) [18:41:26.392] removed <- setdiff(old_names, names) [18:41:26.392] changed <- common[...future.oldEnvVars[common] != [18:41:26.392] envs[common]] [18:41:26.392] NAMES <- toupper(changed) [18:41:26.392] args <- list() [18:41:26.392] for (kk in seq_along(NAMES)) { [18:41:26.392] name <- changed[[kk]] [18:41:26.392] NAME <- NAMES[[kk]] [18:41:26.392] if (name != NAME && is.element(NAME, old_names)) [18:41:26.392] next [18:41:26.392] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:26.392] } [18:41:26.392] NAMES <- toupper(added) [18:41:26.392] for (kk in seq_along(NAMES)) { [18:41:26.392] name <- added[[kk]] [18:41:26.392] NAME <- NAMES[[kk]] [18:41:26.392] if (name != NAME && is.element(NAME, old_names)) [18:41:26.392] next [18:41:26.392] args[[name]] <- "" [18:41:26.392] } [18:41:26.392] NAMES <- toupper(removed) [18:41:26.392] for (kk in seq_along(NAMES)) { [18:41:26.392] name <- removed[[kk]] [18:41:26.392] NAME <- NAMES[[kk]] [18:41:26.392] if (name != NAME && is.element(NAME, old_names)) [18:41:26.392] next [18:41:26.392] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:26.392] } [18:41:26.392] if (length(args) > 0) [18:41:26.392] base::do.call(base::Sys.setenv, args = args) [18:41:26.392] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:26.392] } [18:41:26.392] else { [18:41:26.392] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:26.392] } [18:41:26.392] { [18:41:26.392] if (base::length(...future.futureOptionsAdded) > [18:41:26.392] 0L) { [18:41:26.392] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:26.392] base::names(opts) <- ...future.futureOptionsAdded [18:41:26.392] base::options(opts) [18:41:26.392] } [18:41:26.392] { [18:41:26.392] { [18:41:26.392] base::options(mc.cores = ...future.mc.cores.old) [18:41:26.392] NULL [18:41:26.392] } [18:41:26.392] options(future.plan = NULL) [18:41:26.392] if (is.na(NA_character_)) [18:41:26.392] Sys.unsetenv("R_FUTURE_PLAN") [18:41:26.392] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:26.392] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:26.392] .init = FALSE) [18:41:26.392] } [18:41:26.392] } [18:41:26.392] } [18:41:26.392] }) [18:41:26.392] if (TRUE) { [18:41:26.392] base::sink(type = "output", split = FALSE) [18:41:26.392] if (TRUE) { [18:41:26.392] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:26.392] } [18:41:26.392] else { [18:41:26.392] ...future.result["stdout"] <- base::list(NULL) [18:41:26.392] } [18:41:26.392] base::close(...future.stdout) [18:41:26.392] ...future.stdout <- NULL [18:41:26.392] } [18:41:26.392] ...future.result$conditions <- ...future.conditions [18:41:26.392] ...future.result$finished <- base::Sys.time() [18:41:26.392] ...future.result [18:41:26.392] } [18:41:26.397] Exporting 6 global objects (59.65 KiB) to cluster node #1 ... [18:41:26.398] Exporting '...future.FUN' (399 bytes) to cluster node #1 ... [18:41:26.398] Exporting '...future.FUN' (399 bytes) to cluster node #1 ... DONE [18:41:26.398] Exporting 'a' (39 bytes) to cluster node #1 ... [18:41:26.399] Exporting 'a' (39 bytes) to cluster node #1 ... DONE [18:41:26.399] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:26.399] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:26.400] Exporting '...future.elements_ii' (58.62 KiB) to cluster node #1 ... [18:41:26.400] Exporting '...future.elements_ii' (58.62 KiB) to cluster node #1 ... DONE [18:41:26.401] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:26.401] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:26.401] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:26.401] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:26.402] Exporting 6 global objects (59.65 KiB) to cluster node #1 ... DONE [18:41:26.402] MultisessionFuture started [18:41:26.402] - Launch lazy future ... done [18:41:26.403] run() for 'MultisessionFuture' ... done [18:41:26.403] Created future: [18:41:26.428] receiveMessageFromWorker() for ClusterFuture ... [18:41:26.428] - Validating connection of MultisessionFuture [18:41:26.428] - received message: FutureResult [18:41:26.429] - Received FutureResult [18:41:26.429] - Erased future from FutureRegistry [18:41:26.429] result() for ClusterFuture ... [18:41:26.429] - result already collected: FutureResult [18:41:26.429] result() for ClusterFuture ... done [18:41:26.430] receiveMessageFromWorker() for ClusterFuture ... done [18:41:26.403] MultisessionFuture: [18:41:26.403] Label: 'future_lapply-2' [18:41:26.403] Expression: [18:41:26.403] { [18:41:26.403] do.call(function(...) { [18:41:26.403] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:26.403] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:26.403] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:26.403] on.exit(options(oopts), add = TRUE) [18:41:26.403] } [18:41:26.403] { [18:41:26.403] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:26.403] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:26.403] ...future.FUN(...future.X_jj, ...) [18:41:26.403] }) [18:41:26.403] } [18:41:26.403] }, args = future.call.arguments) [18:41:26.403] } [18:41:26.403] Lazy evaluation: FALSE [18:41:26.403] Asynchronous evaluation: TRUE [18:41:26.403] Local evaluation: TRUE [18:41:26.403] Environment: R_GlobalEnv [18:41:26.403] Capture standard output: TRUE [18:41:26.403] Capture condition classes: 'condition' (excluding 'nothing') [18:41:26.403] Globals: 6 objects totaling 59.20 KiB (function '...future.FUN' of 399 bytes, numeric 'a' of 39 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 58.62 KiB, NULL '...future.seeds_ii' of 27 bytes, ...) [18:41:26.403] Packages: [18:41:26.403] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:26.403] Resolved: TRUE [18:41:26.403] Value: [18:41:26.403] Conditions captured: [18:41:26.403] Early signaling: FALSE [18:41:26.403] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:26.403] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:26.430] Chunk #2 of 2 ... DONE [18:41:26.430] Launching 2 futures (chunks) ... DONE [18:41:26.430] Resolving 2 futures (chunks) ... [18:41:26.430] resolve() on list ... [18:41:26.431] recursive: 0 [18:41:26.431] length: 2 [18:41:26.431] [18:41:26.431] Future #1 [18:41:26.431] result() for ClusterFuture ... [18:41:26.431] - result already collected: FutureResult [18:41:26.432] result() for ClusterFuture ... done [18:41:26.432] result() for ClusterFuture ... [18:41:26.432] - result already collected: FutureResult [18:41:26.432] result() for ClusterFuture ... done [18:41:26.432] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:26.432] - nx: 2 [18:41:26.433] - relay: TRUE [18:41:26.433] - stdout: TRUE [18:41:26.433] - signal: TRUE [18:41:26.433] - resignal: FALSE [18:41:26.433] - force: TRUE [18:41:26.433] - relayed: [n=2] FALSE, FALSE [18:41:26.433] - queued futures: [n=2] FALSE, FALSE [18:41:26.434] - until=1 [18:41:26.434] - relaying element #1 [18:41:26.434] result() for ClusterFuture ... [18:41:26.434] - result already collected: FutureResult [18:41:26.434] result() for ClusterFuture ... done [18:41:26.434] result() for ClusterFuture ... [18:41:26.435] - result already collected: FutureResult [18:41:26.435] result() for ClusterFuture ... done [18:41:26.435] result() for ClusterFuture ... [18:41:26.435] - result already collected: FutureResult [18:41:26.435] result() for ClusterFuture ... done [18:41:26.435] result() for ClusterFuture ... [18:41:26.436] - result already collected: FutureResult [18:41:26.436] result() for ClusterFuture ... done [18:41:26.436] - relayed: [n=2] TRUE, FALSE [18:41:26.436] - queued futures: [n=2] TRUE, FALSE [18:41:26.436] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:26.436] length: 1 (resolved future 1) [18:41:26.437] Future #2 [18:41:26.437] result() for ClusterFuture ... [18:41:26.437] - result already collected: FutureResult [18:41:26.437] result() for ClusterFuture ... done [18:41:26.437] result() for ClusterFuture ... [18:41:26.437] - result already collected: FutureResult [18:41:26.438] result() for ClusterFuture ... done [18:41:26.438] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:26.438] - nx: 2 [18:41:26.438] - relay: TRUE [18:41:26.438] - stdout: TRUE [18:41:26.438] - signal: TRUE [18:41:26.439] - resignal: FALSE [18:41:26.439] - force: TRUE [18:41:26.439] - relayed: [n=2] TRUE, FALSE [18:41:26.439] - queued futures: [n=2] TRUE, FALSE [18:41:26.439] - until=2 [18:41:26.439] - relaying element #2 [18:41:26.440] result() for ClusterFuture ... [18:41:26.440] - result already collected: FutureResult [18:41:26.440] result() for ClusterFuture ... done [18:41:26.440] result() for ClusterFuture ... [18:41:26.440] - result already collected: FutureResult [18:41:26.440] result() for ClusterFuture ... done [18:41:26.441] result() for ClusterFuture ... [18:41:26.441] - result already collected: FutureResult [18:41:26.441] result() for ClusterFuture ... done [18:41:26.441] result() for ClusterFuture ... [18:41:26.441] - result already collected: FutureResult [18:41:26.441] result() for ClusterFuture ... done [18:41:26.441] - relayed: [n=2] TRUE, TRUE [18:41:26.442] - queued futures: [n=2] TRUE, TRUE [18:41:26.442] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:26.442] length: 0 (resolved future 2) [18:41:26.442] Relaying remaining futures [18:41:26.442] signalConditionsASAP(NULL, pos=0) ... [18:41:26.442] - nx: 2 [18:41:26.443] - relay: TRUE [18:41:26.443] - stdout: TRUE [18:41:26.443] - signal: TRUE [18:41:26.443] - resignal: FALSE [18:41:26.443] - force: TRUE [18:41:26.443] - relayed: [n=2] TRUE, TRUE [18:41:26.444] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:26.444] - relayed: [n=2] TRUE, TRUE [18:41:26.444] - queued futures: [n=2] TRUE, TRUE [18:41:26.444] signalConditionsASAP(NULL, pos=0) ... done [18:41:26.444] resolve() on list ... DONE [18:41:26.444] result() for ClusterFuture ... [18:41:26.445] - result already collected: FutureResult [18:41:26.445] result() for ClusterFuture ... done [18:41:26.445] result() for ClusterFuture ... [18:41:26.445] - result already collected: FutureResult [18:41:26.445] result() for ClusterFuture ... done [18:41:26.446] result() for ClusterFuture ... [18:41:26.446] - result already collected: FutureResult [18:41:26.446] result() for ClusterFuture ... done [18:41:26.446] result() for ClusterFuture ... [18:41:26.446] - result already collected: FutureResult [18:41:26.446] result() for ClusterFuture ... done [18:41:26.447] - Number of value chunks collected: 2 [18:41:26.447] Resolving 2 futures (chunks) ... DONE [18:41:26.447] Reducing values from 2 chunks ... [18:41:26.447] - Number of values collected after concatenation: 10000 [18:41:26.447] - Number of values expected: 10000 [18:41:26.448] Reducing values from 2 chunks ... DONE [18:41:26.448] future_lapply() ... DONE - future_lapply(x, FUN = table, ...) ... [18:41:26.449] future_lapply() ... [18:41:26.499] Number of chunks: 2 [18:41:26.499] getGlobalsAndPackagesXApply() ... [18:41:26.499] - future.globals: TRUE [18:41:26.499] getGlobalsAndPackages() ... [18:41:26.499] Searching for globals... [18:41:26.547] - globals found: [59] 'FUN', 'if', '==', 'c', 'list.names', '{', '<-', '[', 'as.list', 'substitute', '-', '&&', 'length', 'is.list', '!', 'is.null', 'names', 'return', 'seq_along', 'vapply', 'switch', '+', 'is.symbol', 'as.character', 'deparse', '[<-', 'missing', 'match', 'match.arg', '!=', 'warning', 'list', '[[', 'paste', 'stop', 'integer', 'for', 'is.factor', 'anyNA', 'options', 'on.exit', 'factor', '(', '||', 'levels', 'as.integer', 'which', 'is.na', 'is.na<-', '>', 'prod', '$', '.Machine', '*', 'names<-', 'array', 'tabulate', 'class', 'class<-' [18:41:26.547] Searching for globals ... DONE [18:41:26.548] Resolving globals: FALSE [18:41:26.550] The total size of the 1 globals is 31.30 KiB (32048 bytes) [18:41:26.550] The total size of the 1 globals exported for future expression ('FUN()') is 31.30 KiB.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (31.30 KiB of class 'function') [18:41:26.551] - globals: [1] 'FUN' [18:41:26.551] [18:41:26.551] getGlobalsAndPackages() ... DONE [18:41:26.551] - globals found/used: [n=1] 'FUN' [18:41:26.551] - needed namespaces: [n=0] [18:41:26.552] Finding globals ... DONE [18:41:26.552] - use_args: TRUE [18:41:26.552] - Getting '...' globals ... [18:41:26.552] resolve() on list ... [18:41:26.552] recursive: 0 [18:41:26.553] length: 1 [18:41:26.553] elements: '...' [18:41:26.553] length: 0 (resolved future 1) [18:41:26.553] resolve() on list ... DONE [18:41:26.553] - '...' content: [n=0] [18:41:26.553] List of 1 [18:41:26.553] $ ...: list() [18:41:26.553] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:26.553] - attr(*, "where")=List of 1 [18:41:26.553] ..$ ...: [18:41:26.553] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:26.553] - attr(*, "resolved")= logi TRUE [18:41:26.553] - attr(*, "total_size")= num NA [18:41:26.557] - Getting '...' globals ... DONE [18:41:26.557] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:26.557] List of 2 [18:41:26.557] $ ...future.FUN:function (..., exclude = if (useNA == "no") c(NA, NaN), useNA = c("no", [18:41:26.557] "ifany", "always"), dnn = list.names(...), deparse.level = 1) [18:41:26.557] $ ... : list() [18:41:26.557] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:26.557] - attr(*, "where")=List of 2 [18:41:26.557] ..$ ...future.FUN: [18:41:26.557] ..$ ... : [18:41:26.557] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:26.557] - attr(*, "resolved")= logi FALSE [18:41:26.557] - attr(*, "total_size")= int 67153 [18:41:26.560] Packages to be attached in all futures: [n=0] [18:41:26.560] getGlobalsAndPackagesXApply() ... DONE [18:41:26.561] Number of futures (= number of chunks): 2 [18:41:26.561] Launching 2 futures (chunks) ... [18:41:26.561] Chunk #1 of 2 ... [18:41:26.561] - Finding globals in 'X' for chunk #1 ... [18:41:26.561] getGlobalsAndPackages() ... [18:41:26.562] Searching for globals... [18:41:26.562] [18:41:26.562] Searching for globals ... DONE [18:41:26.562] - globals: [0] [18:41:26.562] getGlobalsAndPackages() ... DONE [18:41:26.562] + additional globals found: [n=0] [18:41:26.563] + additional namespaces needed: [n=0] [18:41:26.563] - Finding globals in 'X' for chunk #1 ... DONE [18:41:26.563] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:26.563] - seeds: [18:41:26.563] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:26.563] getGlobalsAndPackages() ... [18:41:26.563] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:26.564] Resolving globals: FALSE [18:41:26.564] Tweak future expression to call with '...' arguments ... [18:41:26.564] { [18:41:26.564] do.call(function(...) { [18:41:26.564] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:26.564] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:26.564] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:26.564] on.exit(options(oopts), add = TRUE) [18:41:26.564] } [18:41:26.564] { [18:41:26.564] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:26.564] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:26.564] ...future.FUN(...future.X_jj, ...) [18:41:26.564] }) [18:41:26.564] } [18:41:26.564] }, args = future.call.arguments) [18:41:26.564] } [18:41:26.564] Tweak future expression to call with '...' arguments ... DONE [18:41:26.565] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:26.565] [18:41:26.565] getGlobalsAndPackages() ... DONE [18:41:26.566] run() for 'Future' ... [18:41:26.566] - state: 'created' [18:41:26.566] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:26.581] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:26.581] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:26.582] - Field: 'node' [18:41:26.582] - Field: 'label' [18:41:26.582] - Field: 'local' [18:41:26.582] - Field: 'owner' [18:41:26.582] - Field: 'envir' [18:41:26.582] - Field: 'workers' [18:41:26.583] - Field: 'packages' [18:41:26.583] - Field: 'gc' [18:41:26.583] - Field: 'conditions' [18:41:26.583] - Field: 'persistent' [18:41:26.583] - Field: 'expr' [18:41:26.583] - Field: 'uuid' [18:41:26.584] - Field: 'seed' [18:41:26.584] - Field: 'version' [18:41:26.584] - Field: 'result' [18:41:26.584] - Field: 'asynchronous' [18:41:26.584] - Field: 'calls' [18:41:26.584] - Field: 'globals' [18:41:26.585] - Field: 'stdout' [18:41:26.585] - Field: 'earlySignal' [18:41:26.585] - Field: 'lazy' [18:41:26.585] - Field: 'state' [18:41:26.585] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:26.585] - Launch lazy future ... [18:41:26.586] Packages needed by the future expression (n = 0): [18:41:26.586] Packages needed by future strategies (n = 0): [18:41:26.586] { [18:41:26.586] { [18:41:26.586] { [18:41:26.586] ...future.startTime <- base::Sys.time() [18:41:26.586] { [18:41:26.586] { [18:41:26.586] { [18:41:26.586] { [18:41:26.586] base::local({ [18:41:26.586] has_future <- base::requireNamespace("future", [18:41:26.586] quietly = TRUE) [18:41:26.586] if (has_future) { [18:41:26.586] ns <- base::getNamespace("future") [18:41:26.586] version <- ns[[".package"]][["version"]] [18:41:26.586] if (is.null(version)) [18:41:26.586] version <- utils::packageVersion("future") [18:41:26.586] } [18:41:26.586] else { [18:41:26.586] version <- NULL [18:41:26.586] } [18:41:26.586] if (!has_future || version < "1.8.0") { [18:41:26.586] info <- base::c(r_version = base::gsub("R version ", [18:41:26.586] "", base::R.version$version.string), [18:41:26.586] platform = base::sprintf("%s (%s-bit)", [18:41:26.586] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:26.586] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:26.586] "release", "version")], collapse = " "), [18:41:26.586] hostname = base::Sys.info()[["nodename"]]) [18:41:26.586] info <- base::sprintf("%s: %s", base::names(info), [18:41:26.586] info) [18:41:26.586] info <- base::paste(info, collapse = "; ") [18:41:26.586] if (!has_future) { [18:41:26.586] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:26.586] info) [18:41:26.586] } [18:41:26.586] else { [18:41:26.586] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:26.586] info, version) [18:41:26.586] } [18:41:26.586] base::stop(msg) [18:41:26.586] } [18:41:26.586] }) [18:41:26.586] } [18:41:26.586] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:26.586] base::options(mc.cores = 1L) [18:41:26.586] } [18:41:26.586] ...future.strategy.old <- future::plan("list") [18:41:26.586] options(future.plan = NULL) [18:41:26.586] Sys.unsetenv("R_FUTURE_PLAN") [18:41:26.586] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:26.586] } [18:41:26.586] ...future.workdir <- getwd() [18:41:26.586] } [18:41:26.586] ...future.oldOptions <- base::as.list(base::.Options) [18:41:26.586] ...future.oldEnvVars <- base::Sys.getenv() [18:41:26.586] } [18:41:26.586] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:26.586] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:26.586] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:26.586] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:26.586] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:26.586] future.stdout.windows.reencode = NULL, width = 80L) [18:41:26.586] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:26.586] base::names(...future.oldOptions)) [18:41:26.586] } [18:41:26.586] if (FALSE) { [18:41:26.586] } [18:41:26.586] else { [18:41:26.586] if (TRUE) { [18:41:26.586] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:26.586] open = "w") [18:41:26.586] } [18:41:26.586] else { [18:41:26.586] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:26.586] windows = "NUL", "/dev/null"), open = "w") [18:41:26.586] } [18:41:26.586] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:26.586] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:26.586] base::sink(type = "output", split = FALSE) [18:41:26.586] base::close(...future.stdout) [18:41:26.586] }, add = TRUE) [18:41:26.586] } [18:41:26.586] ...future.frame <- base::sys.nframe() [18:41:26.586] ...future.conditions <- base::list() [18:41:26.586] ...future.rng <- base::globalenv()$.Random.seed [18:41:26.586] if (FALSE) { [18:41:26.586] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:26.586] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:26.586] } [18:41:26.586] ...future.result <- base::tryCatch({ [18:41:26.586] base::withCallingHandlers({ [18:41:26.586] ...future.value <- base::withVisible(base::local({ [18:41:26.586] ...future.makeSendCondition <- base::local({ [18:41:26.586] sendCondition <- NULL [18:41:26.586] function(frame = 1L) { [18:41:26.586] if (is.function(sendCondition)) [18:41:26.586] return(sendCondition) [18:41:26.586] ns <- getNamespace("parallel") [18:41:26.586] if (exists("sendData", mode = "function", [18:41:26.586] envir = ns)) { [18:41:26.586] parallel_sendData <- get("sendData", mode = "function", [18:41:26.586] envir = ns) [18:41:26.586] envir <- sys.frame(frame) [18:41:26.586] master <- NULL [18:41:26.586] while (!identical(envir, .GlobalEnv) && [18:41:26.586] !identical(envir, emptyenv())) { [18:41:26.586] if (exists("master", mode = "list", envir = envir, [18:41:26.586] inherits = FALSE)) { [18:41:26.586] master <- get("master", mode = "list", [18:41:26.586] envir = envir, inherits = FALSE) [18:41:26.586] if (inherits(master, c("SOCKnode", [18:41:26.586] "SOCK0node"))) { [18:41:26.586] sendCondition <<- function(cond) { [18:41:26.586] data <- list(type = "VALUE", value = cond, [18:41:26.586] success = TRUE) [18:41:26.586] parallel_sendData(master, data) [18:41:26.586] } [18:41:26.586] return(sendCondition) [18:41:26.586] } [18:41:26.586] } [18:41:26.586] frame <- frame + 1L [18:41:26.586] envir <- sys.frame(frame) [18:41:26.586] } [18:41:26.586] } [18:41:26.586] sendCondition <<- function(cond) NULL [18:41:26.586] } [18:41:26.586] }) [18:41:26.586] withCallingHandlers({ [18:41:26.586] { [18:41:26.586] do.call(function(...) { [18:41:26.586] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:26.586] if (!identical(...future.globals.maxSize.org, [18:41:26.586] ...future.globals.maxSize)) { [18:41:26.586] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:26.586] on.exit(options(oopts), add = TRUE) [18:41:26.586] } [18:41:26.586] { [18:41:26.586] lapply(seq_along(...future.elements_ii), [18:41:26.586] FUN = function(jj) { [18:41:26.586] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:26.586] ...future.FUN(...future.X_jj, ...) [18:41:26.586] }) [18:41:26.586] } [18:41:26.586] }, args = future.call.arguments) [18:41:26.586] } [18:41:26.586] }, immediateCondition = function(cond) { [18:41:26.586] sendCondition <- ...future.makeSendCondition() [18:41:26.586] sendCondition(cond) [18:41:26.586] muffleCondition <- function (cond, pattern = "^muffle") [18:41:26.586] { [18:41:26.586] inherits <- base::inherits [18:41:26.586] invokeRestart <- base::invokeRestart [18:41:26.586] is.null <- base::is.null [18:41:26.586] muffled <- FALSE [18:41:26.586] if (inherits(cond, "message")) { [18:41:26.586] muffled <- grepl(pattern, "muffleMessage") [18:41:26.586] if (muffled) [18:41:26.586] invokeRestart("muffleMessage") [18:41:26.586] } [18:41:26.586] else if (inherits(cond, "warning")) { [18:41:26.586] muffled <- grepl(pattern, "muffleWarning") [18:41:26.586] if (muffled) [18:41:26.586] invokeRestart("muffleWarning") [18:41:26.586] } [18:41:26.586] else if (inherits(cond, "condition")) { [18:41:26.586] if (!is.null(pattern)) { [18:41:26.586] computeRestarts <- base::computeRestarts [18:41:26.586] grepl <- base::grepl [18:41:26.586] restarts <- computeRestarts(cond) [18:41:26.586] for (restart in restarts) { [18:41:26.586] name <- restart$name [18:41:26.586] if (is.null(name)) [18:41:26.586] next [18:41:26.586] if (!grepl(pattern, name)) [18:41:26.586] next [18:41:26.586] invokeRestart(restart) [18:41:26.586] muffled <- TRUE [18:41:26.586] break [18:41:26.586] } [18:41:26.586] } [18:41:26.586] } [18:41:26.586] invisible(muffled) [18:41:26.586] } [18:41:26.586] muffleCondition(cond) [18:41:26.586] }) [18:41:26.586] })) [18:41:26.586] future::FutureResult(value = ...future.value$value, [18:41:26.586] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:26.586] ...future.rng), globalenv = if (FALSE) [18:41:26.586] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:26.586] ...future.globalenv.names)) [18:41:26.586] else NULL, started = ...future.startTime, version = "1.8") [18:41:26.586] }, condition = base::local({ [18:41:26.586] c <- base::c [18:41:26.586] inherits <- base::inherits [18:41:26.586] invokeRestart <- base::invokeRestart [18:41:26.586] length <- base::length [18:41:26.586] list <- base::list [18:41:26.586] seq.int <- base::seq.int [18:41:26.586] signalCondition <- base::signalCondition [18:41:26.586] sys.calls <- base::sys.calls [18:41:26.586] `[[` <- base::`[[` [18:41:26.586] `+` <- base::`+` [18:41:26.586] `<<-` <- base::`<<-` [18:41:26.586] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:26.586] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:26.586] 3L)] [18:41:26.586] } [18:41:26.586] function(cond) { [18:41:26.586] is_error <- inherits(cond, "error") [18:41:26.586] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:26.586] NULL) [18:41:26.586] if (is_error) { [18:41:26.586] sessionInformation <- function() { [18:41:26.586] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:26.586] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:26.586] search = base::search(), system = base::Sys.info()) [18:41:26.586] } [18:41:26.586] ...future.conditions[[length(...future.conditions) + [18:41:26.586] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:26.586] cond$call), session = sessionInformation(), [18:41:26.586] timestamp = base::Sys.time(), signaled = 0L) [18:41:26.586] signalCondition(cond) [18:41:26.586] } [18:41:26.586] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:26.586] "immediateCondition"))) { [18:41:26.586] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:26.586] ...future.conditions[[length(...future.conditions) + [18:41:26.586] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:26.586] if (TRUE && !signal) { [18:41:26.586] muffleCondition <- function (cond, pattern = "^muffle") [18:41:26.586] { [18:41:26.586] inherits <- base::inherits [18:41:26.586] invokeRestart <- base::invokeRestart [18:41:26.586] is.null <- base::is.null [18:41:26.586] muffled <- FALSE [18:41:26.586] if (inherits(cond, "message")) { [18:41:26.586] muffled <- grepl(pattern, "muffleMessage") [18:41:26.586] if (muffled) [18:41:26.586] invokeRestart("muffleMessage") [18:41:26.586] } [18:41:26.586] else if (inherits(cond, "warning")) { [18:41:26.586] muffled <- grepl(pattern, "muffleWarning") [18:41:26.586] if (muffled) [18:41:26.586] invokeRestart("muffleWarning") [18:41:26.586] } [18:41:26.586] else if (inherits(cond, "condition")) { [18:41:26.586] if (!is.null(pattern)) { [18:41:26.586] computeRestarts <- base::computeRestarts [18:41:26.586] grepl <- base::grepl [18:41:26.586] restarts <- computeRestarts(cond) [18:41:26.586] for (restart in restarts) { [18:41:26.586] name <- restart$name [18:41:26.586] if (is.null(name)) [18:41:26.586] next [18:41:26.586] if (!grepl(pattern, name)) [18:41:26.586] next [18:41:26.586] invokeRestart(restart) [18:41:26.586] muffled <- TRUE [18:41:26.586] break [18:41:26.586] } [18:41:26.586] } [18:41:26.586] } [18:41:26.586] invisible(muffled) [18:41:26.586] } [18:41:26.586] muffleCondition(cond, pattern = "^muffle") [18:41:26.586] } [18:41:26.586] } [18:41:26.586] else { [18:41:26.586] if (TRUE) { [18:41:26.586] muffleCondition <- function (cond, pattern = "^muffle") [18:41:26.586] { [18:41:26.586] inherits <- base::inherits [18:41:26.586] invokeRestart <- base::invokeRestart [18:41:26.586] is.null <- base::is.null [18:41:26.586] muffled <- FALSE [18:41:26.586] if (inherits(cond, "message")) { [18:41:26.586] muffled <- grepl(pattern, "muffleMessage") [18:41:26.586] if (muffled) [18:41:26.586] invokeRestart("muffleMessage") [18:41:26.586] } [18:41:26.586] else if (inherits(cond, "warning")) { [18:41:26.586] muffled <- grepl(pattern, "muffleWarning") [18:41:26.586] if (muffled) [18:41:26.586] invokeRestart("muffleWarning") [18:41:26.586] } [18:41:26.586] else if (inherits(cond, "condition")) { [18:41:26.586] if (!is.null(pattern)) { [18:41:26.586] computeRestarts <- base::computeRestarts [18:41:26.586] grepl <- base::grepl [18:41:26.586] restarts <- computeRestarts(cond) [18:41:26.586] for (restart in restarts) { [18:41:26.586] name <- restart$name [18:41:26.586] if (is.null(name)) [18:41:26.586] next [18:41:26.586] if (!grepl(pattern, name)) [18:41:26.586] next [18:41:26.586] invokeRestart(restart) [18:41:26.586] muffled <- TRUE [18:41:26.586] break [18:41:26.586] } [18:41:26.586] } [18:41:26.586] } [18:41:26.586] invisible(muffled) [18:41:26.586] } [18:41:26.586] muffleCondition(cond, pattern = "^muffle") [18:41:26.586] } [18:41:26.586] } [18:41:26.586] } [18:41:26.586] })) [18:41:26.586] }, error = function(ex) { [18:41:26.586] base::structure(base::list(value = NULL, visible = NULL, [18:41:26.586] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:26.586] ...future.rng), started = ...future.startTime, [18:41:26.586] finished = Sys.time(), session_uuid = NA_character_, [18:41:26.586] version = "1.8"), class = "FutureResult") [18:41:26.586] }, finally = { [18:41:26.586] if (!identical(...future.workdir, getwd())) [18:41:26.586] setwd(...future.workdir) [18:41:26.586] { [18:41:26.586] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:26.586] ...future.oldOptions$nwarnings <- NULL [18:41:26.586] } [18:41:26.586] base::options(...future.oldOptions) [18:41:26.586] if (.Platform$OS.type == "windows") { [18:41:26.586] old_names <- names(...future.oldEnvVars) [18:41:26.586] envs <- base::Sys.getenv() [18:41:26.586] names <- names(envs) [18:41:26.586] common <- intersect(names, old_names) [18:41:26.586] added <- setdiff(names, old_names) [18:41:26.586] removed <- setdiff(old_names, names) [18:41:26.586] changed <- common[...future.oldEnvVars[common] != [18:41:26.586] envs[common]] [18:41:26.586] NAMES <- toupper(changed) [18:41:26.586] args <- list() [18:41:26.586] for (kk in seq_along(NAMES)) { [18:41:26.586] name <- changed[[kk]] [18:41:26.586] NAME <- NAMES[[kk]] [18:41:26.586] if (name != NAME && is.element(NAME, old_names)) [18:41:26.586] next [18:41:26.586] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:26.586] } [18:41:26.586] NAMES <- toupper(added) [18:41:26.586] for (kk in seq_along(NAMES)) { [18:41:26.586] name <- added[[kk]] [18:41:26.586] NAME <- NAMES[[kk]] [18:41:26.586] if (name != NAME && is.element(NAME, old_names)) [18:41:26.586] next [18:41:26.586] args[[name]] <- "" [18:41:26.586] } [18:41:26.586] NAMES <- toupper(removed) [18:41:26.586] for (kk in seq_along(NAMES)) { [18:41:26.586] name <- removed[[kk]] [18:41:26.586] NAME <- NAMES[[kk]] [18:41:26.586] if (name != NAME && is.element(NAME, old_names)) [18:41:26.586] next [18:41:26.586] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:26.586] } [18:41:26.586] if (length(args) > 0) [18:41:26.586] base::do.call(base::Sys.setenv, args = args) [18:41:26.586] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:26.586] } [18:41:26.586] else { [18:41:26.586] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:26.586] } [18:41:26.586] { [18:41:26.586] if (base::length(...future.futureOptionsAdded) > [18:41:26.586] 0L) { [18:41:26.586] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:26.586] base::names(opts) <- ...future.futureOptionsAdded [18:41:26.586] base::options(opts) [18:41:26.586] } [18:41:26.586] { [18:41:26.586] { [18:41:26.586] base::options(mc.cores = ...future.mc.cores.old) [18:41:26.586] NULL [18:41:26.586] } [18:41:26.586] options(future.plan = NULL) [18:41:26.586] if (is.na(NA_character_)) [18:41:26.586] Sys.unsetenv("R_FUTURE_PLAN") [18:41:26.586] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:26.586] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:26.586] .init = FALSE) [18:41:26.586] } [18:41:26.586] } [18:41:26.586] } [18:41:26.586] }) [18:41:26.586] if (TRUE) { [18:41:26.586] base::sink(type = "output", split = FALSE) [18:41:26.586] if (TRUE) { [18:41:26.586] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:26.586] } [18:41:26.586] else { [18:41:26.586] ...future.result["stdout"] <- base::list(NULL) [18:41:26.586] } [18:41:26.586] base::close(...future.stdout) [18:41:26.586] ...future.stdout <- NULL [18:41:26.586] } [18:41:26.586] ...future.result$conditions <- ...future.conditions [18:41:26.586] ...future.result$finished <- base::Sys.time() [18:41:26.586] ...future.result [18:41:26.586] } [18:41:26.592] Exporting 5 global objects (32.05 KiB) to cluster node #1 ... [18:41:26.593] Exporting '...future.FUN' (31.30 KiB) to cluster node #1 ... [18:41:26.593] Exporting '...future.FUN' (31.30 KiB) to cluster node #1 ... DONE [18:41:26.594] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:26.594] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:26.594] Exporting '...future.elements_ii' (183 bytes) to cluster node #1 ... [18:41:26.595] Exporting '...future.elements_ii' (183 bytes) to cluster node #1 ... DONE [18:41:26.595] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:26.595] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:26.595] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:26.596] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:26.596] Exporting 5 global objects (32.05 KiB) to cluster node #1 ... DONE [18:41:26.597] MultisessionFuture started [18:41:26.597] - Launch lazy future ... done [18:41:26.597] run() for 'MultisessionFuture' ... done [18:41:26.597] Created future: [18:41:26.616] receiveMessageFromWorker() for ClusterFuture ... [18:41:26.616] - Validating connection of MultisessionFuture [18:41:26.617] - received message: FutureResult [18:41:26.617] - Received FutureResult [18:41:26.617] - Erased future from FutureRegistry [18:41:26.617] result() for ClusterFuture ... [18:41:26.617] - result already collected: FutureResult [18:41:26.618] result() for ClusterFuture ... done [18:41:26.618] receiveMessageFromWorker() for ClusterFuture ... done [18:41:26.597] MultisessionFuture: [18:41:26.597] Label: 'future_lapply-1' [18:41:26.597] Expression: [18:41:26.597] { [18:41:26.597] do.call(function(...) { [18:41:26.597] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:26.597] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:26.597] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:26.597] on.exit(options(oopts), add = TRUE) [18:41:26.597] } [18:41:26.597] { [18:41:26.597] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:26.597] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:26.597] ...future.FUN(...future.X_jj, ...) [18:41:26.597] }) [18:41:26.597] } [18:41:26.597] }, args = future.call.arguments) [18:41:26.597] } [18:41:26.597] Lazy evaluation: FALSE [18:41:26.597] Asynchronous evaluation: TRUE [18:41:26.597] Local evaluation: TRUE [18:41:26.597] Environment: R_GlobalEnv [18:41:26.597] Capture standard output: TRUE [18:41:26.597] Capture condition classes: 'condition' (excluding 'nothing') [18:41:26.597] Globals: 5 objects totaling 31.62 KiB (function '...future.FUN' of 31.30 KiB, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 183 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:26.597] Packages: [18:41:26.597] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:26.597] Resolved: TRUE [18:41:26.597] Value: [18:41:26.597] Conditions captured: [18:41:26.597] Early signaling: FALSE [18:41:26.597] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:26.597] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:26.618] Chunk #1 of 2 ... DONE [18:41:26.618] Chunk #2 of 2 ... [18:41:26.618] - Finding globals in 'X' for chunk #2 ... [18:41:26.619] getGlobalsAndPackages() ... [18:41:26.619] Searching for globals... [18:41:26.619] [18:41:26.619] Searching for globals ... DONE [18:41:26.619] - globals: [0] [18:41:26.620] getGlobalsAndPackages() ... DONE [18:41:26.620] + additional globals found: [n=0] [18:41:26.620] + additional namespaces needed: [n=0] [18:41:26.620] - Finding globals in 'X' for chunk #2 ... DONE [18:41:26.620] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:26.620] - seeds: [18:41:26.620] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:26.621] getGlobalsAndPackages() ... [18:41:26.621] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:26.621] Resolving globals: FALSE [18:41:26.621] Tweak future expression to call with '...' arguments ... [18:41:26.621] { [18:41:26.621] do.call(function(...) { [18:41:26.621] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:26.621] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:26.621] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:26.621] on.exit(options(oopts), add = TRUE) [18:41:26.621] } [18:41:26.621] { [18:41:26.621] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:26.621] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:26.621] ...future.FUN(...future.X_jj, ...) [18:41:26.621] }) [18:41:26.621] } [18:41:26.621] }, args = future.call.arguments) [18:41:26.621] } [18:41:26.622] Tweak future expression to call with '...' arguments ... DONE [18:41:26.622] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:26.622] [18:41:26.622] getGlobalsAndPackages() ... DONE [18:41:26.623] run() for 'Future' ... [18:41:26.623] - state: 'created' [18:41:26.623] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:26.637] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:26.638] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:26.638] - Field: 'node' [18:41:26.638] - Field: 'label' [18:41:26.638] - Field: 'local' [18:41:26.638] - Field: 'owner' [18:41:26.638] - Field: 'envir' [18:41:26.639] - Field: 'workers' [18:41:26.639] - Field: 'packages' [18:41:26.639] - Field: 'gc' [18:41:26.639] - Field: 'conditions' [18:41:26.639] - Field: 'persistent' [18:41:26.639] - Field: 'expr' [18:41:26.640] - Field: 'uuid' [18:41:26.640] - Field: 'seed' [18:41:26.640] - Field: 'version' [18:41:26.640] - Field: 'result' [18:41:26.640] - Field: 'asynchronous' [18:41:26.640] - Field: 'calls' [18:41:26.641] - Field: 'globals' [18:41:26.641] - Field: 'stdout' [18:41:26.641] - Field: 'earlySignal' [18:41:26.641] - Field: 'lazy' [18:41:26.641] - Field: 'state' [18:41:26.641] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:26.641] - Launch lazy future ... [18:41:26.642] Packages needed by the future expression (n = 0): [18:41:26.642] Packages needed by future strategies (n = 0): [18:41:26.643] { [18:41:26.643] { [18:41:26.643] { [18:41:26.643] ...future.startTime <- base::Sys.time() [18:41:26.643] { [18:41:26.643] { [18:41:26.643] { [18:41:26.643] { [18:41:26.643] base::local({ [18:41:26.643] has_future <- base::requireNamespace("future", [18:41:26.643] quietly = TRUE) [18:41:26.643] if (has_future) { [18:41:26.643] ns <- base::getNamespace("future") [18:41:26.643] version <- ns[[".package"]][["version"]] [18:41:26.643] if (is.null(version)) [18:41:26.643] version <- utils::packageVersion("future") [18:41:26.643] } [18:41:26.643] else { [18:41:26.643] version <- NULL [18:41:26.643] } [18:41:26.643] if (!has_future || version < "1.8.0") { [18:41:26.643] info <- base::c(r_version = base::gsub("R version ", [18:41:26.643] "", base::R.version$version.string), [18:41:26.643] platform = base::sprintf("%s (%s-bit)", [18:41:26.643] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:26.643] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:26.643] "release", "version")], collapse = " "), [18:41:26.643] hostname = base::Sys.info()[["nodename"]]) [18:41:26.643] info <- base::sprintf("%s: %s", base::names(info), [18:41:26.643] info) [18:41:26.643] info <- base::paste(info, collapse = "; ") [18:41:26.643] if (!has_future) { [18:41:26.643] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:26.643] info) [18:41:26.643] } [18:41:26.643] else { [18:41:26.643] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:26.643] info, version) [18:41:26.643] } [18:41:26.643] base::stop(msg) [18:41:26.643] } [18:41:26.643] }) [18:41:26.643] } [18:41:26.643] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:26.643] base::options(mc.cores = 1L) [18:41:26.643] } [18:41:26.643] ...future.strategy.old <- future::plan("list") [18:41:26.643] options(future.plan = NULL) [18:41:26.643] Sys.unsetenv("R_FUTURE_PLAN") [18:41:26.643] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:26.643] } [18:41:26.643] ...future.workdir <- getwd() [18:41:26.643] } [18:41:26.643] ...future.oldOptions <- base::as.list(base::.Options) [18:41:26.643] ...future.oldEnvVars <- base::Sys.getenv() [18:41:26.643] } [18:41:26.643] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:26.643] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:26.643] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:26.643] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:26.643] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:26.643] future.stdout.windows.reencode = NULL, width = 80L) [18:41:26.643] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:26.643] base::names(...future.oldOptions)) [18:41:26.643] } [18:41:26.643] if (FALSE) { [18:41:26.643] } [18:41:26.643] else { [18:41:26.643] if (TRUE) { [18:41:26.643] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:26.643] open = "w") [18:41:26.643] } [18:41:26.643] else { [18:41:26.643] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:26.643] windows = "NUL", "/dev/null"), open = "w") [18:41:26.643] } [18:41:26.643] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:26.643] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:26.643] base::sink(type = "output", split = FALSE) [18:41:26.643] base::close(...future.stdout) [18:41:26.643] }, add = TRUE) [18:41:26.643] } [18:41:26.643] ...future.frame <- base::sys.nframe() [18:41:26.643] ...future.conditions <- base::list() [18:41:26.643] ...future.rng <- base::globalenv()$.Random.seed [18:41:26.643] if (FALSE) { [18:41:26.643] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:26.643] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:26.643] } [18:41:26.643] ...future.result <- base::tryCatch({ [18:41:26.643] base::withCallingHandlers({ [18:41:26.643] ...future.value <- base::withVisible(base::local({ [18:41:26.643] ...future.makeSendCondition <- base::local({ [18:41:26.643] sendCondition <- NULL [18:41:26.643] function(frame = 1L) { [18:41:26.643] if (is.function(sendCondition)) [18:41:26.643] return(sendCondition) [18:41:26.643] ns <- getNamespace("parallel") [18:41:26.643] if (exists("sendData", mode = "function", [18:41:26.643] envir = ns)) { [18:41:26.643] parallel_sendData <- get("sendData", mode = "function", [18:41:26.643] envir = ns) [18:41:26.643] envir <- sys.frame(frame) [18:41:26.643] master <- NULL [18:41:26.643] while (!identical(envir, .GlobalEnv) && [18:41:26.643] !identical(envir, emptyenv())) { [18:41:26.643] if (exists("master", mode = "list", envir = envir, [18:41:26.643] inherits = FALSE)) { [18:41:26.643] master <- get("master", mode = "list", [18:41:26.643] envir = envir, inherits = FALSE) [18:41:26.643] if (inherits(master, c("SOCKnode", [18:41:26.643] "SOCK0node"))) { [18:41:26.643] sendCondition <<- function(cond) { [18:41:26.643] data <- list(type = "VALUE", value = cond, [18:41:26.643] success = TRUE) [18:41:26.643] parallel_sendData(master, data) [18:41:26.643] } [18:41:26.643] return(sendCondition) [18:41:26.643] } [18:41:26.643] } [18:41:26.643] frame <- frame + 1L [18:41:26.643] envir <- sys.frame(frame) [18:41:26.643] } [18:41:26.643] } [18:41:26.643] sendCondition <<- function(cond) NULL [18:41:26.643] } [18:41:26.643] }) [18:41:26.643] withCallingHandlers({ [18:41:26.643] { [18:41:26.643] do.call(function(...) { [18:41:26.643] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:26.643] if (!identical(...future.globals.maxSize.org, [18:41:26.643] ...future.globals.maxSize)) { [18:41:26.643] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:26.643] on.exit(options(oopts), add = TRUE) [18:41:26.643] } [18:41:26.643] { [18:41:26.643] lapply(seq_along(...future.elements_ii), [18:41:26.643] FUN = function(jj) { [18:41:26.643] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:26.643] ...future.FUN(...future.X_jj, ...) [18:41:26.643] }) [18:41:26.643] } [18:41:26.643] }, args = future.call.arguments) [18:41:26.643] } [18:41:26.643] }, immediateCondition = function(cond) { [18:41:26.643] sendCondition <- ...future.makeSendCondition() [18:41:26.643] sendCondition(cond) [18:41:26.643] muffleCondition <- function (cond, pattern = "^muffle") [18:41:26.643] { [18:41:26.643] inherits <- base::inherits [18:41:26.643] invokeRestart <- base::invokeRestart [18:41:26.643] is.null <- base::is.null [18:41:26.643] muffled <- FALSE [18:41:26.643] if (inherits(cond, "message")) { [18:41:26.643] muffled <- grepl(pattern, "muffleMessage") [18:41:26.643] if (muffled) [18:41:26.643] invokeRestart("muffleMessage") [18:41:26.643] } [18:41:26.643] else if (inherits(cond, "warning")) { [18:41:26.643] muffled <- grepl(pattern, "muffleWarning") [18:41:26.643] if (muffled) [18:41:26.643] invokeRestart("muffleWarning") [18:41:26.643] } [18:41:26.643] else if (inherits(cond, "condition")) { [18:41:26.643] if (!is.null(pattern)) { [18:41:26.643] computeRestarts <- base::computeRestarts [18:41:26.643] grepl <- base::grepl [18:41:26.643] restarts <- computeRestarts(cond) [18:41:26.643] for (restart in restarts) { [18:41:26.643] name <- restart$name [18:41:26.643] if (is.null(name)) [18:41:26.643] next [18:41:26.643] if (!grepl(pattern, name)) [18:41:26.643] next [18:41:26.643] invokeRestart(restart) [18:41:26.643] muffled <- TRUE [18:41:26.643] break [18:41:26.643] } [18:41:26.643] } [18:41:26.643] } [18:41:26.643] invisible(muffled) [18:41:26.643] } [18:41:26.643] muffleCondition(cond) [18:41:26.643] }) [18:41:26.643] })) [18:41:26.643] future::FutureResult(value = ...future.value$value, [18:41:26.643] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:26.643] ...future.rng), globalenv = if (FALSE) [18:41:26.643] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:26.643] ...future.globalenv.names)) [18:41:26.643] else NULL, started = ...future.startTime, version = "1.8") [18:41:26.643] }, condition = base::local({ [18:41:26.643] c <- base::c [18:41:26.643] inherits <- base::inherits [18:41:26.643] invokeRestart <- base::invokeRestart [18:41:26.643] length <- base::length [18:41:26.643] list <- base::list [18:41:26.643] seq.int <- base::seq.int [18:41:26.643] signalCondition <- base::signalCondition [18:41:26.643] sys.calls <- base::sys.calls [18:41:26.643] `[[` <- base::`[[` [18:41:26.643] `+` <- base::`+` [18:41:26.643] `<<-` <- base::`<<-` [18:41:26.643] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:26.643] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:26.643] 3L)] [18:41:26.643] } [18:41:26.643] function(cond) { [18:41:26.643] is_error <- inherits(cond, "error") [18:41:26.643] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:26.643] NULL) [18:41:26.643] if (is_error) { [18:41:26.643] sessionInformation <- function() { [18:41:26.643] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:26.643] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:26.643] search = base::search(), system = base::Sys.info()) [18:41:26.643] } [18:41:26.643] ...future.conditions[[length(...future.conditions) + [18:41:26.643] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:26.643] cond$call), session = sessionInformation(), [18:41:26.643] timestamp = base::Sys.time(), signaled = 0L) [18:41:26.643] signalCondition(cond) [18:41:26.643] } [18:41:26.643] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:26.643] "immediateCondition"))) { [18:41:26.643] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:26.643] ...future.conditions[[length(...future.conditions) + [18:41:26.643] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:26.643] if (TRUE && !signal) { [18:41:26.643] muffleCondition <- function (cond, pattern = "^muffle") [18:41:26.643] { [18:41:26.643] inherits <- base::inherits [18:41:26.643] invokeRestart <- base::invokeRestart [18:41:26.643] is.null <- base::is.null [18:41:26.643] muffled <- FALSE [18:41:26.643] if (inherits(cond, "message")) { [18:41:26.643] muffled <- grepl(pattern, "muffleMessage") [18:41:26.643] if (muffled) [18:41:26.643] invokeRestart("muffleMessage") [18:41:26.643] } [18:41:26.643] else if (inherits(cond, "warning")) { [18:41:26.643] muffled <- grepl(pattern, "muffleWarning") [18:41:26.643] if (muffled) [18:41:26.643] invokeRestart("muffleWarning") [18:41:26.643] } [18:41:26.643] else if (inherits(cond, "condition")) { [18:41:26.643] if (!is.null(pattern)) { [18:41:26.643] computeRestarts <- base::computeRestarts [18:41:26.643] grepl <- base::grepl [18:41:26.643] restarts <- computeRestarts(cond) [18:41:26.643] for (restart in restarts) { [18:41:26.643] name <- restart$name [18:41:26.643] if (is.null(name)) [18:41:26.643] next [18:41:26.643] if (!grepl(pattern, name)) [18:41:26.643] next [18:41:26.643] invokeRestart(restart) [18:41:26.643] muffled <- TRUE [18:41:26.643] break [18:41:26.643] } [18:41:26.643] } [18:41:26.643] } [18:41:26.643] invisible(muffled) [18:41:26.643] } [18:41:26.643] muffleCondition(cond, pattern = "^muffle") [18:41:26.643] } [18:41:26.643] } [18:41:26.643] else { [18:41:26.643] if (TRUE) { [18:41:26.643] muffleCondition <- function (cond, pattern = "^muffle") [18:41:26.643] { [18:41:26.643] inherits <- base::inherits [18:41:26.643] invokeRestart <- base::invokeRestart [18:41:26.643] is.null <- base::is.null [18:41:26.643] muffled <- FALSE [18:41:26.643] if (inherits(cond, "message")) { [18:41:26.643] muffled <- grepl(pattern, "muffleMessage") [18:41:26.643] if (muffled) [18:41:26.643] invokeRestart("muffleMessage") [18:41:26.643] } [18:41:26.643] else if (inherits(cond, "warning")) { [18:41:26.643] muffled <- grepl(pattern, "muffleWarning") [18:41:26.643] if (muffled) [18:41:26.643] invokeRestart("muffleWarning") [18:41:26.643] } [18:41:26.643] else if (inherits(cond, "condition")) { [18:41:26.643] if (!is.null(pattern)) { [18:41:26.643] computeRestarts <- base::computeRestarts [18:41:26.643] grepl <- base::grepl [18:41:26.643] restarts <- computeRestarts(cond) [18:41:26.643] for (restart in restarts) { [18:41:26.643] name <- restart$name [18:41:26.643] if (is.null(name)) [18:41:26.643] next [18:41:26.643] if (!grepl(pattern, name)) [18:41:26.643] next [18:41:26.643] invokeRestart(restart) [18:41:26.643] muffled <- TRUE [18:41:26.643] break [18:41:26.643] } [18:41:26.643] } [18:41:26.643] } [18:41:26.643] invisible(muffled) [18:41:26.643] } [18:41:26.643] muffleCondition(cond, pattern = "^muffle") [18:41:26.643] } [18:41:26.643] } [18:41:26.643] } [18:41:26.643] })) [18:41:26.643] }, error = function(ex) { [18:41:26.643] base::structure(base::list(value = NULL, visible = NULL, [18:41:26.643] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:26.643] ...future.rng), started = ...future.startTime, [18:41:26.643] finished = Sys.time(), session_uuid = NA_character_, [18:41:26.643] version = "1.8"), class = "FutureResult") [18:41:26.643] }, finally = { [18:41:26.643] if (!identical(...future.workdir, getwd())) [18:41:26.643] setwd(...future.workdir) [18:41:26.643] { [18:41:26.643] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:26.643] ...future.oldOptions$nwarnings <- NULL [18:41:26.643] } [18:41:26.643] base::options(...future.oldOptions) [18:41:26.643] if (.Platform$OS.type == "windows") { [18:41:26.643] old_names <- names(...future.oldEnvVars) [18:41:26.643] envs <- base::Sys.getenv() [18:41:26.643] names <- names(envs) [18:41:26.643] common <- intersect(names, old_names) [18:41:26.643] added <- setdiff(names, old_names) [18:41:26.643] removed <- setdiff(old_names, names) [18:41:26.643] changed <- common[...future.oldEnvVars[common] != [18:41:26.643] envs[common]] [18:41:26.643] NAMES <- toupper(changed) [18:41:26.643] args <- list() [18:41:26.643] for (kk in seq_along(NAMES)) { [18:41:26.643] name <- changed[[kk]] [18:41:26.643] NAME <- NAMES[[kk]] [18:41:26.643] if (name != NAME && is.element(NAME, old_names)) [18:41:26.643] next [18:41:26.643] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:26.643] } [18:41:26.643] NAMES <- toupper(added) [18:41:26.643] for (kk in seq_along(NAMES)) { [18:41:26.643] name <- added[[kk]] [18:41:26.643] NAME <- NAMES[[kk]] [18:41:26.643] if (name != NAME && is.element(NAME, old_names)) [18:41:26.643] next [18:41:26.643] args[[name]] <- "" [18:41:26.643] } [18:41:26.643] NAMES <- toupper(removed) [18:41:26.643] for (kk in seq_along(NAMES)) { [18:41:26.643] name <- removed[[kk]] [18:41:26.643] NAME <- NAMES[[kk]] [18:41:26.643] if (name != NAME && is.element(NAME, old_names)) [18:41:26.643] next [18:41:26.643] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:26.643] } [18:41:26.643] if (length(args) > 0) [18:41:26.643] base::do.call(base::Sys.setenv, args = args) [18:41:26.643] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:26.643] } [18:41:26.643] else { [18:41:26.643] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:26.643] } [18:41:26.643] { [18:41:26.643] if (base::length(...future.futureOptionsAdded) > [18:41:26.643] 0L) { [18:41:26.643] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:26.643] base::names(opts) <- ...future.futureOptionsAdded [18:41:26.643] base::options(opts) [18:41:26.643] } [18:41:26.643] { [18:41:26.643] { [18:41:26.643] base::options(mc.cores = ...future.mc.cores.old) [18:41:26.643] NULL [18:41:26.643] } [18:41:26.643] options(future.plan = NULL) [18:41:26.643] if (is.na(NA_character_)) [18:41:26.643] Sys.unsetenv("R_FUTURE_PLAN") [18:41:26.643] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:26.643] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:26.643] .init = FALSE) [18:41:26.643] } [18:41:26.643] } [18:41:26.643] } [18:41:26.643] }) [18:41:26.643] if (TRUE) { [18:41:26.643] base::sink(type = "output", split = FALSE) [18:41:26.643] if (TRUE) { [18:41:26.643] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:26.643] } [18:41:26.643] else { [18:41:26.643] ...future.result["stdout"] <- base::list(NULL) [18:41:26.643] } [18:41:26.643] base::close(...future.stdout) [18:41:26.643] ...future.stdout <- NULL [18:41:26.643] } [18:41:26.643] ...future.result$conditions <- ...future.conditions [18:41:26.643] ...future.result$finished <- base::Sys.time() [18:41:26.643] ...future.result [18:41:26.643] } [18:41:26.649] Exporting 5 global objects (32.05 KiB) to cluster node #1 ... [18:41:26.649] Exporting '...future.FUN' (31.30 KiB) to cluster node #1 ... [18:41:26.650] Exporting '...future.FUN' (31.30 KiB) to cluster node #1 ... DONE [18:41:26.650] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:26.651] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:26.651] Exporting '...future.elements_ii' (183 bytes) to cluster node #1 ... [18:41:26.651] Exporting '...future.elements_ii' (183 bytes) to cluster node #1 ... DONE [18:41:26.651] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:26.652] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:26.652] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:26.652] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:26.652] Exporting 5 global objects (32.05 KiB) to cluster node #1 ... DONE [18:41:26.653] MultisessionFuture started [18:41:26.653] - Launch lazy future ... done [18:41:26.653] run() for 'MultisessionFuture' ... done [18:41:26.653] Created future: [18:41:26.671] receiveMessageFromWorker() for ClusterFuture ... [18:41:26.671] - Validating connection of MultisessionFuture [18:41:26.672] - received message: FutureResult [18:41:26.672] - Received FutureResult [18:41:26.672] - Erased future from FutureRegistry [18:41:26.672] result() for ClusterFuture ... [18:41:26.673] - result already collected: FutureResult [18:41:26.673] result() for ClusterFuture ... done [18:41:26.673] receiveMessageFromWorker() for ClusterFuture ... done [18:41:26.654] MultisessionFuture: [18:41:26.654] Label: 'future_lapply-2' [18:41:26.654] Expression: [18:41:26.654] { [18:41:26.654] do.call(function(...) { [18:41:26.654] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:26.654] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:26.654] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:26.654] on.exit(options(oopts), add = TRUE) [18:41:26.654] } [18:41:26.654] { [18:41:26.654] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:26.654] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:26.654] ...future.FUN(...future.X_jj, ...) [18:41:26.654] }) [18:41:26.654] } [18:41:26.654] }, args = future.call.arguments) [18:41:26.654] } [18:41:26.654] Lazy evaluation: FALSE [18:41:26.654] Asynchronous evaluation: TRUE [18:41:26.654] Local evaluation: TRUE [18:41:26.654] Environment: R_GlobalEnv [18:41:26.654] Capture standard output: TRUE [18:41:26.654] Capture condition classes: 'condition' (excluding 'nothing') [18:41:26.654] Globals: 5 objects totaling 31.62 KiB (function '...future.FUN' of 31.30 KiB, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 183 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:26.654] Packages: [18:41:26.654] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:26.654] Resolved: TRUE [18:41:26.654] Value: [18:41:26.654] Conditions captured: [18:41:26.654] Early signaling: FALSE [18:41:26.654] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:26.654] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:26.673] Chunk #2 of 2 ... DONE [18:41:26.674] Launching 2 futures (chunks) ... DONE [18:41:26.674] Resolving 2 futures (chunks) ... [18:41:26.674] resolve() on list ... [18:41:26.674] recursive: 0 [18:41:26.674] length: 2 [18:41:26.675] [18:41:26.675] Future #1 [18:41:26.675] result() for ClusterFuture ... [18:41:26.675] - result already collected: FutureResult [18:41:26.675] result() for ClusterFuture ... done [18:41:26.676] result() for ClusterFuture ... [18:41:26.676] - result already collected: FutureResult [18:41:26.676] result() for ClusterFuture ... done [18:41:26.676] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:26.676] - nx: 2 [18:41:26.676] - relay: TRUE [18:41:26.677] - stdout: TRUE [18:41:26.677] - signal: TRUE [18:41:26.677] - resignal: FALSE [18:41:26.677] - force: TRUE [18:41:26.677] - relayed: [n=2] FALSE, FALSE [18:41:26.677] - queued futures: [n=2] FALSE, FALSE [18:41:26.678] - until=1 [18:41:26.678] - relaying element #1 [18:41:26.678] result() for ClusterFuture ... [18:41:26.678] - result already collected: FutureResult [18:41:26.678] result() for ClusterFuture ... done [18:41:26.679] result() for ClusterFuture ... [18:41:26.679] - result already collected: FutureResult [18:41:26.679] result() for ClusterFuture ... done [18:41:26.679] result() for ClusterFuture ... [18:41:26.679] - result already collected: FutureResult [18:41:26.680] result() for ClusterFuture ... done [18:41:26.680] result() for ClusterFuture ... [18:41:26.680] - result already collected: FutureResult [18:41:26.680] result() for ClusterFuture ... done [18:41:26.680] - relayed: [n=2] TRUE, FALSE [18:41:26.680] - queued futures: [n=2] TRUE, FALSE [18:41:26.681] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:26.681] length: 1 (resolved future 1) [18:41:26.681] Future #2 [18:41:26.681] result() for ClusterFuture ... [18:41:26.681] - result already collected: FutureResult [18:41:26.682] result() for ClusterFuture ... done [18:41:26.682] result() for ClusterFuture ... [18:41:26.682] - result already collected: FutureResult [18:41:26.682] result() for ClusterFuture ... done [18:41:26.682] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:26.683] - nx: 2 [18:41:26.683] - relay: TRUE [18:41:26.683] - stdout: TRUE [18:41:26.683] - signal: TRUE [18:41:26.683] - resignal: FALSE [18:41:26.683] - force: TRUE [18:41:26.684] - relayed: [n=2] TRUE, FALSE [18:41:26.684] - queued futures: [n=2] TRUE, FALSE [18:41:26.684] - until=2 [18:41:26.684] - relaying element #2 [18:41:26.684] result() for ClusterFuture ... [18:41:26.685] - result already collected: FutureResult [18:41:26.685] result() for ClusterFuture ... done [18:41:26.685] result() for ClusterFuture ... [18:41:26.685] - result already collected: FutureResult [18:41:26.685] result() for ClusterFuture ... done [18:41:26.686] result() for ClusterFuture ... [18:41:26.686] - result already collected: FutureResult [18:41:26.686] result() for ClusterFuture ... done [18:41:26.686] result() for ClusterFuture ... [18:41:26.686] - result already collected: FutureResult [18:41:26.686] result() for ClusterFuture ... done [18:41:26.686] - relayed: [n=2] TRUE, TRUE [18:41:26.687] - queued futures: [n=2] TRUE, TRUE [18:41:26.687] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:26.687] length: 0 (resolved future 2) [18:41:26.687] Relaying remaining futures [18:41:26.687] signalConditionsASAP(NULL, pos=0) ... [18:41:26.688] - nx: 2 [18:41:26.688] - relay: TRUE [18:41:26.688] - stdout: TRUE [18:41:26.688] - signal: TRUE [18:41:26.688] - resignal: FALSE [18:41:26.688] - force: TRUE [18:41:26.688] - relayed: [n=2] TRUE, TRUE [18:41:26.689] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:26.689] - relayed: [n=2] TRUE, TRUE [18:41:26.689] - queued futures: [n=2] TRUE, TRUE [18:41:26.689] signalConditionsASAP(NULL, pos=0) ... done [18:41:26.689] resolve() on list ... DONE [18:41:26.690] result() for ClusterFuture ... [18:41:26.690] - result already collected: FutureResult [18:41:26.690] result() for ClusterFuture ... done [18:41:26.690] result() for ClusterFuture ... [18:41:26.690] - result already collected: FutureResult [18:41:26.690] result() for ClusterFuture ... done [18:41:26.691] result() for ClusterFuture ... [18:41:26.691] - result already collected: FutureResult [18:41:26.691] result() for ClusterFuture ... done [18:41:26.691] result() for ClusterFuture ... [18:41:26.691] - result already collected: FutureResult [18:41:26.691] result() for ClusterFuture ... done [18:41:26.692] - Number of value chunks collected: 2 [18:41:26.692] Resolving 2 futures (chunks) ... DONE [18:41:26.692] Reducing values from 2 chunks ... [18:41:26.692] - Number of values collected after concatenation: 2 [18:41:26.692] - Number of values expected: 2 [18:41:26.692] Reducing values from 2 chunks ... DONE [18:41:26.693] future_lapply() ... DONE - future_lapply(x, ...) where length(x) != length(as.list(x)) ... [18:41:26.693] future_lapply() ... [18:41:26.696] Number of chunks: 2 [18:41:26.696] getGlobalsAndPackagesXApply() ... [18:41:26.696] - future.globals: TRUE [18:41:26.696] getGlobalsAndPackages() ... [18:41:26.696] Searching for globals... [18:41:26.697] - globals found: [1] 'FUN' [18:41:26.697] Searching for globals ... DONE [18:41:26.698] Resolving globals: FALSE [18:41:26.698] The total size of the 1 globals is 37 bytes (37 bytes) [18:41:26.698] The total size of the 1 globals exported for future expression ('FUN()') is 37 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (37 bytes of class 'function') [18:41:26.699] - globals: [1] 'FUN' [18:41:26.699] [18:41:26.699] getGlobalsAndPackages() ... DONE [18:41:26.699] - globals found/used: [n=1] 'FUN' [18:41:26.699] - needed namespaces: [n=0] [18:41:26.699] Finding globals ... DONE [18:41:26.700] - use_args: TRUE [18:41:26.700] - Getting '...' globals ... [18:41:26.700] resolve() on list ... [18:41:26.700] recursive: 0 [18:41:26.701] length: 1 [18:41:26.701] elements: '...' [18:41:26.701] length: 0 (resolved future 1) [18:41:26.701] resolve() on list ... DONE [18:41:26.701] - '...' content: [n=0] [18:41:26.701] List of 1 [18:41:26.701] $ ...: list() [18:41:26.701] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:26.701] - attr(*, "where")=List of 1 [18:41:26.701] ..$ ...: [18:41:26.701] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:26.701] - attr(*, "resolved")= logi TRUE [18:41:26.701] - attr(*, "total_size")= num NA [18:41:26.704] - Getting '...' globals ... DONE [18:41:26.705] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:26.705] List of 2 [18:41:26.705] $ ...future.FUN:function (x) [18:41:26.705] $ ... : list() [18:41:26.705] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:26.705] - attr(*, "where")=List of 2 [18:41:26.705] ..$ ...future.FUN: [18:41:26.705] ..$ ... : [18:41:26.705] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:26.705] - attr(*, "resolved")= logi FALSE [18:41:26.705] - attr(*, "total_size")= int 2891 [18:41:26.712] Packages to be attached in all futures: [n=0] [18:41:26.712] getGlobalsAndPackagesXApply() ... DONE [18:41:26.712] Number of futures (= number of chunks): 2 [18:41:26.712] Launching 2 futures (chunks) ... [18:41:26.712] Chunk #1 of 2 ... [18:41:26.713] - Finding globals in 'X' for chunk #1 ... [18:41:26.713] getGlobalsAndPackages() ... [18:41:26.713] Searching for globals... [18:41:26.713] [18:41:26.713] Searching for globals ... DONE [18:41:26.714] - globals: [0] [18:41:26.714] getGlobalsAndPackages() ... DONE [18:41:26.714] + additional globals found: [n=0] [18:41:26.714] + additional namespaces needed: [n=0] [18:41:26.714] - Finding globals in 'X' for chunk #1 ... DONE [18:41:26.714] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:26.715] - seeds: [18:41:26.715] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:26.715] getGlobalsAndPackages() ... [18:41:26.715] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:26.715] Resolving globals: FALSE [18:41:26.715] Tweak future expression to call with '...' arguments ... [18:41:26.716] { [18:41:26.716] do.call(function(...) { [18:41:26.716] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:26.716] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:26.716] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:26.716] on.exit(options(oopts), add = TRUE) [18:41:26.716] } [18:41:26.716] { [18:41:26.716] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:26.716] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:26.716] ...future.FUN(...future.X_jj, ...) [18:41:26.716] }) [18:41:26.716] } [18:41:26.716] }, args = future.call.arguments) [18:41:26.716] } [18:41:26.716] Tweak future expression to call with '...' arguments ... DONE [18:41:26.717] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:26.717] [18:41:26.717] getGlobalsAndPackages() ... DONE [18:41:26.717] run() for 'Future' ... [18:41:26.717] - state: 'created' [18:41:26.718] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:26.733] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:26.733] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:26.734] - Field: 'node' [18:41:26.734] - Field: 'label' [18:41:26.734] - Field: 'local' [18:41:26.734] - Field: 'owner' [18:41:26.734] - Field: 'envir' [18:41:26.735] - Field: 'workers' [18:41:26.735] - Field: 'packages' [18:41:26.735] - Field: 'gc' [18:41:26.735] - Field: 'conditions' [18:41:26.735] - Field: 'persistent' [18:41:26.735] - Field: 'expr' [18:41:26.736] - Field: 'uuid' [18:41:26.736] - Field: 'seed' [18:41:26.736] - Field: 'version' [18:41:26.736] - Field: 'result' [18:41:26.736] - Field: 'asynchronous' [18:41:26.736] - Field: 'calls' [18:41:26.737] - Field: 'globals' [18:41:26.737] - Field: 'stdout' [18:41:26.737] - Field: 'earlySignal' [18:41:26.737] - Field: 'lazy' [18:41:26.737] - Field: 'state' [18:41:26.737] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:26.738] - Launch lazy future ... [18:41:26.738] Packages needed by the future expression (n = 0): [18:41:26.738] Packages needed by future strategies (n = 0): [18:41:26.739] { [18:41:26.739] { [18:41:26.739] { [18:41:26.739] ...future.startTime <- base::Sys.time() [18:41:26.739] { [18:41:26.739] { [18:41:26.739] { [18:41:26.739] { [18:41:26.739] base::local({ [18:41:26.739] has_future <- base::requireNamespace("future", [18:41:26.739] quietly = TRUE) [18:41:26.739] if (has_future) { [18:41:26.739] ns <- base::getNamespace("future") [18:41:26.739] version <- ns[[".package"]][["version"]] [18:41:26.739] if (is.null(version)) [18:41:26.739] version <- utils::packageVersion("future") [18:41:26.739] } [18:41:26.739] else { [18:41:26.739] version <- NULL [18:41:26.739] } [18:41:26.739] if (!has_future || version < "1.8.0") { [18:41:26.739] info <- base::c(r_version = base::gsub("R version ", [18:41:26.739] "", base::R.version$version.string), [18:41:26.739] platform = base::sprintf("%s (%s-bit)", [18:41:26.739] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:26.739] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:26.739] "release", "version")], collapse = " "), [18:41:26.739] hostname = base::Sys.info()[["nodename"]]) [18:41:26.739] info <- base::sprintf("%s: %s", base::names(info), [18:41:26.739] info) [18:41:26.739] info <- base::paste(info, collapse = "; ") [18:41:26.739] if (!has_future) { [18:41:26.739] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:26.739] info) [18:41:26.739] } [18:41:26.739] else { [18:41:26.739] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:26.739] info, version) [18:41:26.739] } [18:41:26.739] base::stop(msg) [18:41:26.739] } [18:41:26.739] }) [18:41:26.739] } [18:41:26.739] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:26.739] base::options(mc.cores = 1L) [18:41:26.739] } [18:41:26.739] ...future.strategy.old <- future::plan("list") [18:41:26.739] options(future.plan = NULL) [18:41:26.739] Sys.unsetenv("R_FUTURE_PLAN") [18:41:26.739] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:26.739] } [18:41:26.739] ...future.workdir <- getwd() [18:41:26.739] } [18:41:26.739] ...future.oldOptions <- base::as.list(base::.Options) [18:41:26.739] ...future.oldEnvVars <- base::Sys.getenv() [18:41:26.739] } [18:41:26.739] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:26.739] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:26.739] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:26.739] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:26.739] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:26.739] future.stdout.windows.reencode = NULL, width = 80L) [18:41:26.739] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:26.739] base::names(...future.oldOptions)) [18:41:26.739] } [18:41:26.739] if (FALSE) { [18:41:26.739] } [18:41:26.739] else { [18:41:26.739] if (TRUE) { [18:41:26.739] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:26.739] open = "w") [18:41:26.739] } [18:41:26.739] else { [18:41:26.739] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:26.739] windows = "NUL", "/dev/null"), open = "w") [18:41:26.739] } [18:41:26.739] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:26.739] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:26.739] base::sink(type = "output", split = FALSE) [18:41:26.739] base::close(...future.stdout) [18:41:26.739] }, add = TRUE) [18:41:26.739] } [18:41:26.739] ...future.frame <- base::sys.nframe() [18:41:26.739] ...future.conditions <- base::list() [18:41:26.739] ...future.rng <- base::globalenv()$.Random.seed [18:41:26.739] if (FALSE) { [18:41:26.739] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:26.739] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:26.739] } [18:41:26.739] ...future.result <- base::tryCatch({ [18:41:26.739] base::withCallingHandlers({ [18:41:26.739] ...future.value <- base::withVisible(base::local({ [18:41:26.739] ...future.makeSendCondition <- base::local({ [18:41:26.739] sendCondition <- NULL [18:41:26.739] function(frame = 1L) { [18:41:26.739] if (is.function(sendCondition)) [18:41:26.739] return(sendCondition) [18:41:26.739] ns <- getNamespace("parallel") [18:41:26.739] if (exists("sendData", mode = "function", [18:41:26.739] envir = ns)) { [18:41:26.739] parallel_sendData <- get("sendData", mode = "function", [18:41:26.739] envir = ns) [18:41:26.739] envir <- sys.frame(frame) [18:41:26.739] master <- NULL [18:41:26.739] while (!identical(envir, .GlobalEnv) && [18:41:26.739] !identical(envir, emptyenv())) { [18:41:26.739] if (exists("master", mode = "list", envir = envir, [18:41:26.739] inherits = FALSE)) { [18:41:26.739] master <- get("master", mode = "list", [18:41:26.739] envir = envir, inherits = FALSE) [18:41:26.739] if (inherits(master, c("SOCKnode", [18:41:26.739] "SOCK0node"))) { [18:41:26.739] sendCondition <<- function(cond) { [18:41:26.739] data <- list(type = "VALUE", value = cond, [18:41:26.739] success = TRUE) [18:41:26.739] parallel_sendData(master, data) [18:41:26.739] } [18:41:26.739] return(sendCondition) [18:41:26.739] } [18:41:26.739] } [18:41:26.739] frame <- frame + 1L [18:41:26.739] envir <- sys.frame(frame) [18:41:26.739] } [18:41:26.739] } [18:41:26.739] sendCondition <<- function(cond) NULL [18:41:26.739] } [18:41:26.739] }) [18:41:26.739] withCallingHandlers({ [18:41:26.739] { [18:41:26.739] do.call(function(...) { [18:41:26.739] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:26.739] if (!identical(...future.globals.maxSize.org, [18:41:26.739] ...future.globals.maxSize)) { [18:41:26.739] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:26.739] on.exit(options(oopts), add = TRUE) [18:41:26.739] } [18:41:26.739] { [18:41:26.739] lapply(seq_along(...future.elements_ii), [18:41:26.739] FUN = function(jj) { [18:41:26.739] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:26.739] ...future.FUN(...future.X_jj, ...) [18:41:26.739] }) [18:41:26.739] } [18:41:26.739] }, args = future.call.arguments) [18:41:26.739] } [18:41:26.739] }, immediateCondition = function(cond) { [18:41:26.739] sendCondition <- ...future.makeSendCondition() [18:41:26.739] sendCondition(cond) [18:41:26.739] muffleCondition <- function (cond, pattern = "^muffle") [18:41:26.739] { [18:41:26.739] inherits <- base::inherits [18:41:26.739] invokeRestart <- base::invokeRestart [18:41:26.739] is.null <- base::is.null [18:41:26.739] muffled <- FALSE [18:41:26.739] if (inherits(cond, "message")) { [18:41:26.739] muffled <- grepl(pattern, "muffleMessage") [18:41:26.739] if (muffled) [18:41:26.739] invokeRestart("muffleMessage") [18:41:26.739] } [18:41:26.739] else if (inherits(cond, "warning")) { [18:41:26.739] muffled <- grepl(pattern, "muffleWarning") [18:41:26.739] if (muffled) [18:41:26.739] invokeRestart("muffleWarning") [18:41:26.739] } [18:41:26.739] else if (inherits(cond, "condition")) { [18:41:26.739] if (!is.null(pattern)) { [18:41:26.739] computeRestarts <- base::computeRestarts [18:41:26.739] grepl <- base::grepl [18:41:26.739] restarts <- computeRestarts(cond) [18:41:26.739] for (restart in restarts) { [18:41:26.739] name <- restart$name [18:41:26.739] if (is.null(name)) [18:41:26.739] next [18:41:26.739] if (!grepl(pattern, name)) [18:41:26.739] next [18:41:26.739] invokeRestart(restart) [18:41:26.739] muffled <- TRUE [18:41:26.739] break [18:41:26.739] } [18:41:26.739] } [18:41:26.739] } [18:41:26.739] invisible(muffled) [18:41:26.739] } [18:41:26.739] muffleCondition(cond) [18:41:26.739] }) [18:41:26.739] })) [18:41:26.739] future::FutureResult(value = ...future.value$value, [18:41:26.739] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:26.739] ...future.rng), globalenv = if (FALSE) [18:41:26.739] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:26.739] ...future.globalenv.names)) [18:41:26.739] else NULL, started = ...future.startTime, version = "1.8") [18:41:26.739] }, condition = base::local({ [18:41:26.739] c <- base::c [18:41:26.739] inherits <- base::inherits [18:41:26.739] invokeRestart <- base::invokeRestart [18:41:26.739] length <- base::length [18:41:26.739] list <- base::list [18:41:26.739] seq.int <- base::seq.int [18:41:26.739] signalCondition <- base::signalCondition [18:41:26.739] sys.calls <- base::sys.calls [18:41:26.739] `[[` <- base::`[[` [18:41:26.739] `+` <- base::`+` [18:41:26.739] `<<-` <- base::`<<-` [18:41:26.739] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:26.739] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:26.739] 3L)] [18:41:26.739] } [18:41:26.739] function(cond) { [18:41:26.739] is_error <- inherits(cond, "error") [18:41:26.739] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:26.739] NULL) [18:41:26.739] if (is_error) { [18:41:26.739] sessionInformation <- function() { [18:41:26.739] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:26.739] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:26.739] search = base::search(), system = base::Sys.info()) [18:41:26.739] } [18:41:26.739] ...future.conditions[[length(...future.conditions) + [18:41:26.739] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:26.739] cond$call), session = sessionInformation(), [18:41:26.739] timestamp = base::Sys.time(), signaled = 0L) [18:41:26.739] signalCondition(cond) [18:41:26.739] } [18:41:26.739] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:26.739] "immediateCondition"))) { [18:41:26.739] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:26.739] ...future.conditions[[length(...future.conditions) + [18:41:26.739] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:26.739] if (TRUE && !signal) { [18:41:26.739] muffleCondition <- function (cond, pattern = "^muffle") [18:41:26.739] { [18:41:26.739] inherits <- base::inherits [18:41:26.739] invokeRestart <- base::invokeRestart [18:41:26.739] is.null <- base::is.null [18:41:26.739] muffled <- FALSE [18:41:26.739] if (inherits(cond, "message")) { [18:41:26.739] muffled <- grepl(pattern, "muffleMessage") [18:41:26.739] if (muffled) [18:41:26.739] invokeRestart("muffleMessage") [18:41:26.739] } [18:41:26.739] else if (inherits(cond, "warning")) { [18:41:26.739] muffled <- grepl(pattern, "muffleWarning") [18:41:26.739] if (muffled) [18:41:26.739] invokeRestart("muffleWarning") [18:41:26.739] } [18:41:26.739] else if (inherits(cond, "condition")) { [18:41:26.739] if (!is.null(pattern)) { [18:41:26.739] computeRestarts <- base::computeRestarts [18:41:26.739] grepl <- base::grepl [18:41:26.739] restarts <- computeRestarts(cond) [18:41:26.739] for (restart in restarts) { [18:41:26.739] name <- restart$name [18:41:26.739] if (is.null(name)) [18:41:26.739] next [18:41:26.739] if (!grepl(pattern, name)) [18:41:26.739] next [18:41:26.739] invokeRestart(restart) [18:41:26.739] muffled <- TRUE [18:41:26.739] break [18:41:26.739] } [18:41:26.739] } [18:41:26.739] } [18:41:26.739] invisible(muffled) [18:41:26.739] } [18:41:26.739] muffleCondition(cond, pattern = "^muffle") [18:41:26.739] } [18:41:26.739] } [18:41:26.739] else { [18:41:26.739] if (TRUE) { [18:41:26.739] muffleCondition <- function (cond, pattern = "^muffle") [18:41:26.739] { [18:41:26.739] inherits <- base::inherits [18:41:26.739] invokeRestart <- base::invokeRestart [18:41:26.739] is.null <- base::is.null [18:41:26.739] muffled <- FALSE [18:41:26.739] if (inherits(cond, "message")) { [18:41:26.739] muffled <- grepl(pattern, "muffleMessage") [18:41:26.739] if (muffled) [18:41:26.739] invokeRestart("muffleMessage") [18:41:26.739] } [18:41:26.739] else if (inherits(cond, "warning")) { [18:41:26.739] muffled <- grepl(pattern, "muffleWarning") [18:41:26.739] if (muffled) [18:41:26.739] invokeRestart("muffleWarning") [18:41:26.739] } [18:41:26.739] else if (inherits(cond, "condition")) { [18:41:26.739] if (!is.null(pattern)) { [18:41:26.739] computeRestarts <- base::computeRestarts [18:41:26.739] grepl <- base::grepl [18:41:26.739] restarts <- computeRestarts(cond) [18:41:26.739] for (restart in restarts) { [18:41:26.739] name <- restart$name [18:41:26.739] if (is.null(name)) [18:41:26.739] next [18:41:26.739] if (!grepl(pattern, name)) [18:41:26.739] next [18:41:26.739] invokeRestart(restart) [18:41:26.739] muffled <- TRUE [18:41:26.739] break [18:41:26.739] } [18:41:26.739] } [18:41:26.739] } [18:41:26.739] invisible(muffled) [18:41:26.739] } [18:41:26.739] muffleCondition(cond, pattern = "^muffle") [18:41:26.739] } [18:41:26.739] } [18:41:26.739] } [18:41:26.739] })) [18:41:26.739] }, error = function(ex) { [18:41:26.739] base::structure(base::list(value = NULL, visible = NULL, [18:41:26.739] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:26.739] ...future.rng), started = ...future.startTime, [18:41:26.739] finished = Sys.time(), session_uuid = NA_character_, [18:41:26.739] version = "1.8"), class = "FutureResult") [18:41:26.739] }, finally = { [18:41:26.739] if (!identical(...future.workdir, getwd())) [18:41:26.739] setwd(...future.workdir) [18:41:26.739] { [18:41:26.739] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:26.739] ...future.oldOptions$nwarnings <- NULL [18:41:26.739] } [18:41:26.739] base::options(...future.oldOptions) [18:41:26.739] if (.Platform$OS.type == "windows") { [18:41:26.739] old_names <- names(...future.oldEnvVars) [18:41:26.739] envs <- base::Sys.getenv() [18:41:26.739] names <- names(envs) [18:41:26.739] common <- intersect(names, old_names) [18:41:26.739] added <- setdiff(names, old_names) [18:41:26.739] removed <- setdiff(old_names, names) [18:41:26.739] changed <- common[...future.oldEnvVars[common] != [18:41:26.739] envs[common]] [18:41:26.739] NAMES <- toupper(changed) [18:41:26.739] args <- list() [18:41:26.739] for (kk in seq_along(NAMES)) { [18:41:26.739] name <- changed[[kk]] [18:41:26.739] NAME <- NAMES[[kk]] [18:41:26.739] if (name != NAME && is.element(NAME, old_names)) [18:41:26.739] next [18:41:26.739] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:26.739] } [18:41:26.739] NAMES <- toupper(added) [18:41:26.739] for (kk in seq_along(NAMES)) { [18:41:26.739] name <- added[[kk]] [18:41:26.739] NAME <- NAMES[[kk]] [18:41:26.739] if (name != NAME && is.element(NAME, old_names)) [18:41:26.739] next [18:41:26.739] args[[name]] <- "" [18:41:26.739] } [18:41:26.739] NAMES <- toupper(removed) [18:41:26.739] for (kk in seq_along(NAMES)) { [18:41:26.739] name <- removed[[kk]] [18:41:26.739] NAME <- NAMES[[kk]] [18:41:26.739] if (name != NAME && is.element(NAME, old_names)) [18:41:26.739] next [18:41:26.739] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:26.739] } [18:41:26.739] if (length(args) > 0) [18:41:26.739] base::do.call(base::Sys.setenv, args = args) [18:41:26.739] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:26.739] } [18:41:26.739] else { [18:41:26.739] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:26.739] } [18:41:26.739] { [18:41:26.739] if (base::length(...future.futureOptionsAdded) > [18:41:26.739] 0L) { [18:41:26.739] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:26.739] base::names(opts) <- ...future.futureOptionsAdded [18:41:26.739] base::options(opts) [18:41:26.739] } [18:41:26.739] { [18:41:26.739] { [18:41:26.739] base::options(mc.cores = ...future.mc.cores.old) [18:41:26.739] NULL [18:41:26.739] } [18:41:26.739] options(future.plan = NULL) [18:41:26.739] if (is.na(NA_character_)) [18:41:26.739] Sys.unsetenv("R_FUTURE_PLAN") [18:41:26.739] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:26.739] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:26.739] .init = FALSE) [18:41:26.739] } [18:41:26.739] } [18:41:26.739] } [18:41:26.739] }) [18:41:26.739] if (TRUE) { [18:41:26.739] base::sink(type = "output", split = FALSE) [18:41:26.739] if (TRUE) { [18:41:26.739] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:26.739] } [18:41:26.739] else { [18:41:26.739] ...future.result["stdout"] <- base::list(NULL) [18:41:26.739] } [18:41:26.739] base::close(...future.stdout) [18:41:26.739] ...future.stdout <- NULL [18:41:26.739] } [18:41:26.739] ...future.result$conditions <- ...future.conditions [18:41:26.739] ...future.result$finished <- base::Sys.time() [18:41:26.739] ...future.result [18:41:26.739] } [18:41:26.744] Exporting 5 global objects (740 bytes) to cluster node #1 ... [18:41:26.744] Exporting '...future.FUN' (37 bytes) to cluster node #1 ... [18:41:26.745] Exporting '...future.FUN' (37 bytes) to cluster node #1 ... DONE [18:41:26.745] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:26.745] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:26.745] Exporting '...future.elements_ii' (89 bytes) to cluster node #1 ... [18:41:26.746] Exporting '...future.elements_ii' (89 bytes) to cluster node #1 ... DONE [18:41:26.746] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:26.746] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:26.746] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:26.747] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:26.747] Exporting 5 global objects (740 bytes) to cluster node #1 ... DONE [18:41:26.748] MultisessionFuture started [18:41:26.748] - Launch lazy future ... done [18:41:26.748] run() for 'MultisessionFuture' ... done [18:41:26.748] Created future: [18:41:26.764] receiveMessageFromWorker() for ClusterFuture ... [18:41:26.764] - Validating connection of MultisessionFuture [18:41:26.765] - received message: FutureResult [18:41:26.765] - Received FutureResult [18:41:26.765] - Erased future from FutureRegistry [18:41:26.765] result() for ClusterFuture ... [18:41:26.765] - result already collected: FutureResult [18:41:26.765] result() for ClusterFuture ... done [18:41:26.766] receiveMessageFromWorker() for ClusterFuture ... done [18:41:26.748] MultisessionFuture: [18:41:26.748] Label: 'future_lapply-1' [18:41:26.748] Expression: [18:41:26.748] { [18:41:26.748] do.call(function(...) { [18:41:26.748] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:26.748] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:26.748] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:26.748] on.exit(options(oopts), add = TRUE) [18:41:26.748] } [18:41:26.748] { [18:41:26.748] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:26.748] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:26.748] ...future.FUN(...future.X_jj, ...) [18:41:26.748] }) [18:41:26.748] } [18:41:26.748] }, args = future.call.arguments) [18:41:26.748] } [18:41:26.748] Lazy evaluation: FALSE [18:41:26.748] Asynchronous evaluation: TRUE [18:41:26.748] Local evaluation: TRUE [18:41:26.748] Environment: R_GlobalEnv [18:41:26.748] Capture standard output: TRUE [18:41:26.748] Capture condition classes: 'condition' (excluding 'nothing') [18:41:26.748] Globals: 5 objects totaling 277 bytes (function '...future.FUN' of 37 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 89 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:26.748] Packages: [18:41:26.748] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:26.748] Resolved: TRUE [18:41:26.748] Value: [18:41:26.748] Conditions captured: [18:41:26.748] Early signaling: FALSE [18:41:26.748] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:26.748] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:26.766] Chunk #1 of 2 ... DONE [18:41:26.766] Chunk #2 of 2 ... [18:41:26.767] - Finding globals in 'X' for chunk #2 ... [18:41:26.767] getGlobalsAndPackages() ... [18:41:26.767] Searching for globals... [18:41:26.767] [18:41:26.767] Searching for globals ... DONE [18:41:26.768] - globals: [0] [18:41:26.768] getGlobalsAndPackages() ... DONE [18:41:26.768] + additional globals found: [n=0] [18:41:26.768] + additional namespaces needed: [n=0] [18:41:26.768] - Finding globals in 'X' for chunk #2 ... DONE [18:41:26.768] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:26.768] - seeds: [18:41:26.769] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:26.769] getGlobalsAndPackages() ... [18:41:26.769] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:26.769] Resolving globals: FALSE [18:41:26.769] Tweak future expression to call with '...' arguments ... [18:41:26.770] { [18:41:26.770] do.call(function(...) { [18:41:26.770] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:26.770] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:26.770] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:26.770] on.exit(options(oopts), add = TRUE) [18:41:26.770] } [18:41:26.770] { [18:41:26.770] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:26.770] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:26.770] ...future.FUN(...future.X_jj, ...) [18:41:26.770] }) [18:41:26.770] } [18:41:26.770] }, args = future.call.arguments) [18:41:26.770] } [18:41:26.770] Tweak future expression to call with '...' arguments ... DONE [18:41:26.770] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:26.771] [18:41:26.771] getGlobalsAndPackages() ... DONE [18:41:26.771] run() for 'Future' ... [18:41:26.771] - state: 'created' [18:41:26.772] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:26.788] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:26.788] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:26.788] - Field: 'node' [18:41:26.789] - Field: 'label' [18:41:26.789] - Field: 'local' [18:41:26.789] - Field: 'owner' [18:41:26.789] - Field: 'envir' [18:41:26.789] - Field: 'workers' [18:41:26.790] - Field: 'packages' [18:41:26.790] - Field: 'gc' [18:41:26.790] - Field: 'conditions' [18:41:26.790] - Field: 'persistent' [18:41:26.790] - Field: 'expr' [18:41:26.791] - Field: 'uuid' [18:41:26.791] - Field: 'seed' [18:41:26.791] - Field: 'version' [18:41:26.791] - Field: 'result' [18:41:26.791] - Field: 'asynchronous' [18:41:26.791] - Field: 'calls' [18:41:26.792] - Field: 'globals' [18:41:26.792] - Field: 'stdout' [18:41:26.792] - Field: 'earlySignal' [18:41:26.792] - Field: 'lazy' [18:41:26.792] - Field: 'state' [18:41:26.792] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:26.793] - Launch lazy future ... [18:41:26.793] Packages needed by the future expression (n = 0): [18:41:26.793] Packages needed by future strategies (n = 0): [18:41:26.794] { [18:41:26.794] { [18:41:26.794] { [18:41:26.794] ...future.startTime <- base::Sys.time() [18:41:26.794] { [18:41:26.794] { [18:41:26.794] { [18:41:26.794] { [18:41:26.794] base::local({ [18:41:26.794] has_future <- base::requireNamespace("future", [18:41:26.794] quietly = TRUE) [18:41:26.794] if (has_future) { [18:41:26.794] ns <- base::getNamespace("future") [18:41:26.794] version <- ns[[".package"]][["version"]] [18:41:26.794] if (is.null(version)) [18:41:26.794] version <- utils::packageVersion("future") [18:41:26.794] } [18:41:26.794] else { [18:41:26.794] version <- NULL [18:41:26.794] } [18:41:26.794] if (!has_future || version < "1.8.0") { [18:41:26.794] info <- base::c(r_version = base::gsub("R version ", [18:41:26.794] "", base::R.version$version.string), [18:41:26.794] platform = base::sprintf("%s (%s-bit)", [18:41:26.794] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:26.794] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:26.794] "release", "version")], collapse = " "), [18:41:26.794] hostname = base::Sys.info()[["nodename"]]) [18:41:26.794] info <- base::sprintf("%s: %s", base::names(info), [18:41:26.794] info) [18:41:26.794] info <- base::paste(info, collapse = "; ") [18:41:26.794] if (!has_future) { [18:41:26.794] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:26.794] info) [18:41:26.794] } [18:41:26.794] else { [18:41:26.794] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:26.794] info, version) [18:41:26.794] } [18:41:26.794] base::stop(msg) [18:41:26.794] } [18:41:26.794] }) [18:41:26.794] } [18:41:26.794] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:26.794] base::options(mc.cores = 1L) [18:41:26.794] } [18:41:26.794] ...future.strategy.old <- future::plan("list") [18:41:26.794] options(future.plan = NULL) [18:41:26.794] Sys.unsetenv("R_FUTURE_PLAN") [18:41:26.794] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:26.794] } [18:41:26.794] ...future.workdir <- getwd() [18:41:26.794] } [18:41:26.794] ...future.oldOptions <- base::as.list(base::.Options) [18:41:26.794] ...future.oldEnvVars <- base::Sys.getenv() [18:41:26.794] } [18:41:26.794] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:26.794] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:26.794] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:26.794] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:26.794] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:26.794] future.stdout.windows.reencode = NULL, width = 80L) [18:41:26.794] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:26.794] base::names(...future.oldOptions)) [18:41:26.794] } [18:41:26.794] if (FALSE) { [18:41:26.794] } [18:41:26.794] else { [18:41:26.794] if (TRUE) { [18:41:26.794] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:26.794] open = "w") [18:41:26.794] } [18:41:26.794] else { [18:41:26.794] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:26.794] windows = "NUL", "/dev/null"), open = "w") [18:41:26.794] } [18:41:26.794] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:26.794] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:26.794] base::sink(type = "output", split = FALSE) [18:41:26.794] base::close(...future.stdout) [18:41:26.794] }, add = TRUE) [18:41:26.794] } [18:41:26.794] ...future.frame <- base::sys.nframe() [18:41:26.794] ...future.conditions <- base::list() [18:41:26.794] ...future.rng <- base::globalenv()$.Random.seed [18:41:26.794] if (FALSE) { [18:41:26.794] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:26.794] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:26.794] } [18:41:26.794] ...future.result <- base::tryCatch({ [18:41:26.794] base::withCallingHandlers({ [18:41:26.794] ...future.value <- base::withVisible(base::local({ [18:41:26.794] ...future.makeSendCondition <- base::local({ [18:41:26.794] sendCondition <- NULL [18:41:26.794] function(frame = 1L) { [18:41:26.794] if (is.function(sendCondition)) [18:41:26.794] return(sendCondition) [18:41:26.794] ns <- getNamespace("parallel") [18:41:26.794] if (exists("sendData", mode = "function", [18:41:26.794] envir = ns)) { [18:41:26.794] parallel_sendData <- get("sendData", mode = "function", [18:41:26.794] envir = ns) [18:41:26.794] envir <- sys.frame(frame) [18:41:26.794] master <- NULL [18:41:26.794] while (!identical(envir, .GlobalEnv) && [18:41:26.794] !identical(envir, emptyenv())) { [18:41:26.794] if (exists("master", mode = "list", envir = envir, [18:41:26.794] inherits = FALSE)) { [18:41:26.794] master <- get("master", mode = "list", [18:41:26.794] envir = envir, inherits = FALSE) [18:41:26.794] if (inherits(master, c("SOCKnode", [18:41:26.794] "SOCK0node"))) { [18:41:26.794] sendCondition <<- function(cond) { [18:41:26.794] data <- list(type = "VALUE", value = cond, [18:41:26.794] success = TRUE) [18:41:26.794] parallel_sendData(master, data) [18:41:26.794] } [18:41:26.794] return(sendCondition) [18:41:26.794] } [18:41:26.794] } [18:41:26.794] frame <- frame + 1L [18:41:26.794] envir <- sys.frame(frame) [18:41:26.794] } [18:41:26.794] } [18:41:26.794] sendCondition <<- function(cond) NULL [18:41:26.794] } [18:41:26.794] }) [18:41:26.794] withCallingHandlers({ [18:41:26.794] { [18:41:26.794] do.call(function(...) { [18:41:26.794] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:26.794] if (!identical(...future.globals.maxSize.org, [18:41:26.794] ...future.globals.maxSize)) { [18:41:26.794] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:26.794] on.exit(options(oopts), add = TRUE) [18:41:26.794] } [18:41:26.794] { [18:41:26.794] lapply(seq_along(...future.elements_ii), [18:41:26.794] FUN = function(jj) { [18:41:26.794] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:26.794] ...future.FUN(...future.X_jj, ...) [18:41:26.794] }) [18:41:26.794] } [18:41:26.794] }, args = future.call.arguments) [18:41:26.794] } [18:41:26.794] }, immediateCondition = function(cond) { [18:41:26.794] sendCondition <- ...future.makeSendCondition() [18:41:26.794] sendCondition(cond) [18:41:26.794] muffleCondition <- function (cond, pattern = "^muffle") [18:41:26.794] { [18:41:26.794] inherits <- base::inherits [18:41:26.794] invokeRestart <- base::invokeRestart [18:41:26.794] is.null <- base::is.null [18:41:26.794] muffled <- FALSE [18:41:26.794] if (inherits(cond, "message")) { [18:41:26.794] muffled <- grepl(pattern, "muffleMessage") [18:41:26.794] if (muffled) [18:41:26.794] invokeRestart("muffleMessage") [18:41:26.794] } [18:41:26.794] else if (inherits(cond, "warning")) { [18:41:26.794] muffled <- grepl(pattern, "muffleWarning") [18:41:26.794] if (muffled) [18:41:26.794] invokeRestart("muffleWarning") [18:41:26.794] } [18:41:26.794] else if (inherits(cond, "condition")) { [18:41:26.794] if (!is.null(pattern)) { [18:41:26.794] computeRestarts <- base::computeRestarts [18:41:26.794] grepl <- base::grepl [18:41:26.794] restarts <- computeRestarts(cond) [18:41:26.794] for (restart in restarts) { [18:41:26.794] name <- restart$name [18:41:26.794] if (is.null(name)) [18:41:26.794] next [18:41:26.794] if (!grepl(pattern, name)) [18:41:26.794] next [18:41:26.794] invokeRestart(restart) [18:41:26.794] muffled <- TRUE [18:41:26.794] break [18:41:26.794] } [18:41:26.794] } [18:41:26.794] } [18:41:26.794] invisible(muffled) [18:41:26.794] } [18:41:26.794] muffleCondition(cond) [18:41:26.794] }) [18:41:26.794] })) [18:41:26.794] future::FutureResult(value = ...future.value$value, [18:41:26.794] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:26.794] ...future.rng), globalenv = if (FALSE) [18:41:26.794] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:26.794] ...future.globalenv.names)) [18:41:26.794] else NULL, started = ...future.startTime, version = "1.8") [18:41:26.794] }, condition = base::local({ [18:41:26.794] c <- base::c [18:41:26.794] inherits <- base::inherits [18:41:26.794] invokeRestart <- base::invokeRestart [18:41:26.794] length <- base::length [18:41:26.794] list <- base::list [18:41:26.794] seq.int <- base::seq.int [18:41:26.794] signalCondition <- base::signalCondition [18:41:26.794] sys.calls <- base::sys.calls [18:41:26.794] `[[` <- base::`[[` [18:41:26.794] `+` <- base::`+` [18:41:26.794] `<<-` <- base::`<<-` [18:41:26.794] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:26.794] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:26.794] 3L)] [18:41:26.794] } [18:41:26.794] function(cond) { [18:41:26.794] is_error <- inherits(cond, "error") [18:41:26.794] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:26.794] NULL) [18:41:26.794] if (is_error) { [18:41:26.794] sessionInformation <- function() { [18:41:26.794] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:26.794] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:26.794] search = base::search(), system = base::Sys.info()) [18:41:26.794] } [18:41:26.794] ...future.conditions[[length(...future.conditions) + [18:41:26.794] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:26.794] cond$call), session = sessionInformation(), [18:41:26.794] timestamp = base::Sys.time(), signaled = 0L) [18:41:26.794] signalCondition(cond) [18:41:26.794] } [18:41:26.794] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:26.794] "immediateCondition"))) { [18:41:26.794] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:26.794] ...future.conditions[[length(...future.conditions) + [18:41:26.794] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:26.794] if (TRUE && !signal) { [18:41:26.794] muffleCondition <- function (cond, pattern = "^muffle") [18:41:26.794] { [18:41:26.794] inherits <- base::inherits [18:41:26.794] invokeRestart <- base::invokeRestart [18:41:26.794] is.null <- base::is.null [18:41:26.794] muffled <- FALSE [18:41:26.794] if (inherits(cond, "message")) { [18:41:26.794] muffled <- grepl(pattern, "muffleMessage") [18:41:26.794] if (muffled) [18:41:26.794] invokeRestart("muffleMessage") [18:41:26.794] } [18:41:26.794] else if (inherits(cond, "warning")) { [18:41:26.794] muffled <- grepl(pattern, "muffleWarning") [18:41:26.794] if (muffled) [18:41:26.794] invokeRestart("muffleWarning") [18:41:26.794] } [18:41:26.794] else if (inherits(cond, "condition")) { [18:41:26.794] if (!is.null(pattern)) { [18:41:26.794] computeRestarts <- base::computeRestarts [18:41:26.794] grepl <- base::grepl [18:41:26.794] restarts <- computeRestarts(cond) [18:41:26.794] for (restart in restarts) { [18:41:26.794] name <- restart$name [18:41:26.794] if (is.null(name)) [18:41:26.794] next [18:41:26.794] if (!grepl(pattern, name)) [18:41:26.794] next [18:41:26.794] invokeRestart(restart) [18:41:26.794] muffled <- TRUE [18:41:26.794] break [18:41:26.794] } [18:41:26.794] } [18:41:26.794] } [18:41:26.794] invisible(muffled) [18:41:26.794] } [18:41:26.794] muffleCondition(cond, pattern = "^muffle") [18:41:26.794] } [18:41:26.794] } [18:41:26.794] else { [18:41:26.794] if (TRUE) { [18:41:26.794] muffleCondition <- function (cond, pattern = "^muffle") [18:41:26.794] { [18:41:26.794] inherits <- base::inherits [18:41:26.794] invokeRestart <- base::invokeRestart [18:41:26.794] is.null <- base::is.null [18:41:26.794] muffled <- FALSE [18:41:26.794] if (inherits(cond, "message")) { [18:41:26.794] muffled <- grepl(pattern, "muffleMessage") [18:41:26.794] if (muffled) [18:41:26.794] invokeRestart("muffleMessage") [18:41:26.794] } [18:41:26.794] else if (inherits(cond, "warning")) { [18:41:26.794] muffled <- grepl(pattern, "muffleWarning") [18:41:26.794] if (muffled) [18:41:26.794] invokeRestart("muffleWarning") [18:41:26.794] } [18:41:26.794] else if (inherits(cond, "condition")) { [18:41:26.794] if (!is.null(pattern)) { [18:41:26.794] computeRestarts <- base::computeRestarts [18:41:26.794] grepl <- base::grepl [18:41:26.794] restarts <- computeRestarts(cond) [18:41:26.794] for (restart in restarts) { [18:41:26.794] name <- restart$name [18:41:26.794] if (is.null(name)) [18:41:26.794] next [18:41:26.794] if (!grepl(pattern, name)) [18:41:26.794] next [18:41:26.794] invokeRestart(restart) [18:41:26.794] muffled <- TRUE [18:41:26.794] break [18:41:26.794] } [18:41:26.794] } [18:41:26.794] } [18:41:26.794] invisible(muffled) [18:41:26.794] } [18:41:26.794] muffleCondition(cond, pattern = "^muffle") [18:41:26.794] } [18:41:26.794] } [18:41:26.794] } [18:41:26.794] })) [18:41:26.794] }, error = function(ex) { [18:41:26.794] base::structure(base::list(value = NULL, visible = NULL, [18:41:26.794] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:26.794] ...future.rng), started = ...future.startTime, [18:41:26.794] finished = Sys.time(), session_uuid = NA_character_, [18:41:26.794] version = "1.8"), class = "FutureResult") [18:41:26.794] }, finally = { [18:41:26.794] if (!identical(...future.workdir, getwd())) [18:41:26.794] setwd(...future.workdir) [18:41:26.794] { [18:41:26.794] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:26.794] ...future.oldOptions$nwarnings <- NULL [18:41:26.794] } [18:41:26.794] base::options(...future.oldOptions) [18:41:26.794] if (.Platform$OS.type == "windows") { [18:41:26.794] old_names <- names(...future.oldEnvVars) [18:41:26.794] envs <- base::Sys.getenv() [18:41:26.794] names <- names(envs) [18:41:26.794] common <- intersect(names, old_names) [18:41:26.794] added <- setdiff(names, old_names) [18:41:26.794] removed <- setdiff(old_names, names) [18:41:26.794] changed <- common[...future.oldEnvVars[common] != [18:41:26.794] envs[common]] [18:41:26.794] NAMES <- toupper(changed) [18:41:26.794] args <- list() [18:41:26.794] for (kk in seq_along(NAMES)) { [18:41:26.794] name <- changed[[kk]] [18:41:26.794] NAME <- NAMES[[kk]] [18:41:26.794] if (name != NAME && is.element(NAME, old_names)) [18:41:26.794] next [18:41:26.794] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:26.794] } [18:41:26.794] NAMES <- toupper(added) [18:41:26.794] for (kk in seq_along(NAMES)) { [18:41:26.794] name <- added[[kk]] [18:41:26.794] NAME <- NAMES[[kk]] [18:41:26.794] if (name != NAME && is.element(NAME, old_names)) [18:41:26.794] next [18:41:26.794] args[[name]] <- "" [18:41:26.794] } [18:41:26.794] NAMES <- toupper(removed) [18:41:26.794] for (kk in seq_along(NAMES)) { [18:41:26.794] name <- removed[[kk]] [18:41:26.794] NAME <- NAMES[[kk]] [18:41:26.794] if (name != NAME && is.element(NAME, old_names)) [18:41:26.794] next [18:41:26.794] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:26.794] } [18:41:26.794] if (length(args) > 0) [18:41:26.794] base::do.call(base::Sys.setenv, args = args) [18:41:26.794] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:26.794] } [18:41:26.794] else { [18:41:26.794] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:26.794] } [18:41:26.794] { [18:41:26.794] if (base::length(...future.futureOptionsAdded) > [18:41:26.794] 0L) { [18:41:26.794] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:26.794] base::names(opts) <- ...future.futureOptionsAdded [18:41:26.794] base::options(opts) [18:41:26.794] } [18:41:26.794] { [18:41:26.794] { [18:41:26.794] base::options(mc.cores = ...future.mc.cores.old) [18:41:26.794] NULL [18:41:26.794] } [18:41:26.794] options(future.plan = NULL) [18:41:26.794] if (is.na(NA_character_)) [18:41:26.794] Sys.unsetenv("R_FUTURE_PLAN") [18:41:26.794] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:26.794] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:26.794] .init = FALSE) [18:41:26.794] } [18:41:26.794] } [18:41:26.794] } [18:41:26.794] }) [18:41:26.794] if (TRUE) { [18:41:26.794] base::sink(type = "output", split = FALSE) [18:41:26.794] if (TRUE) { [18:41:26.794] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:26.794] } [18:41:26.794] else { [18:41:26.794] ...future.result["stdout"] <- base::list(NULL) [18:41:26.794] } [18:41:26.794] base::close(...future.stdout) [18:41:26.794] ...future.stdout <- NULL [18:41:26.794] } [18:41:26.794] ...future.result$conditions <- ...future.conditions [18:41:26.794] ...future.result$finished <- base::Sys.time() [18:41:26.794] ...future.result [18:41:26.794] } [18:41:26.799] Exporting 5 global objects (765 bytes) to cluster node #1 ... [18:41:26.800] Exporting '...future.FUN' (37 bytes) to cluster node #1 ... [18:41:26.800] Exporting '...future.FUN' (37 bytes) to cluster node #1 ... DONE [18:41:26.800] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:26.801] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:26.801] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... [18:41:26.801] Exporting '...future.elements_ii' (114 bytes) to cluster node #1 ... DONE [18:41:26.801] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:26.802] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:26.802] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:26.802] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:26.802] Exporting 5 global objects (765 bytes) to cluster node #1 ... DONE [18:41:26.803] MultisessionFuture started [18:41:26.803] - Launch lazy future ... done [18:41:26.803] run() for 'MultisessionFuture' ... done [18:41:26.804] Created future: [18:41:26.823] receiveMessageFromWorker() for ClusterFuture ... [18:41:26.823] - Validating connection of MultisessionFuture [18:41:26.824] - received message: FutureResult [18:41:26.824] - Received FutureResult [18:41:26.824] - Erased future from FutureRegistry [18:41:26.824] result() for ClusterFuture ... [18:41:26.824] - result already collected: FutureResult [18:41:26.824] result() for ClusterFuture ... done [18:41:26.825] receiveMessageFromWorker() for ClusterFuture ... done [18:41:26.804] MultisessionFuture: [18:41:26.804] Label: 'future_lapply-2' [18:41:26.804] Expression: [18:41:26.804] { [18:41:26.804] do.call(function(...) { [18:41:26.804] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:26.804] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:26.804] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:26.804] on.exit(options(oopts), add = TRUE) [18:41:26.804] } [18:41:26.804] { [18:41:26.804] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:26.804] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:26.804] ...future.FUN(...future.X_jj, ...) [18:41:26.804] }) [18:41:26.804] } [18:41:26.804] }, args = future.call.arguments) [18:41:26.804] } [18:41:26.804] Lazy evaluation: FALSE [18:41:26.804] Asynchronous evaluation: TRUE [18:41:26.804] Local evaluation: TRUE [18:41:26.804] Environment: R_GlobalEnv [18:41:26.804] Capture standard output: TRUE [18:41:26.804] Capture condition classes: 'condition' (excluding 'nothing') [18:41:26.804] Globals: 5 objects totaling 302 bytes (function '...future.FUN' of 37 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 114 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:26.804] Packages: [18:41:26.804] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:26.804] Resolved: TRUE [18:41:26.804] Value: [18:41:26.804] Conditions captured: [18:41:26.804] Early signaling: FALSE [18:41:26.804] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:26.804] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:26.825] Chunk #2 of 2 ... DONE [18:41:26.825] Launching 2 futures (chunks) ... DONE [18:41:26.825] Resolving 2 futures (chunks) ... [18:41:26.826] resolve() on list ... [18:41:26.826] recursive: 0 [18:41:26.826] length: 2 [18:41:26.826] [18:41:26.826] Future #1 [18:41:26.826] result() for ClusterFuture ... [18:41:26.827] - result already collected: FutureResult [18:41:26.827] result() for ClusterFuture ... done [18:41:26.827] result() for ClusterFuture ... [18:41:26.827] - result already collected: FutureResult [18:41:26.827] result() for ClusterFuture ... done [18:41:26.827] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:26.828] - nx: 2 [18:41:26.828] - relay: TRUE [18:41:26.828] - stdout: TRUE [18:41:26.828] - signal: TRUE [18:41:26.828] - resignal: FALSE [18:41:26.828] - force: TRUE [18:41:26.828] - relayed: [n=2] FALSE, FALSE [18:41:26.829] - queued futures: [n=2] FALSE, FALSE [18:41:26.829] - until=1 [18:41:26.829] - relaying element #1 [18:41:26.829] result() for ClusterFuture ... [18:41:26.829] - result already collected: FutureResult [18:41:26.829] result() for ClusterFuture ... done [18:41:26.830] result() for ClusterFuture ... [18:41:26.830] - result already collected: FutureResult [18:41:26.830] result() for ClusterFuture ... done [18:41:26.830] result() for ClusterFuture ... [18:41:26.830] - result already collected: FutureResult [18:41:26.830] result() for ClusterFuture ... done [18:41:26.830] result() for ClusterFuture ... [18:41:26.831] - result already collected: FutureResult [18:41:26.831] result() for ClusterFuture ... done [18:41:26.831] - relayed: [n=2] TRUE, FALSE [18:41:26.831] - queued futures: [n=2] TRUE, FALSE [18:41:26.831] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:26.831] length: 1 (resolved future 1) [18:41:26.832] Future #2 [18:41:26.832] result() for ClusterFuture ... [18:41:26.832] - result already collected: FutureResult [18:41:26.832] result() for ClusterFuture ... done [18:41:26.832] result() for ClusterFuture ... [18:41:26.832] - result already collected: FutureResult [18:41:26.833] result() for ClusterFuture ... done [18:41:26.833] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:26.833] - nx: 2 [18:41:26.833] - relay: TRUE [18:41:26.833] - stdout: TRUE [18:41:26.833] - signal: TRUE [18:41:26.833] - resignal: FALSE [18:41:26.834] - force: TRUE [18:41:26.834] - relayed: [n=2] TRUE, FALSE [18:41:26.834] - queued futures: [n=2] TRUE, FALSE [18:41:26.834] - until=2 [18:41:26.834] - relaying element #2 [18:41:26.834] result() for ClusterFuture ... [18:41:26.835] - result already collected: FutureResult [18:41:26.835] result() for ClusterFuture ... done [18:41:26.835] result() for ClusterFuture ... [18:41:26.835] - result already collected: FutureResult [18:41:26.835] result() for ClusterFuture ... done [18:41:26.835] result() for ClusterFuture ... [18:41:26.835] - result already collected: FutureResult [18:41:26.836] result() for ClusterFuture ... done [18:41:26.836] result() for ClusterFuture ... [18:41:26.836] - result already collected: FutureResult [18:41:26.836] result() for ClusterFuture ... done [18:41:26.836] - relayed: [n=2] TRUE, TRUE [18:41:26.836] - queued futures: [n=2] TRUE, TRUE [18:41:26.837] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:26.837] length: 0 (resolved future 2) [18:41:26.837] Relaying remaining futures [18:41:26.837] signalConditionsASAP(NULL, pos=0) ... [18:41:26.837] - nx: 2 [18:41:26.837] - relay: TRUE [18:41:26.838] - stdout: TRUE [18:41:26.838] - signal: TRUE [18:41:26.838] - resignal: FALSE [18:41:26.838] - force: TRUE [18:41:26.838] - relayed: [n=2] TRUE, TRUE [18:41:26.838] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:26.839] - relayed: [n=2] TRUE, TRUE [18:41:26.839] - queued futures: [n=2] TRUE, TRUE [18:41:26.839] signalConditionsASAP(NULL, pos=0) ... done [18:41:26.839] resolve() on list ... DONE [18:41:26.839] result() for ClusterFuture ... [18:41:26.839] - result already collected: FutureResult [18:41:26.839] result() for ClusterFuture ... done [18:41:26.840] result() for ClusterFuture ... [18:41:26.840] - result already collected: FutureResult [18:41:26.840] result() for ClusterFuture ... done [18:41:26.840] result() for ClusterFuture ... [18:41:26.840] - result already collected: FutureResult [18:41:26.840] result() for ClusterFuture ... done [18:41:26.841] result() for ClusterFuture ... [18:41:26.841] - result already collected: FutureResult [18:41:26.841] result() for ClusterFuture ... done [18:41:26.841] - Number of value chunks collected: 2 [18:41:26.841] Resolving 2 futures (chunks) ... DONE [18:41:26.841] Reducing values from 2 chunks ... [18:41:26.842] - Number of values collected after concatenation: 3 [18:41:26.842] - Number of values expected: 3 [18:41:26.842] Reducing values from 2 chunks ... DONE [18:41:26.842] future_lapply() ... DONE - future_lapply(x, ...) where x[[i]] subsets via S3 method ... [18:41:26.842] future_lapply() ... [18:41:26.845] Number of chunks: 2 [18:41:26.845] getGlobalsAndPackagesXApply() ... [18:41:26.846] - future.globals: TRUE [18:41:26.846] getGlobalsAndPackages() ... [18:41:26.846] Searching for globals... [18:41:26.847] - globals found: [1] 'FUN' [18:41:26.847] Searching for globals ... DONE [18:41:26.848] Resolving globals: FALSE [18:41:26.848] The total size of the 1 globals is 185 bytes (185 bytes) [18:41:26.848] The total size of the 1 globals exported for future expression ('FUN()') is 185 bytes.. This exceeds the maximum allowed size of 500.00 MiB (option 'future.globals.maxSize'). There is one global: 'FUN' (185 bytes of class 'function') [18:41:26.849] - globals: [1] 'FUN' [18:41:26.849] [18:41:26.849] getGlobalsAndPackages() ... DONE [18:41:26.849] - globals found/used: [n=1] 'FUN' [18:41:26.849] - needed namespaces: [n=0] [18:41:26.849] Finding globals ... DONE [18:41:26.850] - use_args: TRUE [18:41:26.850] - Getting '...' globals ... [18:41:26.850] resolve() on list ... [18:41:26.850] recursive: 0 [18:41:26.851] length: 1 [18:41:26.851] elements: '...' [18:41:26.851] length: 0 (resolved future 1) [18:41:26.851] resolve() on list ... DONE [18:41:26.851] - '...' content: [n=0] [18:41:26.851] List of 1 [18:41:26.851] $ ...: list() [18:41:26.851] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:26.851] - attr(*, "where")=List of 1 [18:41:26.851] ..$ ...: [18:41:26.851] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:26.851] - attr(*, "resolved")= logi TRUE [18:41:26.851] - attr(*, "total_size")= num NA [18:41:26.854] - Getting '...' globals ... DONE [18:41:26.855] Globals to be used in all futures (chunks): [n=2] '...future.FUN', '...' [18:41:26.855] List of 2 [18:41:26.855] $ ...future.FUN:function (x) [18:41:26.855] $ ... : list() [18:41:26.855] ..- attr(*, "class")= chr [1:2] "DotDotDotList" "list" [18:41:26.855] - attr(*, "where")=List of 2 [18:41:26.855] ..$ ...future.FUN: [18:41:26.855] ..$ ... : [18:41:26.855] - attr(*, "class")= chr [1:3] "FutureGlobals" "Globals" "list" [18:41:26.855] - attr(*, "resolved")= logi FALSE [18:41:26.855] - attr(*, "total_size")= int 3176 [18:41:26.858] Packages to be attached in all futures: [n=0] [18:41:26.858] getGlobalsAndPackagesXApply() ... DONE [18:41:26.859] Number of futures (= number of chunks): 2 [18:41:26.859] Launching 2 futures (chunks) ... [18:41:26.859] Chunk #1 of 2 ... [18:41:26.859] - Finding globals in 'X' for chunk #1 ... [18:41:26.859] getGlobalsAndPackages() ... [18:41:26.860] Searching for globals... [18:41:26.860] [18:41:26.860] Searching for globals ... DONE [18:41:26.860] - globals: [0] [18:41:26.860] getGlobalsAndPackages() ... DONE [18:41:26.860] + additional globals found: [n=0] [18:41:26.861] + additional namespaces needed: [n=0] [18:41:26.861] - Finding globals in 'X' for chunk #1 ... DONE [18:41:26.861] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:26.861] - seeds: [18:41:26.861] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:26.861] getGlobalsAndPackages() ... [18:41:26.862] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:26.862] Resolving globals: FALSE [18:41:26.862] Tweak future expression to call with '...' arguments ... [18:41:26.862] { [18:41:26.862] do.call(function(...) { [18:41:26.862] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:26.862] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:26.862] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:26.862] on.exit(options(oopts), add = TRUE) [18:41:26.862] } [18:41:26.862] { [18:41:26.862] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:26.862] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:26.862] ...future.FUN(...future.X_jj, ...) [18:41:26.862] }) [18:41:26.862] } [18:41:26.862] }, args = future.call.arguments) [18:41:26.862] } [18:41:26.863] Tweak future expression to call with '...' arguments ... DONE [18:41:26.863] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:26.863] [18:41:26.863] getGlobalsAndPackages() ... DONE [18:41:26.864] run() for 'Future' ... [18:41:26.864] - state: 'created' [18:41:26.864] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:26.880] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:26.881] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:26.881] - Field: 'node' [18:41:26.881] - Field: 'label' [18:41:26.881] - Field: 'local' [18:41:26.881] - Field: 'owner' [18:41:26.881] - Field: 'envir' [18:41:26.882] - Field: 'workers' [18:41:26.882] - Field: 'packages' [18:41:26.882] - Field: 'gc' [18:41:26.882] - Field: 'conditions' [18:41:26.882] - Field: 'persistent' [18:41:26.882] - Field: 'expr' [18:41:26.883] - Field: 'uuid' [18:41:26.883] - Field: 'seed' [18:41:26.883] - Field: 'version' [18:41:26.883] - Field: 'result' [18:41:26.883] - Field: 'asynchronous' [18:41:26.884] - Field: 'calls' [18:41:26.884] - Field: 'globals' [18:41:26.884] - Field: 'stdout' [18:41:26.884] - Field: 'earlySignal' [18:41:26.884] - Field: 'lazy' [18:41:26.884] - Field: 'state' [18:41:26.885] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:26.885] - Launch lazy future ... [18:41:26.885] Packages needed by the future expression (n = 0): [18:41:26.885] Packages needed by future strategies (n = 0): [18:41:26.886] { [18:41:26.886] { [18:41:26.886] { [18:41:26.886] ...future.startTime <- base::Sys.time() [18:41:26.886] { [18:41:26.886] { [18:41:26.886] { [18:41:26.886] { [18:41:26.886] base::local({ [18:41:26.886] has_future <- base::requireNamespace("future", [18:41:26.886] quietly = TRUE) [18:41:26.886] if (has_future) { [18:41:26.886] ns <- base::getNamespace("future") [18:41:26.886] version <- ns[[".package"]][["version"]] [18:41:26.886] if (is.null(version)) [18:41:26.886] version <- utils::packageVersion("future") [18:41:26.886] } [18:41:26.886] else { [18:41:26.886] version <- NULL [18:41:26.886] } [18:41:26.886] if (!has_future || version < "1.8.0") { [18:41:26.886] info <- base::c(r_version = base::gsub("R version ", [18:41:26.886] "", base::R.version$version.string), [18:41:26.886] platform = base::sprintf("%s (%s-bit)", [18:41:26.886] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:26.886] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:26.886] "release", "version")], collapse = " "), [18:41:26.886] hostname = base::Sys.info()[["nodename"]]) [18:41:26.886] info <- base::sprintf("%s: %s", base::names(info), [18:41:26.886] info) [18:41:26.886] info <- base::paste(info, collapse = "; ") [18:41:26.886] if (!has_future) { [18:41:26.886] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:26.886] info) [18:41:26.886] } [18:41:26.886] else { [18:41:26.886] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:26.886] info, version) [18:41:26.886] } [18:41:26.886] base::stop(msg) [18:41:26.886] } [18:41:26.886] }) [18:41:26.886] } [18:41:26.886] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:26.886] base::options(mc.cores = 1L) [18:41:26.886] } [18:41:26.886] ...future.strategy.old <- future::plan("list") [18:41:26.886] options(future.plan = NULL) [18:41:26.886] Sys.unsetenv("R_FUTURE_PLAN") [18:41:26.886] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:26.886] } [18:41:26.886] ...future.workdir <- getwd() [18:41:26.886] } [18:41:26.886] ...future.oldOptions <- base::as.list(base::.Options) [18:41:26.886] ...future.oldEnvVars <- base::Sys.getenv() [18:41:26.886] } [18:41:26.886] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:26.886] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:26.886] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:26.886] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:26.886] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:26.886] future.stdout.windows.reencode = NULL, width = 80L) [18:41:26.886] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:26.886] base::names(...future.oldOptions)) [18:41:26.886] } [18:41:26.886] if (FALSE) { [18:41:26.886] } [18:41:26.886] else { [18:41:26.886] if (TRUE) { [18:41:26.886] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:26.886] open = "w") [18:41:26.886] } [18:41:26.886] else { [18:41:26.886] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:26.886] windows = "NUL", "/dev/null"), open = "w") [18:41:26.886] } [18:41:26.886] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:26.886] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:26.886] base::sink(type = "output", split = FALSE) [18:41:26.886] base::close(...future.stdout) [18:41:26.886] }, add = TRUE) [18:41:26.886] } [18:41:26.886] ...future.frame <- base::sys.nframe() [18:41:26.886] ...future.conditions <- base::list() [18:41:26.886] ...future.rng <- base::globalenv()$.Random.seed [18:41:26.886] if (FALSE) { [18:41:26.886] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:26.886] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:26.886] } [18:41:26.886] ...future.result <- base::tryCatch({ [18:41:26.886] base::withCallingHandlers({ [18:41:26.886] ...future.value <- base::withVisible(base::local({ [18:41:26.886] ...future.makeSendCondition <- base::local({ [18:41:26.886] sendCondition <- NULL [18:41:26.886] function(frame = 1L) { [18:41:26.886] if (is.function(sendCondition)) [18:41:26.886] return(sendCondition) [18:41:26.886] ns <- getNamespace("parallel") [18:41:26.886] if (exists("sendData", mode = "function", [18:41:26.886] envir = ns)) { [18:41:26.886] parallel_sendData <- get("sendData", mode = "function", [18:41:26.886] envir = ns) [18:41:26.886] envir <- sys.frame(frame) [18:41:26.886] master <- NULL [18:41:26.886] while (!identical(envir, .GlobalEnv) && [18:41:26.886] !identical(envir, emptyenv())) { [18:41:26.886] if (exists("master", mode = "list", envir = envir, [18:41:26.886] inherits = FALSE)) { [18:41:26.886] master <- get("master", mode = "list", [18:41:26.886] envir = envir, inherits = FALSE) [18:41:26.886] if (inherits(master, c("SOCKnode", [18:41:26.886] "SOCK0node"))) { [18:41:26.886] sendCondition <<- function(cond) { [18:41:26.886] data <- list(type = "VALUE", value = cond, [18:41:26.886] success = TRUE) [18:41:26.886] parallel_sendData(master, data) [18:41:26.886] } [18:41:26.886] return(sendCondition) [18:41:26.886] } [18:41:26.886] } [18:41:26.886] frame <- frame + 1L [18:41:26.886] envir <- sys.frame(frame) [18:41:26.886] } [18:41:26.886] } [18:41:26.886] sendCondition <<- function(cond) NULL [18:41:26.886] } [18:41:26.886] }) [18:41:26.886] withCallingHandlers({ [18:41:26.886] { [18:41:26.886] do.call(function(...) { [18:41:26.886] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:26.886] if (!identical(...future.globals.maxSize.org, [18:41:26.886] ...future.globals.maxSize)) { [18:41:26.886] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:26.886] on.exit(options(oopts), add = TRUE) [18:41:26.886] } [18:41:26.886] { [18:41:26.886] lapply(seq_along(...future.elements_ii), [18:41:26.886] FUN = function(jj) { [18:41:26.886] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:26.886] ...future.FUN(...future.X_jj, ...) [18:41:26.886] }) [18:41:26.886] } [18:41:26.886] }, args = future.call.arguments) [18:41:26.886] } [18:41:26.886] }, immediateCondition = function(cond) { [18:41:26.886] sendCondition <- ...future.makeSendCondition() [18:41:26.886] sendCondition(cond) [18:41:26.886] muffleCondition <- function (cond, pattern = "^muffle") [18:41:26.886] { [18:41:26.886] inherits <- base::inherits [18:41:26.886] invokeRestart <- base::invokeRestart [18:41:26.886] is.null <- base::is.null [18:41:26.886] muffled <- FALSE [18:41:26.886] if (inherits(cond, "message")) { [18:41:26.886] muffled <- grepl(pattern, "muffleMessage") [18:41:26.886] if (muffled) [18:41:26.886] invokeRestart("muffleMessage") [18:41:26.886] } [18:41:26.886] else if (inherits(cond, "warning")) { [18:41:26.886] muffled <- grepl(pattern, "muffleWarning") [18:41:26.886] if (muffled) [18:41:26.886] invokeRestart("muffleWarning") [18:41:26.886] } [18:41:26.886] else if (inherits(cond, "condition")) { [18:41:26.886] if (!is.null(pattern)) { [18:41:26.886] computeRestarts <- base::computeRestarts [18:41:26.886] grepl <- base::grepl [18:41:26.886] restarts <- computeRestarts(cond) [18:41:26.886] for (restart in restarts) { [18:41:26.886] name <- restart$name [18:41:26.886] if (is.null(name)) [18:41:26.886] next [18:41:26.886] if (!grepl(pattern, name)) [18:41:26.886] next [18:41:26.886] invokeRestart(restart) [18:41:26.886] muffled <- TRUE [18:41:26.886] break [18:41:26.886] } [18:41:26.886] } [18:41:26.886] } [18:41:26.886] invisible(muffled) [18:41:26.886] } [18:41:26.886] muffleCondition(cond) [18:41:26.886] }) [18:41:26.886] })) [18:41:26.886] future::FutureResult(value = ...future.value$value, [18:41:26.886] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:26.886] ...future.rng), globalenv = if (FALSE) [18:41:26.886] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:26.886] ...future.globalenv.names)) [18:41:26.886] else NULL, started = ...future.startTime, version = "1.8") [18:41:26.886] }, condition = base::local({ [18:41:26.886] c <- base::c [18:41:26.886] inherits <- base::inherits [18:41:26.886] invokeRestart <- base::invokeRestart [18:41:26.886] length <- base::length [18:41:26.886] list <- base::list [18:41:26.886] seq.int <- base::seq.int [18:41:26.886] signalCondition <- base::signalCondition [18:41:26.886] sys.calls <- base::sys.calls [18:41:26.886] `[[` <- base::`[[` [18:41:26.886] `+` <- base::`+` [18:41:26.886] `<<-` <- base::`<<-` [18:41:26.886] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:26.886] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:26.886] 3L)] [18:41:26.886] } [18:41:26.886] function(cond) { [18:41:26.886] is_error <- inherits(cond, "error") [18:41:26.886] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:26.886] NULL) [18:41:26.886] if (is_error) { [18:41:26.886] sessionInformation <- function() { [18:41:26.886] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:26.886] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:26.886] search = base::search(), system = base::Sys.info()) [18:41:26.886] } [18:41:26.886] ...future.conditions[[length(...future.conditions) + [18:41:26.886] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:26.886] cond$call), session = sessionInformation(), [18:41:26.886] timestamp = base::Sys.time(), signaled = 0L) [18:41:26.886] signalCondition(cond) [18:41:26.886] } [18:41:26.886] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:26.886] "immediateCondition"))) { [18:41:26.886] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:26.886] ...future.conditions[[length(...future.conditions) + [18:41:26.886] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:26.886] if (TRUE && !signal) { [18:41:26.886] muffleCondition <- function (cond, pattern = "^muffle") [18:41:26.886] { [18:41:26.886] inherits <- base::inherits [18:41:26.886] invokeRestart <- base::invokeRestart [18:41:26.886] is.null <- base::is.null [18:41:26.886] muffled <- FALSE [18:41:26.886] if (inherits(cond, "message")) { [18:41:26.886] muffled <- grepl(pattern, "muffleMessage") [18:41:26.886] if (muffled) [18:41:26.886] invokeRestart("muffleMessage") [18:41:26.886] } [18:41:26.886] else if (inherits(cond, "warning")) { [18:41:26.886] muffled <- grepl(pattern, "muffleWarning") [18:41:26.886] if (muffled) [18:41:26.886] invokeRestart("muffleWarning") [18:41:26.886] } [18:41:26.886] else if (inherits(cond, "condition")) { [18:41:26.886] if (!is.null(pattern)) { [18:41:26.886] computeRestarts <- base::computeRestarts [18:41:26.886] grepl <- base::grepl [18:41:26.886] restarts <- computeRestarts(cond) [18:41:26.886] for (restart in restarts) { [18:41:26.886] name <- restart$name [18:41:26.886] if (is.null(name)) [18:41:26.886] next [18:41:26.886] if (!grepl(pattern, name)) [18:41:26.886] next [18:41:26.886] invokeRestart(restart) [18:41:26.886] muffled <- TRUE [18:41:26.886] break [18:41:26.886] } [18:41:26.886] } [18:41:26.886] } [18:41:26.886] invisible(muffled) [18:41:26.886] } [18:41:26.886] muffleCondition(cond, pattern = "^muffle") [18:41:26.886] } [18:41:26.886] } [18:41:26.886] else { [18:41:26.886] if (TRUE) { [18:41:26.886] muffleCondition <- function (cond, pattern = "^muffle") [18:41:26.886] { [18:41:26.886] inherits <- base::inherits [18:41:26.886] invokeRestart <- base::invokeRestart [18:41:26.886] is.null <- base::is.null [18:41:26.886] muffled <- FALSE [18:41:26.886] if (inherits(cond, "message")) { [18:41:26.886] muffled <- grepl(pattern, "muffleMessage") [18:41:26.886] if (muffled) [18:41:26.886] invokeRestart("muffleMessage") [18:41:26.886] } [18:41:26.886] else if (inherits(cond, "warning")) { [18:41:26.886] muffled <- grepl(pattern, "muffleWarning") [18:41:26.886] if (muffled) [18:41:26.886] invokeRestart("muffleWarning") [18:41:26.886] } [18:41:26.886] else if (inherits(cond, "condition")) { [18:41:26.886] if (!is.null(pattern)) { [18:41:26.886] computeRestarts <- base::computeRestarts [18:41:26.886] grepl <- base::grepl [18:41:26.886] restarts <- computeRestarts(cond) [18:41:26.886] for (restart in restarts) { [18:41:26.886] name <- restart$name [18:41:26.886] if (is.null(name)) [18:41:26.886] next [18:41:26.886] if (!grepl(pattern, name)) [18:41:26.886] next [18:41:26.886] invokeRestart(restart) [18:41:26.886] muffled <- TRUE [18:41:26.886] break [18:41:26.886] } [18:41:26.886] } [18:41:26.886] } [18:41:26.886] invisible(muffled) [18:41:26.886] } [18:41:26.886] muffleCondition(cond, pattern = "^muffle") [18:41:26.886] } [18:41:26.886] } [18:41:26.886] } [18:41:26.886] })) [18:41:26.886] }, error = function(ex) { [18:41:26.886] base::structure(base::list(value = NULL, visible = NULL, [18:41:26.886] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:26.886] ...future.rng), started = ...future.startTime, [18:41:26.886] finished = Sys.time(), session_uuid = NA_character_, [18:41:26.886] version = "1.8"), class = "FutureResult") [18:41:26.886] }, finally = { [18:41:26.886] if (!identical(...future.workdir, getwd())) [18:41:26.886] setwd(...future.workdir) [18:41:26.886] { [18:41:26.886] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:26.886] ...future.oldOptions$nwarnings <- NULL [18:41:26.886] } [18:41:26.886] base::options(...future.oldOptions) [18:41:26.886] if (.Platform$OS.type == "windows") { [18:41:26.886] old_names <- names(...future.oldEnvVars) [18:41:26.886] envs <- base::Sys.getenv() [18:41:26.886] names <- names(envs) [18:41:26.886] common <- intersect(names, old_names) [18:41:26.886] added <- setdiff(names, old_names) [18:41:26.886] removed <- setdiff(old_names, names) [18:41:26.886] changed <- common[...future.oldEnvVars[common] != [18:41:26.886] envs[common]] [18:41:26.886] NAMES <- toupper(changed) [18:41:26.886] args <- list() [18:41:26.886] for (kk in seq_along(NAMES)) { [18:41:26.886] name <- changed[[kk]] [18:41:26.886] NAME <- NAMES[[kk]] [18:41:26.886] if (name != NAME && is.element(NAME, old_names)) [18:41:26.886] next [18:41:26.886] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:26.886] } [18:41:26.886] NAMES <- toupper(added) [18:41:26.886] for (kk in seq_along(NAMES)) { [18:41:26.886] name <- added[[kk]] [18:41:26.886] NAME <- NAMES[[kk]] [18:41:26.886] if (name != NAME && is.element(NAME, old_names)) [18:41:26.886] next [18:41:26.886] args[[name]] <- "" [18:41:26.886] } [18:41:26.886] NAMES <- toupper(removed) [18:41:26.886] for (kk in seq_along(NAMES)) { [18:41:26.886] name <- removed[[kk]] [18:41:26.886] NAME <- NAMES[[kk]] [18:41:26.886] if (name != NAME && is.element(NAME, old_names)) [18:41:26.886] next [18:41:26.886] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:26.886] } [18:41:26.886] if (length(args) > 0) [18:41:26.886] base::do.call(base::Sys.setenv, args = args) [18:41:26.886] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:26.886] } [18:41:26.886] else { [18:41:26.886] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:26.886] } [18:41:26.886] { [18:41:26.886] if (base::length(...future.futureOptionsAdded) > [18:41:26.886] 0L) { [18:41:26.886] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:26.886] base::names(opts) <- ...future.futureOptionsAdded [18:41:26.886] base::options(opts) [18:41:26.886] } [18:41:26.886] { [18:41:26.886] { [18:41:26.886] base::options(mc.cores = ...future.mc.cores.old) [18:41:26.886] NULL [18:41:26.886] } [18:41:26.886] options(future.plan = NULL) [18:41:26.886] if (is.na(NA_character_)) [18:41:26.886] Sys.unsetenv("R_FUTURE_PLAN") [18:41:26.886] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:26.886] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:26.886] .init = FALSE) [18:41:26.886] } [18:41:26.886] } [18:41:26.886] } [18:41:26.886] }) [18:41:26.886] if (TRUE) { [18:41:26.886] base::sink(type = "output", split = FALSE) [18:41:26.886] if (TRUE) { [18:41:26.886] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:26.886] } [18:41:26.886] else { [18:41:26.886] ...future.result["stdout"] <- base::list(NULL) [18:41:26.886] } [18:41:26.886] base::close(...future.stdout) [18:41:26.886] ...future.stdout <- NULL [18:41:26.886] } [18:41:26.886] ...future.result$conditions <- ...future.conditions [18:41:26.886] ...future.result$finished <- base::Sys.time() [18:41:26.886] ...future.result [18:41:26.886] } [18:41:26.891] Exporting 5 global objects (875 bytes) to cluster node #1 ... [18:41:26.891] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:26.892] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:26.892] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:26.892] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:26.893] Exporting '...future.elements_ii' (89 bytes) to cluster node #1 ... [18:41:26.893] Exporting '...future.elements_ii' (89 bytes) to cluster node #1 ... DONE [18:41:26.893] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:26.894] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:26.894] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:26.894] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:26.894] Exporting 5 global objects (875 bytes) to cluster node #1 ... DONE [18:41:26.895] MultisessionFuture started [18:41:26.895] - Launch lazy future ... done [18:41:26.895] run() for 'MultisessionFuture' ... done [18:41:26.895] Created future: [18:41:26.912] receiveMessageFromWorker() for ClusterFuture ... [18:41:26.912] - Validating connection of MultisessionFuture [18:41:26.912] - received message: FutureResult [18:41:26.913] - Received FutureResult [18:41:26.913] - Erased future from FutureRegistry [18:41:26.913] result() for ClusterFuture ... [18:41:26.913] - result already collected: FutureResult [18:41:26.913] result() for ClusterFuture ... done [18:41:26.913] receiveMessageFromWorker() for ClusterFuture ... done [18:41:26.896] MultisessionFuture: [18:41:26.896] Label: 'future_lapply-1' [18:41:26.896] Expression: [18:41:26.896] { [18:41:26.896] do.call(function(...) { [18:41:26.896] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:26.896] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:26.896] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:26.896] on.exit(options(oopts), add = TRUE) [18:41:26.896] } [18:41:26.896] { [18:41:26.896] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:26.896] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:26.896] ...future.FUN(...future.X_jj, ...) [18:41:26.896] }) [18:41:26.896] } [18:41:26.896] }, args = future.call.arguments) [18:41:26.896] } [18:41:26.896] Lazy evaluation: FALSE [18:41:26.896] Asynchronous evaluation: TRUE [18:41:26.896] Local evaluation: TRUE [18:41:26.896] Environment: R_GlobalEnv [18:41:26.896] Capture standard output: TRUE [18:41:26.896] Capture condition classes: 'condition' (excluding 'nothing') [18:41:26.896] Globals: 5 objects totaling 425 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 89 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:26.896] Packages: [18:41:26.896] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:26.896] Resolved: TRUE [18:41:26.896] Value: [18:41:26.896] Conditions captured: [18:41:26.896] Early signaling: FALSE [18:41:26.896] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:26.896] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:26.914] Chunk #1 of 2 ... DONE [18:41:26.914] Chunk #2 of 2 ... [18:41:26.914] - Finding globals in 'X' for chunk #2 ... [18:41:26.914] getGlobalsAndPackages() ... [18:41:26.914] Searching for globals... [18:41:26.915] [18:41:26.915] Searching for globals ... DONE [18:41:26.915] - globals: [0] [18:41:26.915] getGlobalsAndPackages() ... DONE [18:41:26.915] + additional globals found: [n=0] [18:41:26.916] + additional namespaces needed: [n=0] [18:41:26.916] - Finding globals in 'X' for chunk #2 ... DONE [18:41:26.919] - Adjusted option 'future.globals.maxSize': 524288000 -> 2 * 524288000 = 1048576000 (bytes) [18:41:26.919] - seeds: [18:41:26.919] - All globals exported: [n=5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:26.919] getGlobalsAndPackages() ... [18:41:26.920] - globals passed as-is: [5] '...future.FUN', '...', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:26.920] Resolving globals: FALSE [18:41:26.920] Tweak future expression to call with '...' arguments ... [18:41:26.920] { [18:41:26.920] do.call(function(...) { [18:41:26.920] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:26.920] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:26.920] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:26.920] on.exit(options(oopts), add = TRUE) [18:41:26.920] } [18:41:26.920] { [18:41:26.920] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:26.920] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:26.920] ...future.FUN(...future.X_jj, ...) [18:41:26.920] }) [18:41:26.920] } [18:41:26.920] }, args = future.call.arguments) [18:41:26.920] } [18:41:26.921] Tweak future expression to call with '...' arguments ... DONE [18:41:26.921] - globals: [5] '...future.FUN', 'future.call.arguments', '...future.elements_ii', '...future.seeds_ii', '...future.globals.maxSize' [18:41:26.922] [18:41:26.922] getGlobalsAndPackages() ... DONE [18:41:26.922] run() for 'Future' ... [18:41:26.922] - state: 'created' [18:41:26.922] - Future backend: 'FutureStrategy', 'multisession', 'cluster', 'multiprocess', 'future', 'function' [18:41:26.938] - Future class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:26.939] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... [18:41:26.939] - Field: 'node' [18:41:26.939] - Field: 'label' [18:41:26.939] - Field: 'local' [18:41:26.939] - Field: 'owner' [18:41:26.940] - Field: 'envir' [18:41:26.940] - Field: 'workers' [18:41:26.940] - Field: 'packages' [18:41:26.940] - Field: 'gc' [18:41:26.940] - Field: 'conditions' [18:41:26.941] - Field: 'persistent' [18:41:26.941] - Field: 'expr' [18:41:26.941] - Field: 'uuid' [18:41:26.941] - Field: 'seed' [18:41:26.941] - Field: 'version' [18:41:26.941] - Field: 'result' [18:41:26.942] - Field: 'asynchronous' [18:41:26.942] - Field: 'calls' [18:41:26.942] - Field: 'globals' [18:41:26.942] - Field: 'stdout' [18:41:26.942] - Field: 'earlySignal' [18:41:26.942] - Field: 'lazy' [18:41:26.943] - Field: 'state' [18:41:26.943] - Copy elements of temporary 'MultisessionFuture' to final 'Future' object ... done [18:41:26.943] - Launch lazy future ... [18:41:26.943] Packages needed by the future expression (n = 0): [18:41:26.943] Packages needed by future strategies (n = 0): [18:41:26.944] { [18:41:26.944] { [18:41:26.944] { [18:41:26.944] ...future.startTime <- base::Sys.time() [18:41:26.944] { [18:41:26.944] { [18:41:26.944] { [18:41:26.944] { [18:41:26.944] base::local({ [18:41:26.944] has_future <- base::requireNamespace("future", [18:41:26.944] quietly = TRUE) [18:41:26.944] if (has_future) { [18:41:26.944] ns <- base::getNamespace("future") [18:41:26.944] version <- ns[[".package"]][["version"]] [18:41:26.944] if (is.null(version)) [18:41:26.944] version <- utils::packageVersion("future") [18:41:26.944] } [18:41:26.944] else { [18:41:26.944] version <- NULL [18:41:26.944] } [18:41:26.944] if (!has_future || version < "1.8.0") { [18:41:26.944] info <- base::c(r_version = base::gsub("R version ", [18:41:26.944] "", base::R.version$version.string), [18:41:26.944] platform = base::sprintf("%s (%s-bit)", [18:41:26.944] base::R.version$platform, 8 * base::.Machine$sizeof.pointer), [18:41:26.944] os = base::paste(base::Sys.info()[base::c("sysname", [18:41:26.944] "release", "version")], collapse = " "), [18:41:26.944] hostname = base::Sys.info()[["nodename"]]) [18:41:26.944] info <- base::sprintf("%s: %s", base::names(info), [18:41:26.944] info) [18:41:26.944] info <- base::paste(info, collapse = "; ") [18:41:26.944] if (!has_future) { [18:41:26.944] msg <- base::sprintf("Package 'future' is not installed on worker (%s)", [18:41:26.944] info) [18:41:26.944] } [18:41:26.944] else { [18:41:26.944] msg <- base::sprintf("Package 'future' on worker (%s) must be of version >= 1.8.0: %s", [18:41:26.944] info, version) [18:41:26.944] } [18:41:26.944] base::stop(msg) [18:41:26.944] } [18:41:26.944] }) [18:41:26.944] } [18:41:26.944] ...future.mc.cores.old <- base::getOption("mc.cores") [18:41:26.944] base::options(mc.cores = 1L) [18:41:26.944] } [18:41:26.944] ...future.strategy.old <- future::plan("list") [18:41:26.944] options(future.plan = NULL) [18:41:26.944] Sys.unsetenv("R_FUTURE_PLAN") [18:41:26.944] future::plan("default", .cleanup = FALSE, .init = FALSE) [18:41:26.944] } [18:41:26.944] ...future.workdir <- getwd() [18:41:26.944] } [18:41:26.944] ...future.oldOptions <- base::as.list(base::.Options) [18:41:26.944] ...future.oldEnvVars <- base::Sys.getenv() [18:41:26.944] } [18:41:26.944] base::options(future.startup.script = FALSE, future.globals.onMissing = NULL, [18:41:26.944] future.globals.maxSize = 1048576000, future.globals.method = NULL, [18:41:26.944] future.globals.onMissing = NULL, future.globals.onReference = NULL, [18:41:26.944] future.globals.resolve = NULL, future.resolve.recursive = NULL, [18:41:26.944] future.rng.onMisuse = NULL, future.rng.onMisuse.keepFuture = NULL, [18:41:26.944] future.stdout.windows.reencode = NULL, width = 80L) [18:41:26.944] ...future.futureOptionsAdded <- base::setdiff(base::names(base::.Options), [18:41:26.944] base::names(...future.oldOptions)) [18:41:26.944] } [18:41:26.944] if (FALSE) { [18:41:26.944] } [18:41:26.944] else { [18:41:26.944] if (TRUE) { [18:41:26.944] ...future.stdout <- base::rawConnection(base::raw(0L), [18:41:26.944] open = "w") [18:41:26.944] } [18:41:26.944] else { [18:41:26.944] ...future.stdout <- base::file(base::switch(.Platform$OS.type, [18:41:26.944] windows = "NUL", "/dev/null"), open = "w") [18:41:26.944] } [18:41:26.944] base::sink(...future.stdout, type = "output", split = FALSE) [18:41:26.944] base::on.exit(if (!base::is.null(...future.stdout)) { [18:41:26.944] base::sink(type = "output", split = FALSE) [18:41:26.944] base::close(...future.stdout) [18:41:26.944] }, add = TRUE) [18:41:26.944] } [18:41:26.944] ...future.frame <- base::sys.nframe() [18:41:26.944] ...future.conditions <- base::list() [18:41:26.944] ...future.rng <- base::globalenv()$.Random.seed [18:41:26.944] if (FALSE) { [18:41:26.944] ...future.globalenv.names <- c(base::names(base::.GlobalEnv), [18:41:26.944] "...future.value", "...future.globalenv.names", ".Random.seed") [18:41:26.944] } [18:41:26.944] ...future.result <- base::tryCatch({ [18:41:26.944] base::withCallingHandlers({ [18:41:26.944] ...future.value <- base::withVisible(base::local({ [18:41:26.944] ...future.makeSendCondition <- base::local({ [18:41:26.944] sendCondition <- NULL [18:41:26.944] function(frame = 1L) { [18:41:26.944] if (is.function(sendCondition)) [18:41:26.944] return(sendCondition) [18:41:26.944] ns <- getNamespace("parallel") [18:41:26.944] if (exists("sendData", mode = "function", [18:41:26.944] envir = ns)) { [18:41:26.944] parallel_sendData <- get("sendData", mode = "function", [18:41:26.944] envir = ns) [18:41:26.944] envir <- sys.frame(frame) [18:41:26.944] master <- NULL [18:41:26.944] while (!identical(envir, .GlobalEnv) && [18:41:26.944] !identical(envir, emptyenv())) { [18:41:26.944] if (exists("master", mode = "list", envir = envir, [18:41:26.944] inherits = FALSE)) { [18:41:26.944] master <- get("master", mode = "list", [18:41:26.944] envir = envir, inherits = FALSE) [18:41:26.944] if (inherits(master, c("SOCKnode", [18:41:26.944] "SOCK0node"))) { [18:41:26.944] sendCondition <<- function(cond) { [18:41:26.944] data <- list(type = "VALUE", value = cond, [18:41:26.944] success = TRUE) [18:41:26.944] parallel_sendData(master, data) [18:41:26.944] } [18:41:26.944] return(sendCondition) [18:41:26.944] } [18:41:26.944] } [18:41:26.944] frame <- frame + 1L [18:41:26.944] envir <- sys.frame(frame) [18:41:26.944] } [18:41:26.944] } [18:41:26.944] sendCondition <<- function(cond) NULL [18:41:26.944] } [18:41:26.944] }) [18:41:26.944] withCallingHandlers({ [18:41:26.944] { [18:41:26.944] do.call(function(...) { [18:41:26.944] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:26.944] if (!identical(...future.globals.maxSize.org, [18:41:26.944] ...future.globals.maxSize)) { [18:41:26.944] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:26.944] on.exit(options(oopts), add = TRUE) [18:41:26.944] } [18:41:26.944] { [18:41:26.944] lapply(seq_along(...future.elements_ii), [18:41:26.944] FUN = function(jj) { [18:41:26.944] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:26.944] ...future.FUN(...future.X_jj, ...) [18:41:26.944] }) [18:41:26.944] } [18:41:26.944] }, args = future.call.arguments) [18:41:26.944] } [18:41:26.944] }, immediateCondition = function(cond) { [18:41:26.944] sendCondition <- ...future.makeSendCondition() [18:41:26.944] sendCondition(cond) [18:41:26.944] muffleCondition <- function (cond, pattern = "^muffle") [18:41:26.944] { [18:41:26.944] inherits <- base::inherits [18:41:26.944] invokeRestart <- base::invokeRestart [18:41:26.944] is.null <- base::is.null [18:41:26.944] muffled <- FALSE [18:41:26.944] if (inherits(cond, "message")) { [18:41:26.944] muffled <- grepl(pattern, "muffleMessage") [18:41:26.944] if (muffled) [18:41:26.944] invokeRestart("muffleMessage") [18:41:26.944] } [18:41:26.944] else if (inherits(cond, "warning")) { [18:41:26.944] muffled <- grepl(pattern, "muffleWarning") [18:41:26.944] if (muffled) [18:41:26.944] invokeRestart("muffleWarning") [18:41:26.944] } [18:41:26.944] else if (inherits(cond, "condition")) { [18:41:26.944] if (!is.null(pattern)) { [18:41:26.944] computeRestarts <- base::computeRestarts [18:41:26.944] grepl <- base::grepl [18:41:26.944] restarts <- computeRestarts(cond) [18:41:26.944] for (restart in restarts) { [18:41:26.944] name <- restart$name [18:41:26.944] if (is.null(name)) [18:41:26.944] next [18:41:26.944] if (!grepl(pattern, name)) [18:41:26.944] next [18:41:26.944] invokeRestart(restart) [18:41:26.944] muffled <- TRUE [18:41:26.944] break [18:41:26.944] } [18:41:26.944] } [18:41:26.944] } [18:41:26.944] invisible(muffled) [18:41:26.944] } [18:41:26.944] muffleCondition(cond) [18:41:26.944] }) [18:41:26.944] })) [18:41:26.944] future::FutureResult(value = ...future.value$value, [18:41:26.944] visible = ...future.value$visible, rng = !identical(base::globalenv()$.Random.seed, [18:41:26.944] ...future.rng), globalenv = if (FALSE) [18:41:26.944] list(added = base::setdiff(base::names(base::.GlobalEnv), [18:41:26.944] ...future.globalenv.names)) [18:41:26.944] else NULL, started = ...future.startTime, version = "1.8") [18:41:26.944] }, condition = base::local({ [18:41:26.944] c <- base::c [18:41:26.944] inherits <- base::inherits [18:41:26.944] invokeRestart <- base::invokeRestart [18:41:26.944] length <- base::length [18:41:26.944] list <- base::list [18:41:26.944] seq.int <- base::seq.int [18:41:26.944] signalCondition <- base::signalCondition [18:41:26.944] sys.calls <- base::sys.calls [18:41:26.944] `[[` <- base::`[[` [18:41:26.944] `+` <- base::`+` [18:41:26.944] `<<-` <- base::`<<-` [18:41:26.944] sysCalls <- function(calls = sys.calls(), from = 1L) { [18:41:26.944] calls[seq.int(from = from + 12L, to = length(calls) - [18:41:26.944] 3L)] [18:41:26.944] } [18:41:26.944] function(cond) { [18:41:26.944] is_error <- inherits(cond, "error") [18:41:26.944] ignore <- !is_error && !is.null(NULL) && inherits(cond, [18:41:26.944] NULL) [18:41:26.944] if (is_error) { [18:41:26.944] sessionInformation <- function() { [18:41:26.944] list(r = base::R.Version(), locale = base::Sys.getlocale(), [18:41:26.944] rngkind = base::RNGkind(), namespaces = base::loadedNamespaces(), [18:41:26.944] search = base::search(), system = base::Sys.info()) [18:41:26.944] } [18:41:26.944] ...future.conditions[[length(...future.conditions) + [18:41:26.944] 1L]] <<- list(condition = cond, calls = c(sysCalls(from = ...future.frame), [18:41:26.944] cond$call), session = sessionInformation(), [18:41:26.944] timestamp = base::Sys.time(), signaled = 0L) [18:41:26.944] signalCondition(cond) [18:41:26.944] } [18:41:26.944] else if (!ignore && TRUE && inherits(cond, c("condition", [18:41:26.944] "immediateCondition"))) { [18:41:26.944] signal <- TRUE && inherits(cond, "immediateCondition") [18:41:26.944] ...future.conditions[[length(...future.conditions) + [18:41:26.944] 1L]] <<- list(condition = cond, signaled = base::as.integer(signal)) [18:41:26.944] if (TRUE && !signal) { [18:41:26.944] muffleCondition <- function (cond, pattern = "^muffle") [18:41:26.944] { [18:41:26.944] inherits <- base::inherits [18:41:26.944] invokeRestart <- base::invokeRestart [18:41:26.944] is.null <- base::is.null [18:41:26.944] muffled <- FALSE [18:41:26.944] if (inherits(cond, "message")) { [18:41:26.944] muffled <- grepl(pattern, "muffleMessage") [18:41:26.944] if (muffled) [18:41:26.944] invokeRestart("muffleMessage") [18:41:26.944] } [18:41:26.944] else if (inherits(cond, "warning")) { [18:41:26.944] muffled <- grepl(pattern, "muffleWarning") [18:41:26.944] if (muffled) [18:41:26.944] invokeRestart("muffleWarning") [18:41:26.944] } [18:41:26.944] else if (inherits(cond, "condition")) { [18:41:26.944] if (!is.null(pattern)) { [18:41:26.944] computeRestarts <- base::computeRestarts [18:41:26.944] grepl <- base::grepl [18:41:26.944] restarts <- computeRestarts(cond) [18:41:26.944] for (restart in restarts) { [18:41:26.944] name <- restart$name [18:41:26.944] if (is.null(name)) [18:41:26.944] next [18:41:26.944] if (!grepl(pattern, name)) [18:41:26.944] next [18:41:26.944] invokeRestart(restart) [18:41:26.944] muffled <- TRUE [18:41:26.944] break [18:41:26.944] } [18:41:26.944] } [18:41:26.944] } [18:41:26.944] invisible(muffled) [18:41:26.944] } [18:41:26.944] muffleCondition(cond, pattern = "^muffle") [18:41:26.944] } [18:41:26.944] } [18:41:26.944] else { [18:41:26.944] if (TRUE) { [18:41:26.944] muffleCondition <- function (cond, pattern = "^muffle") [18:41:26.944] { [18:41:26.944] inherits <- base::inherits [18:41:26.944] invokeRestart <- base::invokeRestart [18:41:26.944] is.null <- base::is.null [18:41:26.944] muffled <- FALSE [18:41:26.944] if (inherits(cond, "message")) { [18:41:26.944] muffled <- grepl(pattern, "muffleMessage") [18:41:26.944] if (muffled) [18:41:26.944] invokeRestart("muffleMessage") [18:41:26.944] } [18:41:26.944] else if (inherits(cond, "warning")) { [18:41:26.944] muffled <- grepl(pattern, "muffleWarning") [18:41:26.944] if (muffled) [18:41:26.944] invokeRestart("muffleWarning") [18:41:26.944] } [18:41:26.944] else if (inherits(cond, "condition")) { [18:41:26.944] if (!is.null(pattern)) { [18:41:26.944] computeRestarts <- base::computeRestarts [18:41:26.944] grepl <- base::grepl [18:41:26.944] restarts <- computeRestarts(cond) [18:41:26.944] for (restart in restarts) { [18:41:26.944] name <- restart$name [18:41:26.944] if (is.null(name)) [18:41:26.944] next [18:41:26.944] if (!grepl(pattern, name)) [18:41:26.944] next [18:41:26.944] invokeRestart(restart) [18:41:26.944] muffled <- TRUE [18:41:26.944] break [18:41:26.944] } [18:41:26.944] } [18:41:26.944] } [18:41:26.944] invisible(muffled) [18:41:26.944] } [18:41:26.944] muffleCondition(cond, pattern = "^muffle") [18:41:26.944] } [18:41:26.944] } [18:41:26.944] } [18:41:26.944] })) [18:41:26.944] }, error = function(ex) { [18:41:26.944] base::structure(base::list(value = NULL, visible = NULL, [18:41:26.944] conditions = ...future.conditions, rng = !identical(base::globalenv()$.Random.seed, [18:41:26.944] ...future.rng), started = ...future.startTime, [18:41:26.944] finished = Sys.time(), session_uuid = NA_character_, [18:41:26.944] version = "1.8"), class = "FutureResult") [18:41:26.944] }, finally = { [18:41:26.944] if (!identical(...future.workdir, getwd())) [18:41:26.944] setwd(...future.workdir) [18:41:26.944] { [18:41:26.944] if (identical(getOption("nwarnings"), ...future.oldOptions$nwarnings)) { [18:41:26.944] ...future.oldOptions$nwarnings <- NULL [18:41:26.944] } [18:41:26.944] base::options(...future.oldOptions) [18:41:26.944] if (.Platform$OS.type == "windows") { [18:41:26.944] old_names <- names(...future.oldEnvVars) [18:41:26.944] envs <- base::Sys.getenv() [18:41:26.944] names <- names(envs) [18:41:26.944] common <- intersect(names, old_names) [18:41:26.944] added <- setdiff(names, old_names) [18:41:26.944] removed <- setdiff(old_names, names) [18:41:26.944] changed <- common[...future.oldEnvVars[common] != [18:41:26.944] envs[common]] [18:41:26.944] NAMES <- toupper(changed) [18:41:26.944] args <- list() [18:41:26.944] for (kk in seq_along(NAMES)) { [18:41:26.944] name <- changed[[kk]] [18:41:26.944] NAME <- NAMES[[kk]] [18:41:26.944] if (name != NAME && is.element(NAME, old_names)) [18:41:26.944] next [18:41:26.944] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:26.944] } [18:41:26.944] NAMES <- toupper(added) [18:41:26.944] for (kk in seq_along(NAMES)) { [18:41:26.944] name <- added[[kk]] [18:41:26.944] NAME <- NAMES[[kk]] [18:41:26.944] if (name != NAME && is.element(NAME, old_names)) [18:41:26.944] next [18:41:26.944] args[[name]] <- "" [18:41:26.944] } [18:41:26.944] NAMES <- toupper(removed) [18:41:26.944] for (kk in seq_along(NAMES)) { [18:41:26.944] name <- removed[[kk]] [18:41:26.944] NAME <- NAMES[[kk]] [18:41:26.944] if (name != NAME && is.element(NAME, old_names)) [18:41:26.944] next [18:41:26.944] args[[name]] <- ...future.oldEnvVars[[name]] [18:41:26.944] } [18:41:26.944] if (length(args) > 0) [18:41:26.944] base::do.call(base::Sys.setenv, args = args) [18:41:26.944] args <- names <- old_names <- NAMES <- envs <- common <- added <- removed <- NULL [18:41:26.944] } [18:41:26.944] else { [18:41:26.944] base::do.call(base::Sys.setenv, args = base::as.list(...future.oldEnvVars)) [18:41:26.944] } [18:41:26.944] { [18:41:26.944] if (base::length(...future.futureOptionsAdded) > [18:41:26.944] 0L) { [18:41:26.944] opts <- base::vector("list", length = base::length(...future.futureOptionsAdded)) [18:41:26.944] base::names(opts) <- ...future.futureOptionsAdded [18:41:26.944] base::options(opts) [18:41:26.944] } [18:41:26.944] { [18:41:26.944] { [18:41:26.944] base::options(mc.cores = ...future.mc.cores.old) [18:41:26.944] NULL [18:41:26.944] } [18:41:26.944] options(future.plan = NULL) [18:41:26.944] if (is.na(NA_character_)) [18:41:26.944] Sys.unsetenv("R_FUTURE_PLAN") [18:41:26.944] else Sys.setenv(R_FUTURE_PLAN = NA_character_) [18:41:26.944] future::plan(...future.strategy.old, .cleanup = FALSE, [18:41:26.944] .init = FALSE) [18:41:26.944] } [18:41:26.944] } [18:41:26.944] } [18:41:26.944] }) [18:41:26.944] if (TRUE) { [18:41:26.944] base::sink(type = "output", split = FALSE) [18:41:26.944] if (TRUE) { [18:41:26.944] ...future.result$stdout <- base::rawToChar(base::rawConnectionValue(...future.stdout)) [18:41:26.944] } [18:41:26.944] else { [18:41:26.944] ...future.result["stdout"] <- base::list(NULL) [18:41:26.944] } [18:41:26.944] base::close(...future.stdout) [18:41:26.944] ...future.stdout <- NULL [18:41:26.944] } [18:41:26.944] ...future.result$conditions <- ...future.conditions [18:41:26.944] ...future.result$finished <- base::Sys.time() [18:41:26.944] ...future.result [18:41:26.944] } [18:41:26.949] Exporting 5 global objects (875 bytes) to cluster node #1 ... [18:41:26.949] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... [18:41:26.950] Exporting '...future.FUN' (185 bytes) to cluster node #1 ... DONE [18:41:26.950] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... [18:41:26.950] Exporting 'future.call.arguments' (97 bytes) to cluster node #1 ... DONE [18:41:26.951] Exporting '...future.elements_ii' (89 bytes) to cluster node #1 ... [18:41:26.951] Exporting '...future.elements_ii' (89 bytes) to cluster node #1 ... DONE [18:41:26.951] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... [18:41:26.951] Exporting '...future.seeds_ii' (27 bytes) to cluster node #1 ... DONE [18:41:26.952] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... [18:41:26.952] Exporting '...future.globals.maxSize' (27 bytes) to cluster node #1 ... DONE [18:41:26.952] Exporting 5 global objects (875 bytes) to cluster node #1 ... DONE [18:41:26.953] MultisessionFuture started [18:41:26.953] - Launch lazy future ... done [18:41:26.953] run() for 'MultisessionFuture' ... done [18:41:26.953] Created future: [18:41:26.968] receiveMessageFromWorker() for ClusterFuture ... [18:41:26.968] - Validating connection of MultisessionFuture [18:41:26.968] - received message: FutureResult [18:41:26.968] - Received FutureResult [18:41:26.968] - Erased future from FutureRegistry [18:41:26.969] result() for ClusterFuture ... [18:41:26.969] - result already collected: FutureResult [18:41:26.969] result() for ClusterFuture ... done [18:41:26.969] receiveMessageFromWorker() for ClusterFuture ... done [18:41:26.953] MultisessionFuture: [18:41:26.953] Label: 'future_lapply-2' [18:41:26.953] Expression: [18:41:26.953] { [18:41:26.953] do.call(function(...) { [18:41:26.953] ...future.globals.maxSize.org <- getOption("future.globals.maxSize") [18:41:26.953] if (!identical(...future.globals.maxSize.org, ...future.globals.maxSize)) { [18:41:26.953] oopts <- options(future.globals.maxSize = ...future.globals.maxSize) [18:41:26.953] on.exit(options(oopts), add = TRUE) [18:41:26.953] } [18:41:26.953] { [18:41:26.953] lapply(seq_along(...future.elements_ii), FUN = function(jj) { [18:41:26.953] ...future.X_jj <- ...future.elements_ii[[jj]] [18:41:26.953] ...future.FUN(...future.X_jj, ...) [18:41:26.953] }) [18:41:26.953] } [18:41:26.953] }, args = future.call.arguments) [18:41:26.953] } [18:41:26.953] Lazy evaluation: FALSE [18:41:26.953] Asynchronous evaluation: TRUE [18:41:26.953] Local evaluation: TRUE [18:41:26.953] Environment: R_GlobalEnv [18:41:26.953] Capture standard output: TRUE [18:41:26.953] Capture condition classes: 'condition' (excluding 'nothing') [18:41:26.953] Globals: 5 objects totaling 425 bytes (function '...future.FUN' of 185 bytes, DotDotDotList 'future.call.arguments' of 97 bytes, list '...future.elements_ii' of 89 bytes, NULL '...future.seeds_ii' of 27 bytes, NULL '...future.globals.maxSize' of 27 bytes) [18:41:26.953] Packages: [18:41:26.953] L'Ecuyer-CMRG RNG seed: (seed = FALSE) [18:41:26.953] Resolved: TRUE [18:41:26.953] Value: [18:41:26.953] Conditions captured: [18:41:26.953] Early signaling: FALSE [18:41:26.953] Owner process: ec8c3615-9642-e8d7-575b-679da7fcd885 [18:41:26.953] Class: 'MultisessionFuture', 'ClusterFuture', 'MultiprocessFuture', 'Future', 'environment' [18:41:26.970] Chunk #2 of 2 ... DONE [18:41:26.970] Launching 2 futures (chunks) ... DONE [18:41:26.970] Resolving 2 futures (chunks) ... [18:41:26.970] resolve() on list ... [18:41:26.970] recursive: 0 [18:41:26.970] length: 2 [18:41:26.970] [18:41:26.971] Future #1 [18:41:26.971] result() for ClusterFuture ... [18:41:26.971] - result already collected: FutureResult [18:41:26.971] result() for ClusterFuture ... done [18:41:26.971] result() for ClusterFuture ... [18:41:26.971] - result already collected: FutureResult [18:41:26.972] result() for ClusterFuture ... done [18:41:26.972] signalConditionsASAP(MultisessionFuture, pos=1) ... [18:41:26.972] - nx: 2 [18:41:26.972] - relay: TRUE [18:41:26.972] - stdout: TRUE [18:41:26.972] - signal: TRUE [18:41:26.973] - resignal: FALSE [18:41:26.973] - force: TRUE [18:41:26.973] - relayed: [n=2] FALSE, FALSE [18:41:26.973] - queued futures: [n=2] FALSE, FALSE [18:41:26.973] - until=1 [18:41:26.973] - relaying element #1 [18:41:26.973] result() for ClusterFuture ... [18:41:26.974] - result already collected: FutureResult [18:41:26.974] result() for ClusterFuture ... done [18:41:26.974] result() for ClusterFuture ... [18:41:26.974] - result already collected: FutureResult [18:41:26.974] result() for ClusterFuture ... done [18:41:26.974] result() for ClusterFuture ... [18:41:26.975] - result already collected: FutureResult [18:41:26.975] result() for ClusterFuture ... done [18:41:26.975] result() for ClusterFuture ... [18:41:26.975] - result already collected: FutureResult [18:41:26.975] result() for ClusterFuture ... done [18:41:26.975] - relayed: [n=2] TRUE, FALSE [18:41:26.976] - queued futures: [n=2] TRUE, FALSE [18:41:26.976] signalConditionsASAP(MultisessionFuture, pos=1) ... done [18:41:26.976] length: 1 (resolved future 1) [18:41:26.976] Future #2 [18:41:26.976] result() for ClusterFuture ... [18:41:26.976] - result already collected: FutureResult [18:41:26.977] result() for ClusterFuture ... done [18:41:26.977] result() for ClusterFuture ... [18:41:26.977] - result already collected: FutureResult [18:41:26.977] result() for ClusterFuture ... done [18:41:26.977] signalConditionsASAP(MultisessionFuture, pos=2) ... [18:41:26.977] - nx: 2 [18:41:26.977] - relay: TRUE [18:41:26.978] - stdout: TRUE [18:41:26.978] - signal: TRUE [18:41:26.978] - resignal: FALSE [18:41:26.978] - force: TRUE [18:41:26.978] - relayed: [n=2] TRUE, FALSE [18:41:26.978] - queued futures: [n=2] TRUE, FALSE [18:41:26.978] - until=2 [18:41:26.979] - relaying element #2 [18:41:26.979] result() for ClusterFuture ... [18:41:26.979] - result already collected: FutureResult [18:41:26.979] result() for ClusterFuture ... done [18:41:26.979] result() for ClusterFuture ... [18:41:26.979] - result already collected: FutureResult [18:41:26.980] result() for ClusterFuture ... done [18:41:26.980] result() for ClusterFuture ... [18:41:26.980] - result already collected: FutureResult [18:41:26.980] result() for ClusterFuture ... done [18:41:26.980] result() for ClusterFuture ... [18:41:26.980] - result already collected: FutureResult [18:41:26.980] result() for ClusterFuture ... done [18:41:26.981] - relayed: [n=2] TRUE, TRUE [18:41:26.981] - queued futures: [n=2] TRUE, TRUE [18:41:26.981] signalConditionsASAP(MultisessionFuture, pos=2) ... done [18:41:26.981] length: 0 (resolved future 2) [18:41:26.981] Relaying remaining futures [18:41:26.981] signalConditionsASAP(NULL, pos=0) ... [18:41:26.982] - nx: 2 [18:41:26.982] - relay: TRUE [18:41:26.982] - stdout: TRUE [18:41:26.982] - signal: TRUE [18:41:26.982] - resignal: FALSE [18:41:26.982] - force: TRUE [18:41:26.982] - relayed: [n=2] TRUE, TRUE [18:41:26.983] - queued futures: [n=2] TRUE, TRUE - flush all [18:41:26.983] - relayed: [n=2] TRUE, TRUE [18:41:26.983] - queued futures: [n=2] TRUE, TRUE [18:41:26.983] signalConditionsASAP(NULL, pos=0) ... done [18:41:26.983] resolve() on list ... DONE [18:41:26.983] result() for ClusterFuture ... [18:41:26.984] - result already collected: FutureResult [18:41:26.984] result() for ClusterFuture ... done [18:41:26.984] result() for ClusterFuture ... [18:41:26.984] - result already collected: FutureResult [18:41:26.984] result() for ClusterFuture ... done [18:41:26.984] result() for ClusterFuture ... [18:41:26.985] - result already collected: FutureResult [18:41:26.985] result() for ClusterFuture ... done [18:41:26.985] result() for ClusterFuture ... [18:41:26.985] - result already collected: FutureResult [18:41:26.985] result() for ClusterFuture ... done [18:41:26.985] - Number of value chunks collected: 2 [18:41:26.986] Resolving 2 futures (chunks) ... DONE [18:41:26.986] Reducing values from 2 chunks ... [18:41:26.986] - Number of values collected after concatenation: 2 [18:41:26.986] - Number of values expected: 2 [18:41:26.986] Reducing values from 2 chunks ... DONE [18:41:26.986] future_lapply() ... DONE Testing with 2 cores ... DONE > > > message("*** future_lapply() - special cases ...") *** future_lapply() - special cases ... > > X <- list() > names(X) <- character(0L) > y <- future_lapply(X, FUN = identity) > stopifnot(length(y) == 0L, !is.null(names(y)), identical(y, X)) > > X <- character(0L) > y0 <- lapply(X, FUN = identity) > y <- future_lapply(X, FUN = identity) > stopifnot(identical(y, y0)) > > X <- character(0L) > names(X) <- character(0L) > y0 <- lapply(X, FUN = identity) > y <- future_lapply(X, FUN = identity) > stopifnot(identical(y, y0)) > > message("*** future_lapply() - special cases ... DONE") *** future_lapply() - special cases ... DONE > > > message("*** future_lapply() - exceptions ...") *** future_lapply() - exceptions ... > > res <- tryCatch({ + future_lapply(1:3, FUN = identity, future.chunk.size = structure(1L, ordering = "invalid")) + }, error = identity) [18:41:26.987] future_lapply() ... > stopifnot(inherits(res, "error")) > > message("*** future_lapply() - exceptions ... DONE") *** future_lapply() - exceptions ... DONE > > message("*** future_lapply() ... DONE") *** future_lapply() ... DONE > > source("incl/end.R") [18:41:26.991] plan(): Setting new future strategy stack: [18:41:26.991] List of future strategies: [18:41:26.991] 1. FutureStrategy: [18:41:26.991] - args: function (..., envir = parent.frame(), workers = "") [18:41:26.991] - tweaked: FALSE [18:41:26.991] - call: future::plan(oplan) [18:41:27.020] plan(): nbrOfWorkers() = 1 > > proc.time() user system elapsed 9.48 0.31 11.45